| MCRindError {MCRestimate} | R Documentation |
MCRindError returns a vector with the individual number of incorrect classified samples for each cross-validation
plotIndGroupVotes plots the individual group votes
MCRindError(MCRe,
perGroup=FALSE)
plotIndGroupVotes(MCRest,
PvD= 0.5,
dotCol="red",
errCol="black",
xlab="",
ylab="# misclassified samples (mean + SD)",
...)
MCRe |
Object of S3 class MCRestimate |
perGroup |
returns a vector with the individual number of incorrect classified samples for each group |
MCRest |
Object of S3 class MCRestimate |
PvD |
Offset of the text that belongs to a specific point in the plot |
dotCol |
Color of the dots |
errCol |
Line color between points |
xlab |
Label of X-Axis |
ylab |
Label of Y-Axis |
... |
Advanced options to the plot command |
MCRindError returns a vector of individual errors.
Markus Ruschhaupt mailto:m.ruschhaupt@dkfz.de
library(MCRestimate) library(golubEsets) data(Golub_Train) exSet <- Golub_Train[1:500,] result1 <-MCRestimate(exSet,"ALL.AML",classification.fun="RF.wrap",cross.outer=3,cross.repeat=3) MCRindError(result1)