| add_genexp {MultiDataSet} | R Documentation |
MultiDataSet.This method adds or overwrites the slot "expression" of an
MultiDataSet with the content of the given ExpressionSet. The fData of
the ExpressionSet must contain the columns chromosome, start and end.
add_genexp(object, gexpSet, ...)
object |
|
gexpSet |
|
... |
Arguments to be passed to |
A new MultiDataSet with the slot "expression"
filled.
multi <- createMultiDataSet()
eset <- new("ExpressionSet", exprs = matrix(runif(4), 2))
fData(eset) <- data.frame(chromosome = c("chr1", "chr2"), start = c(12414, 1234321),
end = c(121241, 124124114), stringsAsFactors = FALSE)
multi <- add_genexp(multi, eset)