`print.oecosimu` <-
function(x, ...)
{
xx <- x ## return unmodified input object
attr(x$oecosimu$method, "permfun") <- NULL
cat(as.character(attr(x,"call")[[1]]), "object\n\n")
writeLines(strwrap(pasteCall(attr(x, "call"))))
cat("\n")
cat("simulation method", x$oecosimu$method, "with",
ncol(x$oecosimu$simulated), "simulations\n")
if (length(att <- attributes(x$oecosimu$simulated)) > 1) {
att$dim <- NULL
cat("options: ", paste(names(att), att, collapse=", "))
}
alt.char <- switch(x$oecosimu$alternative,
two.sided = "less or greater than",
less = "less than",
greater = "greater than")
cat("\nalternative hypothesis: statistic is", alt.char, "simulated values")
## dim attribute is always there, but print all others
cat("\n\n")
cl <- class(x)
if ((length(cl) > 1 && cl[2] != "list" ) &&
!any(cl %in% c("adipart", "hiersimu", "multipart"))) {
NextMethod("print", x)
cat("\n")
}
probs <- switch(x$oecosimu$alternative,
two.sided = c(0.025, 0.5, 0.975),
greater = c(0, 0.5, 0.95),
less = c(0.05, 0.5, 1))
qu <- apply(x$oecosimu$simulated, 1, quantile, probs=probs, na.rm = TRUE)
m <- cbind("statistic" = x$oecosimu$statistic,
"z" = x$oecosimu$z, "mean" = x$oecosimu$means, t(qu),
"Pr(sim.)"=x$oecosimu$pval)
printCoefmat(m, cs.ind = 3:6, ...)
if (any(is.na(x$oecosimu$simulated))) {
nacount <- rowSums(is.na(x$oecosimu$simulated))
cat("\nNumber of NA cases removed from simulations:\n",
nacount, "\n")
}
invisible(xx)
}
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.