| getmgsa {mogsa} | R Documentation |
get values/slot in an object of class "mgsa". The "mgsa" consists of two S4 class objects,
moa-class and moa.sup-class. This function could extract
values in these two components directly.
getmgsa(mgsa, value)
mgsa |
An object of class |
value |
The name of the value want to extract from "mgsa". See detail for options. |
if value in c("call", "moa", "sup"), the function equal function slot.
if value in c("eig", "tau", "partial.eig", "eig.vec", "loading",
"fac.scr", "partial.fs", "ctr.obs", "ctr.var", "ctr.tab", "RV"), the function extact
corresponding value from moa-class.
if value in c("data", "coord.sep", "coord.comb", "score",
"score.data", "score.pc", "score.sep", "p.val"), the function extract value from
moa.sup-class.
The function return the selected value in "mgsa".
Chen Meng
TBA
# library(mogsa) # loading gene expression data and supplementary data data(NCI60_4array_supdata) data(NCI60_4arrays) mgsa <- mogsa(x = NCI60_4arrays, sup=NCI60_4array_supdata, nf=9, proc.row = "center_ssq1", w.data = "inertia", statis = TRUE) part.eig <- getmgsa(mgsa, "partial.eig") barplot(as.matrix(part.eig))