newSeqExpressionSet {EDASeq} | R Documentation |
SeqExpressionSet
object.
User-level function to create new objects of the class SeqExpressionSet
.
newSeqExpressionSet(counts, normalizedCounts = matrix(data=NA, nrow=nrow(counts), ncol=ncol(counts), dimnames=dimnames(counts)), offset = matrix(data=0, nrow=nrow(counts), ncol=ncol(counts), dimnames=dimnames(counts)), phenoData = annotatedDataFrameFrom(counts, FALSE), featureData = annotatedDataFrameFrom(counts, TRUE), ...)
counts |
A matrix containing the counts for an RNA-Seq experiment. One column for each lane and one row for each gene. |
normalizedCounts |
A matrix with the same dimensions of |
offset |
A matrix with the same dimensions of |
phenoData |
A data.frame or |
featureData |
A data.frame or |
... |
Other arguments will be passed to the constructor inherited from |
An object of class SeqExpressionSet
.
Davide Risso
counts <- matrix(data=0, nrow=100, ncol=4) for(i in 1:4) { counts[, i] <- rpois(100, lambda=50) } cond <- c(rep("A", 2), rep("B", 2)) counts <- newSeqExpressionSet(counts, phenoData=data.frame(conditions=cond))