latEDtable {edd} | R Documentation |
use latex tags for dimnames of table created from edd classification
latEDtable(x, baselist=eddDistList, reorder=NULL)
x |
x – a table (possibly two dimensional) of results of applying edd |
baselist |
baselist – a list of eddDist objects |
reorder |
reorder – a numeric vector describing how to re order the table rows/columns |
for use with xtable rendering. table will give results with margin names in lexicographic order; reorder can be used to get a different order.
a matrix with dimnames computed from the latexTag slots of the corresponding eddDist objects
Vince Carey <stvjc@channing.harvard.edu>
require(Biobase) data(eset) # should filter to genes with reasonable variation rawTab <- table( edd(eset, meth="nnet", size=10, decay=.2) ) latEDtable(rawTab) library(xtable) xtable(latEDtable(rawTab)) # realTags <- sapply(eddDistList,tag) reo <- match(realTags,names(rawTab)) xtable(latEDtable(rawTab,reorder=reo))