getVariance {beadarray} | R Documentation |
Calculates the variance for each bead-type on each array from an ExpressionSetIllumina
object.
getVariance(object, offset=0)
object |
ExpressionSetIllumina object |
offset |
numeric value to add to the variances to avoid very small values |
getVariance
uses the se.exprs
and NoBeads
slots in assayData
to calculate the variances for each bead-type on each array.
A matrix containing the variances.
Matt Ritchie
data(BSData) v = getVariance(BSData) boxplot(as.data.frame(log2(v)), ylab="log2var", xlab=colnames(BSData), las=2)