removeUninformativeFactors {puma} | R Documentation |
This is really an internal function used to remove uninformative factors from the phenotype data. Uninformative factors here are defined as those which have the same value for all arrays in the ExpressionSet
.
removeUninformativeFactors(eset)
eset |
An object of class ExpressionSet . |
An ExpressionSet
object with the same data as the input, except for a new phenoData
slot.
Richard D. Pearson
Related methods createDesignMatrix
and createContrastMatrix
eset_test <- new("ExpressionSet", exprs=matrix(rnorm(400,8,2),100,4)) pData(eset_test) <- data.frame("informativeFactor"=c("A", "A", "B", "B"), "uninformativeFactor"=c("X","X","X","X")) eset_test2 <- removeUninformativeFactors(eset_test) pData(eset_test) pData(eset_test2)