R/drop1.cca.R

`drop1.cca` <-
    function(object, scope, test = c("none", "permutation"),
             pstep = 100, perm.max = 200, ...)
{
    if (inherits(object, "prc"))
        stop("'step'/'drop1' cannot be used for 'prc' objects")
    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", step = pstep,
                      perm.max = perm.max, scope = scope, ...)
        nr <- nrow(adds)
        out <- cbind(out, rbind(NA, adds[rn,3:5]))
        class(out) <- cl
    }
    out
}
pattakosn/Rworkshop documentation built on May 24, 2019, 8:22 p.m.