R/permTestAnova.formula.R

Defines functions permTestAnova.formula

Documented in permTestAnova.formula

#' @describeIn permTestAnova Permutation test for ANOVA F-test
#' @export

permTestAnova.formula <-
  function(formula, data = parent.frame(), subset,...)
  { if (missing(formula) || (length(formula) != 3L) || (length(attr(terms(formula[-2L]),
                                                                    "term.labels")) != 1L))
    stop("'formula' missing or incorrect")
    m <- match.call(expand.dots = FALSE)
    if (is.matrix(eval(m$data, parent.frame())))
      m$data <- as.data.frame(data)
    m[[1L]] <- as.name("model.frame")
    m$... <- NULL
    mf <- eval(m, parent.frame())
    
    nmiss <- length(attr(mf, "na.action"))
    if (nmiss > 0)
      cat("\n ", nmiss, "observations removed due to missing values.\n")
    
    response <- attr(attr(mf, "terms"), "response")
    x <- mf[[response]]
    g <- mf[[-response]]
    
    y <- do.call("permTestAnova", c(list(x, g), ...))
    
    y
  }

Try the CarletonStats package in your browser

Any scripts or data that you put into this service are public.

CarletonStats documentation built on Aug. 22, 2023, 5:06 p.m.