Learn R Programming

marginaleffects (version 0.8.1)

comparisons: Contrasts Between Adjusted Predictions

Description

Difference, ratio, or function of adjusted predictions, calculated for meaningfully different predictor values. The tidy() and summary() functions can be used to aggregate and summarize the output of comparisons(). To learn more, read the contrasts vignette, visit the package website, or scroll down this page for a full list of vignettes:

Usage

comparisons(
  model,
  newdata = NULL,
  variables = NULL,
  type = NULL,
  vcov = TRUE,
  conf_level = 0.95,
  transform_pre = "difference",
  transform_post = NULL,
  cross = FALSE,
  by = NULL,
  wts = NULL,
  hypothesis = NULL,
  eps = NULL,
  ...
)

Arguments

model

Model object

newdata

NULL, data frame, string, or datagrid() call. Determines the predictor values for which to compute contrasts.

  • NULL (default): Unit-level contrasts for each observed value in the original dataset.

  • data frame: Unit-level contrasts for each row of the newdata data frame.

  • string:

    • "mean": Contrasts at the Mean. Contrasts when each predictor is held at its mean or mode.

    • "median": Contrasts at the Median. Contrasts when each predictor is held at its median or mode.

    • "marginalmeans": Contrasts at Marginal Means.

    • "tukey": Contrasts at Tukey's 5 numbers.

    • "grid": Contrasts on a grid of representative numbers (Tukey's 5 numbers and unique values of categorical predictors).

  • datagrid() call to specify a custom grid of regressors. For example:

    • newdata = datagrid(cyl = c(4, 6)): cyl variable equal to 4 and 6 and other regressors fixed at their means or modes.

    • newdata = datagrid(mpg = fivenum): mpg variable held at Tukey's five numbers (using the fivenum function), and other regressors fixed at their means or modes.

    • See the Examples section and the datagrid documentation.

variables

NULL, character vector, or named list. The subset of variables for which to compute contrasts.

  • NULL: compute contrasts for all the variables in the model object (can be slow).

  • Character vector: subset of variables (usually faster).

  • Named list: names identify the subset of variables of interest, and values define the type of contrast to compute. Acceptable values depend on the variable type:

    • Factor or character variables:

      • "reference": Each factor level is compared to the factor reference (base) level

      • "all": All combinations of observed levels

      • "sequential": Each factor level is compared to the previous factor level

      • "pairwise": Each factor level is compared to all other levels

      • Vector of length 2 with the two values to compare.

    • Logical variables:

      • NULL: contrast between TRUE and FALSE

    • Numeric variables:

      • Numeric of length 1: Contrast for a gap of x, computed at the observed value plus and minus x / 2. For example, estimating a +1 contrast compares adjusted predictions when the regressor is equal to its observed value minus 0.5 and its observed value plus 0.5.

      • Numeric vector of length 2: Contrast between the 2nd element and the 1st element of the x vector.

      • Function which accepts a numeric vector and returns a data frame with two columns of "low" and "high" values to compare. See examples below.

      • "iqr": Contrast across the interquartile range of the regressor.

      • "sd": Contrast across one standard deviation around the regressor mean.

      • "2sd": Contrast across two standard deviations around the regressor mean.

      • "minmax": Contrast between the maximum and the minimum values of the regressor.

    • Examples:

      • variables = list(gear = "pairwise", hp = 10)

      • variables = list(gear = "sequential", hp = c(100, 120))

      • See the Examples section below for more.

type

string indicates the type (scale) of the predictions used to compute marginal effects or contrasts. This can differ based on the model type, but will typically be a string such as: "response", "link", "probs", or "zero". When an unsupported string is entered, the model-specific list of acceptable values is returned in an error message. When type is NULL, the default value is used. This default is the first model-related row in the marginaleffects:::type_dictionary dataframe.

vcov

Type of uncertainty estimates to report (e.g., for robust standard errors). Acceptable values:

  • FALSE: Do not compute standard errors. This can speed up computation considerably.

  • TRUE: Unit-level standard errors using the default vcov(model) variance-covariance matrix.

  • String which indicates the kind of uncertainty estimates to return.

    • Heteroskedasticity-consistent: "HC", "HC0", "HC1", "HC2", "HC3", "HC4", "HC4m", "HC5". See ?sandwich::vcovHC

    • Heteroskedasticity and autocorrelation consistent: "HAC"

    • Mixed-Models degrees of freedom: "satterthwaite", "kenward-roger"

    • Other: "NeweyWest", "KernHAC", "OPG". See the sandwich package documentation.

  • One-sided formula which indicates the name of cluster variables (e.g., ~unit_id). This formula is passed to the cluster argument of the sandwich::vcovCL function.

  • Square covariance matrix

  • Function which returns a covariance matrix (e.g., stats::vcov(model))

conf_level

numeric value between 0 and 1. Confidence level to use to build a confidence interval.

transform_pre

string or function. How should pairs of adjusted predictions be contrasted?

  • string: shortcuts to common contrast functions.

    • Supported shortcuts strings: difference, differenceavg, differenceavgwts, dydx, eyex, eydx, dyex, dydxavg, eyexavg, eydxavg, dyexavg, dydxavgwts, eyexavgwts, eydxavgwts, dyexavgwts, ratio, ratioavg, ratioavgwts, lnratio, lnratioavg, lnratioavgwts, lnor, lnoravg, lnoravgwts, expdydx, expdydxavg, expdydxavgwts

    • See the Transformations section below for definitions of each transformation.

  • function: accept two equal-length numeric vectors of adjusted predictions (hi and lo) and returns a vector of contrasts of the same length, or a unique numeric value.

    • See the Transformations section below for examples of valid functions.

transform_post

string or function. Transformation applied to unit-level estimates and confidence intervals just before the function returns results. Functions must accept a vector and return a vector of the same length. Support string shortcuts: "exp", "ln"

cross

TRUE or FALSE

  • FALSE: Contrasts represent the change in adjusted predictions when one predictor changes and all other variables are held constant.

  • TRUE: Contrasts represent the changes in adjusted predictions when all the predictors specified in the variables argument are manipulated simultaneously (a "cross-contrast").

by

Compute group-wise average estimates. Valid inputs:

  • Character vector of column names in newdata or in the data frame produced by calling the function without the by argument.

  • Data frame with a by column of group labels, and merging columns shared by newdata or the data frame produced by calling the same function without the by argument.

  • See examples below.

wts

string or numeric: weights to use when computing average contrasts or marginaleffects. These weights only affect the averaging in tidy() or summary(), and not the unit-level estimates themselves.

  • string: column name of the weights variable in newdata. When supplying a column name to wts, it is recommended to supply the original data (including the weights variable) explicitly to newdata.

  • numeric: vector of length equal to the number of rows in the original data or in newdata (if supplied).

hypothesis

specify a hypothesis test or custom contrast using a vector, matrix, string, or string formula.

  • String:

    • "pairwise": pairwise differences between estimates in each row.

    • "reference": differences between the estimates in each row and the estimate in the first row.

    • "sequential": difference between an estimate and the estimate in the next row.

    • "revpairwise", "revreference", "revsequential": inverse of the corresponding hypotheses, as described above.

  • String formula to specify linear or non-linear hypothesis tests. If the term column uniquely identifies rows, terms can be used in the formula. Otherwise, use b1, b2, etc. to identify the position of each parameter. Examples:

    • hp = drat

    • hp + drat = 12

    • b1 + b2 + b3 = 0

  • Numeric vector: Weights to compute a linear combination of (custom contrast between) estimates. Length equal to the number of rows generated by the same function call, but without the hypothesis argument.

  • Numeric matrix: Each column is a vector of weights, as describe above, used to compute a distinct linear combination of (contrast between) estimates. The column names of the matrix are used as labels in the output.

  • See the Examples section below and the vignette: https://vincentarelbundock.github.io/marginaleffects/articles/hypothesis.html

eps

NULL or numeric value which determines the step size to use when calculating numerical derivatives: (f(x+eps)-f(x))/eps. When eps is NULL, the step size is 0.0001 multiplied by the difference between the maximum and minimum values of the variable with respect to which we are taking the derivative. Changing eps may be necessary to avoid numerical problems in certain models.

...

Additional arguments are passed to the predict() method supplied by the modeling package.These arguments are particularly useful for mixed-effects or bayesian models (see the online vignettes on the marginaleffects website). Available arguments can vary from model to model, depending on the range of supported arguments by each modeling package. See the "Model-Specific Arguments" section of the ?marginaleffects documentation for a non-exhaustive list of available arguments.

Model-Specific Arguments

Some model types allow model-specific arguments to modify the nature of marginal effects, predictions, marginal means, and contrasts.

PackageClassArgumentDocumentation
brmsbrmsfitndrawsbrms::posterior_predict
re_formula
lme4merModinclude_randominsight::get_predicted
re.formlme4::predict.merMod
allow.new.levelslme4::predict.merMod
glmmTMBglmmTMBre.formglmmTMB::predict.glmmTMB
allow.new.levelsglmmTMB::predict.glmmTMB
zitypeglmmTMB::predict.glmmTMB
mgcvbamexcludemgcv::predict.bam
robustlmmrlmerModre.formrobustlmm::predict.rlmerMod
allow.new.levelsrobustlmm::predict.rlmerMod

Transformations

The following transformations can be applied by supplying one of the shortcut strings to the transform_pre argument. hi is a vector of adjusted predictions for the "high" side of the contrast. lo is a vector of adjusted predictions for the "low" side of the contrast. y is a vector of adjusted predictions for the original data. x is the predictor in the original data. eps is the step size to use to compute derivatives and elasticities.

ShortcutFunction
difference\(hi, lo) hi - lo
differenceavg\(hi, lo) mean(hi) - mean(lo)
differenceavgwts\(hi, lo, w) wmean(hi, w) - wmean(lo, w)
dydx\(hi, lo, eps) (hi - lo)/eps
eyex\(hi, lo, eps, y, x) (hi - lo)/eps * (x/y)
eydx\(hi, lo, eps, y, x) ((hi - lo)/eps)/y
dyex\(hi, lo, eps, x) ((hi - lo)/eps) * x
dydxavg\(hi, lo, eps) mean((hi - lo)/eps)
eyexavg\(hi, lo, eps, y, x) mean((hi - lo)/eps * (x/y))
eydxavg\(hi, lo, eps, y, x) mean(((hi - lo)/eps)/y)
dyexavg\(hi, lo, eps, x) mean(((hi - lo)/eps) * x)
dydxavgwts\(hi, lo, eps, w) wmean((hi - lo)/eps, w)
eyexavgwts\(hi, lo, eps, y, x, w) wmean((hi - lo)/eps * (x/y), w)
eydxavgwts\(hi, lo, eps, y, x, w) wmean(((hi - lo)/eps)/y, w)
dyexavgwts\(hi, lo, eps, x, w) wmean(((hi - lo)/eps) * x, w)
ratio\(hi, lo) hi/lo
ratioavg\(hi, lo) mean(hi)/mean(lo)
ratioavgwts\(hi, lo) wmean(hi)/wmean(lo)
lnratio\(hi, lo) log(hi/lo)
lnratioavg\(hi, lo) log(mean(hi)/mean(lo))
lnratioavgwts\(hi, lo) log(wmean(hi)/wmean(lo))
lnor\(hi, lo) log((hi/(1 - hi))/(lo/(1 - lo)))
lnoravg\(hi, lo) log((mean(hi)/(1 - mean(hi)))/(mean(lo)/(1 - mean(lo))))
lnoravgwts\(hi, lo, w) log((wmean(hi, w)/(1 - wmean(hi, w)))/(wmean(lo, w)/(1 - wmean(lo, w))))
expdydx\(hi, lo, eps) ((exp(hi) - exp(lo))/exp(eps))/eps
expdydxavg\(hi, lo, eps) mean(((exp(hi) - exp(lo))/exp(eps))/eps)
expdydxavgwts\(hi, lo, eps, w) wmean(((exp(hi) - exp(lo))/exp(eps))/eps, w)

Details

A "contrast" is a difference, ratio of function of adjusted predictions, calculated for meaningfully different predictor values (e.g., College graduates vs. Others). Uncertainty estimates are computed using the delta method.

The newdata argument can be used to control the kind of contrasts to report:

  • Average Contrasts

  • Adjusted Risk Ratios

  • Adjusted Risk Differences

  • Group-Average Contrasts

  • Contrasts at the Mean

  • Contrasts at User-Specified values (aka Contrasts at Representative values, MER).

  • Custom contrasts using arbitrary functions

Examples

Run this code

library(marginaleffects)
library(magrittr)

# Linear model
tmp <- mtcars
tmp$am <- as.logical(tmp$am)
mod <- lm(mpg ~ am + factor(cyl), tmp)
comparisons(mod, variables = list(cyl = "reference")) %>% tidy()
comparisons(mod, variables = list(cyl = "sequential")) %>% tidy()
comparisons(mod, variables = list(cyl = "pairwise")) %>% tidy()

# GLM with different scale types
mod <- glm(am ~ factor(gear), data = mtcars)
comparisons(mod, type = "response") %>% tidy()
comparisons(mod, type = "link") %>% tidy()

# Contrasts at the mean
comparisons(mod, newdata = "mean")

# Contrasts between marginal means
comparisons(mod, newdata = "marginalmeans")

# Contrasts at user-specified values
comparisons(mod, newdata = datagrid(am = 0, gear = tmp$gear))
comparisons(mod, newdata = datagrid(am = unique, gear = max))

m <- lm(mpg ~ hp + drat + factor(cyl) + factor(am), data = mtcars)
comparisons(m, variables = "hp", newdata = datagrid(FUN_factor = unique, FUN_numeric = median))


# Numeric contrasts
mod <- lm(mpg ~ hp, data = mtcars)
comparisons(mod, variables = list(hp = 1)) %>% tidy()
comparisons(mod, variables = list(hp = 5)) %>% tidy()
comparisons(mod, variables = list(hp = c(90, 100))) %>% tidy()
comparisons(mod, variables = list(hp = "iqr")) %>% tidy()
comparisons(mod, variables = list(hp = "sd")) %>% tidy()
comparisons(mod, variables = list(hp = "minmax")) %>% tidy()

# using a function to specify a custom difference in one regressor
dat <- mtcars
dat$new_hp <- 49 * (dat$hp - min(dat$hp)) / (max(dat$hp) - min(dat$hp)) + 1
modlog <- lm(mpg ~ log(new_hp) + factor(cyl), data = dat)
fdiff <- \(x) data.frame(x, x + 10)
comparisons(modlog, variables = list(new_hp = fdiff)) %>% summary()

# Adjusted Risk Ratio: see the contrasts vignette
mod <- glm(vs ~ mpg, data = mtcars, family = binomial)
cmp <- comparisons(mod, transform_pre = "lnratioavg")
summary(cmp, transform_avg = exp)

# Adjusted Risk Ratio: Manual specification of the `transform_pre`
cmp <- comparisons(mod, transform_pre = function(hi, lo) log(mean(hi) / mean(lo)))
summary(cmp, transform_avg = exp)
# cross contrasts
mod <- lm(mpg ~ factor(cyl) * factor(gear) + hp, data = mtcars)
cmp <- comparisons(mod, variables = c("cyl", "gear"), cross = TRUE)
summary(cmp)

# variable-specific contrasts
cmp <- comparisons(mod, variables = list(gear = "sequential", hp = 10))
summary(cmp)

# hypothesis test: is the `hp` marginal effect at the mean equal to the `drat` marginal effect
mod <- lm(mpg ~ wt + drat, data = mtcars)

comparisons(
    mod,
    newdata = "mean",
    hypothesis = "wt = drat")

# same hypothesis test using row indices
comparisons(
    mod,
    newdata = "mean",
    hypothesis = "b1 - b2 = 0")

# same hypothesis test using numeric vector of weights
comparisons(
    mod,
    newdata = "mean",
    hypothesis = c(1, -1))

# two custom contrasts using a matrix of weights
lc <- matrix(c(
    1, -1,
    2, 3),
    ncol = 2)
comparisons(
    mod,
    newdata = "mean",
    hypothesis = lc)


# `by` argument
mod <- lm(mpg ~ hp * am * vs, data = mtcars)
cmp <- comparisons(mod, variables = "hp", by = c("vs", "am"))
summary(cmp)

library(nnet)
mod <- multinom(factor(gear) ~ mpg + am * vs, data = mtcars, trace = FALSE)
by <- data.frame(
    group = c("3", "4", "5"),
    by = c("3,4", "3,4", "5"))
comparisons(mod, type = "probs", by = by)

Run the code above in your browser using DataLab