classifOutput-class {MLInterfaces}R Documentation

Class "classifOutput": container for output of classification procedures in R

Description

container with uniform contents for classifier outputs

Objects from the Class

Objects can be created by calls of the form new("classifOutput", ...). These objects include label vectors for test set elements, scores on labeling events, call history information, native classifier object access, and a distance matrix for test set feature vectors.

Slots

method:
Object of class "character" tag identifying classification method in use
predLabels:
Object of class "MLLabel" vector of labels predicted for test cases
predScores:
Object of class "MLScore" structure of scores on classification events (for example, vote proportions or fitted probabilities of class membership
call:
Object of class "call" call engendering the classifOutput object
classifRobject:
Object of class "ANY" fitted model object
distMat:
Object of class "dist" distance matrix of test set feature vectors

Methods

show
signature(object = "classifOutput"): ...
silhouetteB
signature(out = "classifOutput"): ...

Author(s)

VJ Carey <stvjc@channing.harvard.edu>

Examples

# access and trim an ExpressionSet
library(golubEsets)
data(Golub_Merge)
smallG <- Golub_Merge[1:60,]
# set a PRNG seed for reproducibilitiy
set.seed(1234) # needed for nnet initialization
# now run the classifiers
f1 = knnB( smallG, "ALL.AML", 1:40 )
f1
confuMat(f1)

[Package MLInterfaces version 1.10.3 Index]