scudoPlot {rScudo} | R Documentation |
A wrapper to plot.igraph
and
legend
. Can be used to plot the result of
scudoNetwork
with a color legend.
scudoPlot(net, x = "bottomright", y = NULL, ...)
net |
an |
x, y |
the x and y coordinates to be used to position the legend. They
can be specified by keyword or in any way which is accepted by
|
... |
arguments to be passed to |
Returns NULL
, invisibly.
Matteo Ciciani matteo.ciciani@gmail.com, Thomas Cantore cantorethomas@gmail.com
# generate dummy dataset, run scudoTrain and scudoNetwork exprData <- data.frame(a = 11:20, b = 16:25, c = rev(1:10), d = c(1:2, rev(3:10))) rownames(exprData) <- letters[11:20] grps <- as.factor(c("G1", "G1", "G2", "G2")) nTop <- 2 nBottom <- 3 res <- scudoTrain(exprData, grps, nTop, nBottom, foldChange = FALSE, featureSel = FALSE) net <- scudoNetwork(res, N = 0.5) # Plot with scudoPlot scudoPlot(net)