| calcRss {attract} | R Documentation |
Function calculates the average RSS for a set of cluster assignments.
calcRss(exprs.dat, cl, class.vector)
exprs.dat |
a |
cl |
a |
class.vector |
a |
This function is called internally by findSynexprs.
For an informative cluster, the RSS values should be very small relative to those produced by the informativeness metric (the MSS values).
A numeric value representing the average RSS value for this set of cluster assignments.
Jessica Mar
## Not run:
library(cluster)
data(subset.loring.eset)
clustObj <- agnes(as.dist(1-t(cor(exprs(subset.loring.eset)))))
crss.vals <- NULL
for( i in 1:10 ){
crss.vals <- c(crss.vals, calcRss(exprs(subset.loring.eset), cutree(clustObj,i), pData(subset.loring.eset)$celltype))
}
# The RSS values are expected to be smaller than the informativeness metric values in the presence of genuine cluster structure.
## End(Not run)