| zerosInBinMSnSet {pRoloc} | R Documentation |
The function assumes that its input is a binary MSnSet and
computes, for each marker class, the number of non-zero expression
profiles. The function is meant to be used to produce heatmaps
(see the example) and visualise binary (such as GO) MSnSet
objects and assess their utility: all zero features/classes will
not be informative at all (and can be filtered out with
filterBinMSnSet) while features/classes with many
annotations (GO terms) are likely not be be informative either.
zerosInBinMSnSet(object, fcol = "markers", as.matrix = TRUE, percent = TRUE)
object |
An instance of class |
fcol |
A |
as.matrix |
If |
percent |
If |
A matrix or a list indicating the number of
non-zero value per marker class.
Laurent Gatto
library(pRolocdata)
data(hyperLOPIT2015goCC)
zerosInBinMSnSet(hyperLOPIT2015goCC)
zerosInBinMSnSet(hyperLOPIT2015goCC, percent = FALSE)
pal <- colorRampPalette(c("white", "blue"))
library(lattice)
levelplot(zerosInBinMSnSet(hyperLOPIT2015goCC),
xlab = "Number of non-0s",
ylab = "Marker class",
col.regions = pal(140))