R/multcomp.R

Defines functions multcomp_test

multcomp_test <- function(object, multcomp = FALSE, conf_level = 0.95, df = Inf) {
  valid <- c("holm", "hochberg", "hommel", "bonferroni", "BH", "BY", "fdr", "single-step", "Shaffer", "Westfall", "free")
  checkmate::assert(
    checkmate::check_choice(multcomp, choices = valid),
    checkmate::check_flag(multcomp)
  )

  if (isFALSE(multcomp)) {
    return(object)
  }

  if (isTRUE(multcomp)) multcomp <- "holm"

  insight::check_if_installed("multcomp")

  k <- multcomp::glht(object, df = df)
  k <- summary(k, test = multcomp::adjusted(type = multcomp))
  k <- stats::confint(k, level = conf_level)
  object$p.value <- k$test$pvalues
  object$conf.low <- k$confint[, 2, drop = TRUE]
  object$conf.high <- k$confint[, 3, drop = TRUE]
  object$s.value <- -log2(object$p.value)

  return(object)
}

Try the marginaleffects package in your browser

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

marginaleffects documentation built on April 4, 2025, 4:36 a.m.