Nothing
`drop1.cca` <-
function(object, scope, test = c("none", "permutation"),
permutations = how(nperm = 199), ...)
{
if (inherits(object, "prc"))
stop("'step'/'drop1' cannot be used for 'prc' objects")
if (is.null(object$terms))
stop("ordination model must be fitted using formula")
test <- match.arg(test)
out <- NextMethod("drop1", object, test="none", ...)
cl <- class(out)
if (test == "permutation") {
rn <- rownames(out)[-1]
if (missing(scope))
scope <- rn
else if (!is.character(scope))
scope <- drop.scope(scope)
adds <- anova(object, by = "margin", scope = scope,
permutations = permutations, ...)
nr <- nrow(adds)
out <- cbind(out, rbind(NA, adds[rn,3:4]))
class(out) <- cl
}
out
}
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.