Nothing
#ALG: itree copies this direclty from rpart.
#SCCS @(#)summary.rpart.s 1.18 07/05/01
summary.itree <- function(object, cp=0, digits=getOption("digits"), file, ...)
{
if(!inherits(object, "itree")) stop("Not legitimate itree object")
# If this is an older-style rpart object, convert it
# either way, rename it to "x" to save typing
if (!is.null(object$frame$splits)) x <- rpconvert(object)
else x <- object
mm <- x$method
method.int <- pmatch(mm, c("anova", "poisson", "class", "exp",
"regression_extremes","regression_purity",
"class_extremes","class_purity"))
is_classification <- (method.int %in% c(3,7,8))
is_onesided <- (method.int %in% c(5,6,7,8))
if (!missing(file)) {
sink(file)
on.exit(sink())
}
if(!is.null(x$call)) {
cat("Call:\n")
dput(x$call, control=NULL)
}
omit <- x$na.action
n <- x$frame$n
if (length(omit))
cat(" n=", n[1L], " (", naprint(omit), ")\n\n", sep="")
else cat(" n=", n[1L], "\n\n")
#itree adds this check:
if(!is_onesided){
print(x$cptable, digits=digits)
}else{
cat("No cptable for this method. \n")
}
ff <- x$frame
ylevel <- attr(x,'ylevels')
id <- as.integer(row.names(ff))
parent.id <- ifelse(id==1,1, floor(id/2))
parent.cp <- ff$complexity[match(parent.id, id)]
rows <- (1L:length(id))[parent.cp > cp]
if (length(rows)>0) rows <- rows[order(id[rows])]
else rows <- 1L
is.leaf <- (ff$var=='<leaf>')
index <- cumsum(c(1, ff$ncompete + ff$nsurrogate + 1*(!is.leaf)))
if(!all(is.leaf)) { #skip these lines for a "no splits" tree
sname <- dimnames(x$splits)[[1L]]
cuts <- vector(mode='character', length=nrow(x$splits))
temp <- x$splits[ ,2L]
for (i in 1L:length(cuts)) {
if (temp[i] == -1L)
cuts[i] <-paste("<", format(signif(x$splits[i,4], digits=digits)))
else if (temp[i] ==1L)
cuts[i] <-paste("<", format(signif(x$splits[i,4], digits=digits)))
else cuts[i]<- paste("splits as ",
paste(c("L", "-", "R")[x$csplit[x$splits[i,4], 1L:temp[i]]],
collapse='', sep=''), collapse='')
}
# S-PLUS 4.0 can't handle null vectors here
if(any(temp<2)) cuts[temp<2 ] <- format(cuts[temp<2],justify="left")
cuts <- paste(cuts, ifelse(temp >=2, ",",
ifelse(temp==1, " to the right,", " to the left, ")),
sep = '')
}
# make a replacement for frame$yval2
if(is_classification){
#what rpart calls "yval2"
newyval2 <- cbind(ff$yval,ff[,grep("wt.",colnames(ff))])
colnames(newyval2)[1] <- "yval"
newyval2 <- as.matrix(newyval2) #make everything numeric
}
#itree: use is_classification here...
if (!is_classification)
tprint <- x$functions$summary(ff$yval[rows], ff$dev[rows],
ff$wt[rows], ylevel, digits)
else
#use newyval2
tprint <- x$functions$summary(newyval2[rows,,drop=FALSE], ff$dev[rows],
ff$wt[rows], ylevel, digits)
for (ii in 1L:length(rows)) {
i <- rows[ii]
nn <- ff$n[i]
cat("\nNode number ", id[i], ": ", nn, " observations", sep='')
if (ff$complexity[i] < cp || is.leaf[i]) cat("\n")
else cat(", complexity param=",
format(signif(ff$complexity[i], digits)), "\n", sep="")
cat(tprint[ii], "\n")
if (ff$complexity[i] > cp && !is.leaf[i] ){
sons <- 2*id[i] + c(0,1)
sons.n <- ff$n[match(sons, id)]
cat(" left son=", sons[1L], " (", sons.n[1L], " obs)",
" right son=", sons[2L], " (", sons.n[2L], " obs)", sep='')
j <- nn - (sons.n[1L] + sons.n[2L])
if (j>1L) cat(", ", j, " observations remain\n", sep='')
else if (j==1L) cat(", 1 observation remains\n")
else cat("\n")
cat(" Primary splits:\n")
j <- seq(index[i], length.out=1L+ff$ncompete[i])
if (all(nchar(cuts[j], "w") < 25))
temp <- format(cuts[j], justify="left")
else temp <- cuts[j]
cat(paste(" ", format(sname[j], justify="left"), " ", temp,
" improve=", format(signif(x$splits[j,3], digits)),
", (", nn - x$splits[j,1L], " missing)", sep=''),
sep="\n")
if (ff$nsurrogate[i] >0L) {
cat(" Surrogate splits:\n")
j <- seq(1 +index[i] + ff$ncompete[i], length.out=ff$nsurrogate[i])
agree <- x$splits[j,3L]
if (all(nchar(cuts[j], "w") < 25))
temp <- format(cuts[j], justify="left")
else temp <- cuts[j]
if (ncol(x$splits)==5) {
adj <- x$splits[j,5L]
cat(paste(" ", format(sname[j], justify="left"), " ",
temp,
" agree=", format(round(agree, 3)),
", adj=" , format(round(adj, 3)),
", (", x$splits[j,1L], " split)", sep=''),
sep="\n")
}
else { #an older style rpart object -- no adj value present
cat(paste(" ", format(sname[j], justify="left"), " ",
temp,
" agree=", format(round(agree, 3)),
", (", x$splits[j,1L], " split)", sep=''),
sep="\n")
}
}
}
}
cat("\n")
invisible(x)
}
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.