| Type: | Package | 
| Title: | Consistent Contrast Coding for Factors | 
| Version: | 1.0.2 | 
| Description: | Quickly set and summarize contrasts for factors prior to regression analyses. Intended comparisons, baseline conditions, and intercepts can be explicitly set and documented without the user needing to directly manipulate matrices. Reviews and introductions for contrast coding are available in Brehm and Alday (2022)<doi:10.1016/j.jml.2022.104334> and Schad et al. (2020)<doi:10.1016/j.jml.2019.104038>. | 
| License: | MIT + file LICENSE | 
| Encoding: | UTF-8 | 
| Imports: | cli, crayon, glue, MASS, purrr, rlang (≥ 0.1.2), stats, tidyselect | 
| RoxygenNote: | 7.3.2 | 
| Suggests: | dplyr, knitr, testthat (≥ 3.0.0), roxygen2, rmarkdown, covr, hypr | 
| Config/testthat/edition: | 3 | 
| URL: | https://github.com/tsostarics/contrastable | 
| BugReports: | https://github.com/tsostarics/contrastable/issues | 
| VignetteBuilder: | knitr | 
| NeedsCompilation: | no | 
| Packaged: | 2024-09-30 14:29:53 UTC; Thomas | 
| Author: | Thomas Sostarics | 
| Maintainer: | Thomas Sostarics <tsostarics@gmail.com> | 
| Repository: | CRAN | 
| Date/Publication: | 2024-10-01 14:50:03 UTC | 
Lookup namespace of contrast scheme function
Description
Given the name of a contrast scheme (ie the function name that creates the contrast matrix), lookup which namespace it belongs to and add it to the string. Used to report which packages are used in the glimpse table, e.g., stats, contrastable, bayesTestR
Usage
.add_namespace(scheme_names)
Arguments
| scheme_names | Character vector | 
Value
character vector of updated function names with namespaces
Extract parameters from dots
Description
If there are any other arguments passed to a contrast coding function by the user, ensure they're bundled together correctly. This is especially important for setting the number of levels correctly.
Usage
.bundle_params(factor_col, ...)
Arguments
| factor_col | Factor to set contrasts to | 
| ... | Other arguments passed by the user | 
Value
Function call parameters as a list
Get columns where
Description
Helper to avoid the use of tidyselect and dplyr::select, returns either a logical vector (optionally named) or a character vector of which columns satisfy the given function
Usage
.cols_where(model_data, fx, use_names = FALSE, return_names = FALSE)
Arguments
| model_data | Model data | 
| fx | Function to apply, must be something that returns a logical value.
Usually either  | 
| use_names | Whether the resulting vector should be named | 
| return_names | Whether names (where the fx returns TRUE) should be returned instead of a logical vector. Overwrites use.names. | 
Value
Optionally named logical vector or character vector depending on
values of use_names and return_names
Convert non factors to factors
Description
Helper to convert columns to factors if they aren't already
Usage
.convert_to_factors(model_data, vars_in_model, verbose = TRUE)
Arguments
| model_data | Model data | 
| vars_in_model | variables specified for contrast coding from formulas | 
| verbose | Should messages be sent? Defaults to TRUE | 
Value
model_data with specified columns coerced to factors
Expand contrast formulas
Description
Uses {tidyselect} functionality to expand the left hand side of a formula
into multiple formulas. See examples of enlist_contrasts for examples.
Usage
.expand_formulas(formulas, data)
Arguments
| formulas | List of formulas | 
| data | Dataframe to evaluate names in | 
Value
Named list of formulas
Get dimnames of contrasts from factor
Description
Given a factor, extract the row and column names of the contrasts. If they're not set, then use default values. Also helps to catch invalid usage of polynomial contrasts.
Usage
.get_dimnames(factor_col)
Arguments
| factor_col | Factor to extract contrasts from | 
Value
List of rownames and column names
Retrieve value from param list
Description
Helper to evaluate param entries.
Usage
.get_from_params(what, list_params, formulas)
Arguments
| what | Which parameter to retrieve | 
| list_params | List of params, see  | 
| formulas | Formulas used to set contrasts | 
Value
Requested value for each parameter as a string
Get reference level of contrast matrix
Description
Compute the reference level manually if the information isn't available via parameters
Usage
.get_reference_level(contrast_matrix)
Arguments
| contrast_matrix | Contrast matrix, if NULL will throw an error | 
See Also
Get reference levels from a (possibly set) list of contrasts
Description
Given a list of contrast matrices, if the contrast matrices were explicitly generated via formulas and they have already had their parameters parsed, use the parameters to look up the reference level for each contrast matrix. If the parameters have not been computed (usually because the contrasts are using the defaults) then look up the reference level manually.
Usage
.get_reference_levels(contrast_list, list_params = NULL, formulas = NULL)
Arguments
| contrast_list | List of contrasts, does not need to be named | 
| list_params | Optional list of parameters, see  | 
| formulas | Optional list of formulas, needed if  | 
Value
Character vector of reference levels. If a contrast matrix is not specified for row names, the character value will denote the integer index of the row for the reference level (usually 1).
Check for reserved operators
Description
A helper for .make_parameters(), which takes a symbol and checks
whether it corresponds to one of the reserved operators for the package
syntax.
Usage
.get_reserved_operator(node)
Arguments
| node | A symbol, extracted from a formula | 
Value
If node is a reserved operator, then return the operator as a
string. Otherwise return the string "none".
Get contrast scheme labels for glimpse table
Description
Looks up contrast functions from formulas and appends the necessary namespaces
Usage
.get_scheme_labels(list_params, formulas)
Arguments
| list_params | List of params, see  | 
| formulas | Formulas passed by the user | 
Value
Character vector
Glimpse default factors
Description
Given a dataframe with some factor columns and a character vector of which
columns you've already set yourself, look at all the other factor columns and
get a glimpse at how they're treated by the defaults specified in
options('contrasts'). Reference level is assumed to be the first level for
unordered factors and nonexistent for ordered factors.
Usage
.glimpse_default_factors(
  model_data,
  set_factors = NULL,
  show_one_level_factors = FALSE,
  minimal = TRUE,
  verbose = TRUE
)
Arguments
| model_data | Data to be passed to a model fitting function | 
| set_factors | Explicitly set columns to ignore | 
| show_one_level_factors | Logical, should factors with only one level be included in the output? Default is FALSE to omit | 
| minimal | Logical, default TRUE, whether to omit the orthogonal, centered, dropped_trends, and explicitly_set columns from the output table | 
| verbose | Logical, defaults to TRUE, whether messages should be printed | 
Value
A table with information about the contrasts for all remaining factor columns
Check if a scheme is a polynomial scheme
Description
Helper to check if a contrast coding function is one of the polynomial schemes
Usage
.is_polynomial_scheme(scheme)
Arguments
| scheme | Contrast coding function or string of a function name | 
Value
TRUE if polynomial scheme, FALSE otherwise
Check if node is a contrast-manipulation operator
Description
Some symbols are reserved for the special syntax implemented by the package.
This function checks if a given node (i.e., a call) is one or more of
+ - * |
Usage
.is_reserved_operator(node, check_sym = NULL)
Arguments
| node | List element | 
| check_sym | If NULL (default), check all reserved operators. Otherwise, a string that will be converted to a symbol. | 
Value
TRUE if node is identical to a reserved operator, otherwise
FALSE
Check if valid contrast
Description
Sometimes a user might pass a matrix that can't actually be used, in which case we can avoid some calculations by stopping earlier.
Usage
.is_valid_contrmat(contrast_matrix)
Arguments
| contrast_matrix | Contrast matrix | 
Value
invisibly returns TRUE if the contrast matrix is valid
Make parameters for contrast code call
Description
Given a formula, recursively go through the abstract syntax tree and
extract the necessary parameters for use_contrasts(). While this method is
more involved than extracting from a parsed string representation, I think
it handles matrix calls better since it plucks the call right out of
the syntax tree.
Usage
.make_parameters(
  formula,
  params = list(factor_col = NA, code_by = NA, reference_level = NA, intercept_level =
    NA, drop_trends = NA, labels = NULL, as_is = FALSE),
  env = NULL,
  verbose = TRUE
)
Arguments
| formula | Formula given by user | 
| params | Parameter accumulator | 
| env | Environment for the formula, on the first recursion this will be
pulled from  | 
| verbose | Logical, default  | 
Value
Named list of parameters that can be evaluated in
.process_contrasts()
Make glimpse for 1-level factors
Description
If the user wants factors with only one level included, this will create the table to present that information. It's a lot of NAs because contrasts aren't defined for only 1 level.
Usage
.make_placeholder_glimpse(model_data, one_level_factors)
Arguments
| model_data | Model data | 
| one_level_factors | Which factors are one level | 
Value
A data.frame with limited information about one level factors
Alert user when factor coercion happens
Description
messages the user if columns in the dataset have been coerced to a factor, useful if you accidentally set a column with continuous data to a factor.
Usage
.msg_if_coerced_to_factors(which_to_factors)
Arguments
| which_to_factors | Names of columns that have been coerced to factors | 
Value
Nothing, messages the user if needed.
Alert user when setting ordered factors
Description
Ordered factors use orthogonal polynomials (contr.poly) by default with k number of levels -1 (k-1) of trend comparisons. If you use these functions to set the contrasts to something else, the ordered class (hence ordering to the levels) will remain but the contrasts will be set to something else.
Usage
.msg_if_ordered_reset(model_data, vars_in_model)
Arguments
| model_data | Data frame to be used with the model | 
| vars_in_model | Variables to check against | 
Value
Nothing, messages the user.
Alert user if there are more factors
Description
messages the user if the user has factor columns in their model data frame that weren't specified along with any factors they DID set contrasts for.
Usage
.msg_if_remaining_factors(model_data, specified_vars)
Arguments
| model_data | Model data | 
| specified_vars | Variables specified by the user from formulas | 
Value
Nothing, messages the user if needed.
Handle + in formula LHS
Description
Given a formula like cyl + gear ~ sum_code, this function recursively
replaces the + operators with c so that the LHS becomes c(cyl, gear).
Usage
.plus_to_c(plus_expr)
Arguments
| plus_expr | Expression | 
Details
This function doesn't recurse into other function calls, for example:
cyl + gear + factor(1 + 2) evaluates to c(cyl, gear, factor(1+2)).
Value
A new expression where + is replaced with c()
Postprocess contrast matrices
Description
When using use_contrasts() with a function or matrix, there are shared
postprocessing steps for manipulating the contrasts to set the reference
level, intercept, and labels. If as_is is TRUE, then these post processing
steps aren't included.
Usage
.postprocess_matrix(
  new_contrasts,
  code_by,
  reference_level,
  set_intercept,
  drop_trends,
  matrix_labels,
  labels,
  as_is,
  dots
)
Arguments
| new_contrasts | Contrast matrix passed from  | 
| code_by | What to code with, passed from  | 
| reference_level | Reference level specification | 
| set_intercept | Intercept specification | 
| drop_trends | Any trends to drop | 
| matrix_labels | Labels from the matrix dimension names | 
| labels | User-specified labels | 
| as_is | Whether to use matrix as-is | 
| dots | Any additional arguments passed with code_by | 
Value
Contrast matrix
See Also
Process code_by
Description
Handles the code_by parameter and checks to make sure whether we can
safely drop trends or not. Also handles any usage of I()
Usage
.process_code_by(formula, params, env, verbose)
Arguments
| formula | Formula used to set contrast | 
| params | Parameter list | 
| env | Not used | 
| verbose | Whether to throw the warning about invalid  | 
Value
Modified parameter list with updated code_by
Pass arguments to contrast code
Description
Processes a formula and any arguments for the contrast matrix and sets up the use_contrasts call
Usage
.process_contrasts(model_data, raw_formula, omit_drop)
Arguments
| model_data | Data frame with factor column | 
| raw_formula | Raw formula | 
| omit_drop | Logical, set to TRUE when set_contrasts is used by appending an attribute to the formula list, otherwise is FALSE (as in enlist_contrasts) | 
Value
A contrast matrix
Process factor column
Description
This is usually the first thing to be processed in a formula like
varname ~ x; ensures that varname is treated as a factor vector
Usage
.process_factor_col(cur_expr, params, env, verbose)
Arguments
| cur_expr | Current expression, see  | 
| params | Parameter accumulator | 
| env | Environment for the formula, on the first recursion this will be
pulled from  | 
| verbose | Logical, default  | 
Value
Parameter list with factor_col updated
Reset comparison labels of matrix to defaults
Description
Given a contrast matrix and a coding function used to generate it, check whether we have default labels implemented. If so, use them if the matrix doesn't have unique ones. If no function is provided, just use what the matrix has or use numeric indices
Usage
.reset_comparison_labels(contr_mat, coding_fx = NULL)
Arguments
| contr_mat | Contrast matrix | 
| coding_fx | Function name as a string | 
Value
Matrix with column names changed if necessary
Set intercept for contrast matrix
Description
Given a contrast matrix and a desired level, change the intercept via manipulating underlying hypothesis matrix.
Usage
.set_intercept(contrast_matrix, intercept_level)
Arguments
| contrast_matrix | Contrast matrix to use | 
| intercept_level | Level to use as intercept, must be present in the row names of the contrast matrix | 
Value
Manipulated contrast matrix
Process and set parameter
Description
Unpacks the given expression to set the parameter specified by which_param
to params. Continues recursively setting parameters via
.make_parameters().
Usage
.set_param(cur_expr, params, env, which_param, verbose)
Arguments
| cur_expr | Current expression, a formula or list representation thereof | 
| params | Parameter accumulator | 
| env | Environment for the formula, on the first recursion this will be
pulled from  | 
| which_param | Which parameter to set, a string for usage | 
| verbose | Logical, default  | 
Value
params
See Also
Split contrast function using parens
Description
If something like set_contrasts(df, var ~ sum_code()) then what's
extracted from the formula isn't the symbol for the function sum_code but
a language object. This can be converted to a list to extract the function
symbol and then any arguments provided in the parens. The latter needs to
be evaluated in the original environment, for example if
set_contrasts(df, var ~ sum_code(scores=c(.1,.5,.6)) is called, the scores
list would not evaluate the c(...) call, yielding an error that the scores
argument isn't the right length (because it would be length 1, not 3).
Usage
.split_if_language(params, var_envir)
Arguments
| params | Parameters extracted from formula parsing | 
| var_envir | Environment to evaluate expressions in | 
Value
Parameter list with code_by set to the correct symbol & an
additional list entry for other arguments, which will be empty if no
arguments are provided.
Check if reference switching is necessary
Description
Check if the contrast matrix is able to switch reference levels, and if it is requested, do so
Usage
.switch_reference_if_needed(
  contrast_matrix,
  new_reference_label = NA,
  new_reference_index
)
Arguments
| contrast_matrix | Contrast matrix | 
| new_reference_label | Name of the level to use | 
| new_reference_index | Index of the level to use | 
Value
Contrast matrix with reference level swapped if needed
Switch reference level in contrast matrix
Description
Reorders the rows of a contrast matrix to properly set the reference level
Usage
.switch_reference_level(contrast_matrix, old_reference, new_reference)
Arguments
| contrast_matrix | An unlabeled contrast matrix | 
| old_reference | The previously specified reference level, usually the
default for the scheme found by  | 
| new_reference | The index of the row to use as the new reference level | 
Value
A matrix with the reordered rows and correct values for the reference level
Diagnose glimpse issues and send warnings
Description
glimpse_contrasts() does not modify the dataframe passed to it, which can
result in mismatches between the data the user will use and the glimpse
information presented. This runs many diagnostics to inform the use of such
mismatches and provides suggestions on how to fix the issue.
Usage
.warn_if_mismatched_contrasts(
  model_data,
  contrast_list,
  model_data_name,
  dots_names,
  formulas
)
Arguments
| model_data | Data user passed to  | 
| contrast_list | List of contrasts created by  | 
| model_data_name | Name of the dataframe passed to the user, will be truncated if it's a long expression that has (likely) been piped | 
| dots_names | Usually "...", in this case, the  | 
| formulas | Formulas passed by the user | 
Value
Nothing, issues warnings to the user.
Warn user if nondefault contrasts are set
Description
R automatically assigns specific contrast schemes to ordered and unordered
factors as specified in options('contrasts') but users are of course free
to set these on the factor themselves. But, if they do this outside of a call
to glimpse_contrasts it's hard and time consuming to check what they set
against the different possible common schemes. So, rather than checking all
possible combinations, this will only check against the defaults R already
uses and alert the user if something else is set.
Usage
.warn_if_nondefault(
  contrast_list,
  factor_names,
  factor_sizes,
  which_ordered,
  schemes_to_use
)
Arguments
| contrast_list | List of contrasts like that generated by
 | 
| factor_names | Names of the factors, also the names of the contrast list | 
| factor_sizes | Number of levels for each factor | 
| which_ordered | Which of the factors are ordered | 
| schemes_to_use | Character vector of schemes, if any don't match the default for a factor, it will be replaced wtih ??? in th eoutput | 
Value
Warns if non default contrasts are set, returns schemes_to_use with modifications if necessary
Warn if one level factor
Description
Factors with only one level happen if a character vector is converted to a
factor using factor() but without specifying anything for the levels
parameter. If you try to access or set the contrasts for a one-level factor,
you'll get an error that contrasts are undefined because you have 0 degrees
of freedom.
Usage
.warn_if_onelevel(
  one_level_factors = NULL,
  model_data = NULL,
  attempting_factors = NULL
)
Arguments
| one_level_factors | Character vector of which factors are one level | 
| model_data | Model data to look for factor columns | 
| attempting_factors | Factor column names to check | 
Value
Nothing, warns if factors with only one level are detected.
Convert to unordered factor
Description
Unordered analogue of base R's as.ordered. Will convert x to an unordered
factor; unlike as.factor(), this will convert ordered factors to unordered
factors.
Usage
as.unordered(x)
Arguments
| x | Object to convert to unordered factor | 
Value
x as an unordered factor
See Also
Examples
# Convert an ordered factor to unordered
as.unordered(gl(5,1,ordered = TRUE))
# If level order is pre-specified differently from default alphabetical order
# then the ordering will be retained
as.unordered(ordered(c("a", "b", "c"), levels = c("c", "a", "b")))
# Otherwise the vector will be converted to an unordered factor with levels
# in the default alphabetical order
as.unordered(c("c", "a", "b"))
# Note that coercing integer values will sort the values to use as the levels
as.unordered(4:1)
Backward difference code
Description
Compares the mean of level k to level k-1. Differs in direction from forward_difference_code, so be careful to pick the right function. See also contr.sdif.
Usage
backward_difference_code(n)
Arguments
| n | Integer umber of factor levels to compute contrasts for. | 
Details
Example interpretation for a 4 level factor:
- Intercept = Grand mean (mean of the means of each level) 
- grp1 = mean(grp2) - mean(grp1) 
- grp2 = mean(grp3) - mean(grp2) 
- grp3 = mean(grp4) - mean(grp3) 
Value
A contrast matrix with dimensions n rows and (n-1) columns.
Examples
mydf <- data.frame(
  grp = gl(4,5),
  resp = c(seq(1, 5), seq(5, 9), seq(10, 14), seq(15, 19))
)
mydf <- set_contrasts(mydf, grp ~ backward_difference_code)
lm(resp ~ grp, data = mydf)
Cumulative split contrasts
Description
Contrast coding scheme that repeatedly dichotomizes the factor levels.
Usage
cumulative_split_code(n)
Arguments
| n | Integer umber of factor levels to compute contrasts for. | 
Details
This scheme is similar to Helmert contrasts, but instead of comparing one level to the accumulated mean of all previous levels, each comparison with this scheme splits the levels into two groups: those below and including the current level, and those above the current level. Conceptually this is similar to continuation ratio logits used in ordinal models. For example, with a four level factor with levels A, B, C, and D, the comparisons would be:
- A vs. BCD 
- AB vs. CD 
- ABC vs. D 
In other words, each comparison splits the levels into two groups. Each of these comparisons uses the cumulative mean of all the levels in each group. The intercept is the grand mean.
Value
A contrast matrix with dimensions n rows and (n-1) columns.
Examples
set.seed(111)
mydf <- data.frame(
  grp = rep(c("a", "b", "c", "d"), each = 2000),
  val = c(
    rnorm(200, 2, 1),
    rnorm(200, 5, 1),
    rnorm(200, 7.5, 1),
    rnorm(200, 15, 1)
  )
) |>
  set_contrasts(grp ~ cumulative_split_code |
    c("a-rest", "ab-rest", "abc-rest"))
lm(val ~ grp, data = mydf)
Decompose contrasts into new columns
Description
Given a dataframe with factor columns, this function will extract the contrasts from the factor column and place them inside new columns. This is useful for cases where you want to work with the numeric values of the contrasts. For a pedagogical example, you can explicitly show how factor variables are transformed into numeric values. For a practical example, you're typically allowed n-1 contrasts for n levels of a factor. If you don't want to use all of the contrasts, you can extract the ones you want and use them in your model. This is sometimes used with polynomial contrasts when you don't want to use higher order polynomials.
Usage
decompose_contrasts(
  model_data,
  extract,
  remove_intercept = TRUE,
  remove_original = FALSE
)
Arguments
| model_data | Dataframe with factor columns | 
| extract | A one-sided formula denoting the factors to extract. Note this should ideally be what you would pass to your model fitting function, sans any non-factors. | 
| remove_intercept | Logical, whether to remove the column corresponding
to the intercept. Default  | 
| remove_original | Logical, whether to remove the original columns in
the data frame after decomposing into separate columns. Default  | 
Details
An additional usage for this function is to compute the contrasts for
interaction terms in a model. In lm(y ~ A * B), where A and B are factors,
the expanded form is lm(y ~ A + B + A:B) with an equation of y =
\beta_Ax_A + \beta_Bx_B + \beta_{A:B}x_Ax_B. The thing to note is that the
coefficient for the interaction(s) are multiplied by the product of x_A
and x_B. Let's call this product x_C. For example, if one value
of x_A is
-1/3 and one value of x_B is 2/3, then the product x_C is -2/9.
But, if there are 3 levels for x_A and 3 levels for x_B, then we
get 4 columns for the fixed effects and 4 more columns for the
interaction terms. It can be a lot of tedious work to precompute the products
manually, so we can use this function with extract_interaction = TRUE to
compute everything at once.
Value
model_data but with new columns corresponding to the numeric coding
of the given factor's contrasts
See Also
Examples
# Decompose contrasts for carb and gear columns into new columns, using
# the contrast labels used when setting the contrasts
mtcars |>
  set_contrasts(
    carb ~ scaled_sum_code,
    gear ~ contr.sum | c("4-mean", "5-mean")
  ) |>
  decompose_contrasts(~ carb + gear) |>
  str()
# Decompose an interaction term between the two factors
mtcars |>
  set_contrasts(
    carb ~ scaled_sum_code,
    gear ~ contr.sum | c("4-mean", "5-mean")
  ) |>
  decompose_contrasts(~ carb * gear) |>
  str()
List of contrast matrices
Description
Returns a named list of contrast matrices to use with modeling
functions directly. See set_contrasts() for a function
to set contrasts directly to the dataframe. See details for syntax
information
Usage
enlist_contrasts(model_data, ..., verbose = getOption("contrastable.verbose"))
Arguments
| model_data | Data frame you intend on passing to your model | 
| ... | A series of 2 sided formulas with factor name on the left hand
side and desired contrast scheme on the right hand side. The reference
level can be set with  | 
| verbose | Logical, defaults to FALSE, whether messages should be printed | 
Details
enlist_contrasts(), set_contrasts(),
and glimpse_contrasts() use special syntax to set
contrasts for multiple factors. The syntax consists of two-sided formulas
with the desired factor column on the left hand side and the contrast
specification on the right hand side. For example, varname ~ scaled_sum_code. Many contrasts support additional kinds of contrast
manipulations using overloaded operators:
-  + X: Set the reference level to the level named X. Only supported for schemes that have a singular reference level such assum_code(),scaled_sum_code(),treatment_code(),stats::contr.treatment(),stats::contr.sum(),stats::contr.SAS(). Ignored for schemes likehelmert_code().
-  * X: Overwrite the intercept to the mean of the level named X
-  - A:B: For polynomial coding schemes only, drop comparisons A through B.
-  | c(...): Change the comparison labels for the contrast matrix to the character vectorc(...)of lengthn-1. These labels will appear in the output/summary of a statistical model. Note that forbrms::brm, instances of-(a minus sign) are replaced withM.
You can also specify multiple variables on the left hand side of a formula using tidyselect helpers. See examples for more information.
Typically model functions like lm will have a contrasts argument where you
can set the contrasts at model run time, rather than having to manually
change the contrasts on the underlying factor columns in your data. This
function will return such a named list of contrast matrices to pass to these
functions. Note that this function should not be used within a modeling
function call, e.g., lm(y~x, data = model_data, contrasts =
enlist_contrasts(model_data, x~sum_code)). Often, this will call
enlist_contrasts twice, rather than just once.
For some model fitting functions, like brms::brm, there is no
contrasts argument. For such cases, use set_contrasts() to
set contrasts directly to the factors in a dataframe.
One good way to use enlist_contrasts() is in conjunction
with MASS::fractions() to create a list of matrices that can be printed
to explicitly show the entire contrast matrices you're using for your models.
This can be especially helpful for supplementary materials in an academic
paper.
Sometimes when using orthogonal polynomial contrasts from
stats::contr.poly() people will drop higher level polynomials for
parsimony. Note however that these do capture some amount of variation, so
even though they're orthogonal contrasts the lower level polynomials will
have their estimates changed. Moreover, you cannot reduce a contrast matrix
to a matrix smaller than size n*n-1 in the dataframe you pass to a model
fitting function itself, as R will try to fill in the gaps with something
else. If you want to drop contrasts you'll need to use something like
enlist_contrasts(df, x ~ contr.poly - 3:5) and pass this to the
contrasts argument in the model fitting function.
Value
List of named contrast matrices. Internally, if called within
set_contrasts, will return a named list with contrasts equal to the list
of named contrast matrices and data equal to the passed model_data with
any factor coercions applied (so that set_contrasts() doesn't need to do
it a second time).
See Also
set_contrasts() glimpse_contrasts()
Examples
my_df <- mtcars
my_df$gear <- factor(my_df$gear)
my_df$carb <- factor(my_df$carb)
# Use formulas where left hand side is the factor column name
# and the right hand side is the contrast scheme you want to use
enlist_contrasts(
  my_df,
  gear ~ scaled_sum_code,
  carb ~ helmert_code,
  verbose = FALSE
)
# Add reference levels with +
enlist_contrasts(
  my_df,
  gear ~ scaled_sum_code + 5,
  carb ~ contr.sum + 6,
  verbose = FALSE
)
# Manually specifying matrix also works
enlist_contrasts(
  my_df,
  gear ~ matrix(c(1, -1, 0, 0, -1, 1), nrow = 3),
  carb ~ forward_difference_code,
  verbose = FALSE
)
# User matrices can be assigned to a variable first, but this may make the
# comparison labels confusing. You should rename them manually to something
# that makes sense. This will invoke use_contrast_matrix, so reference levels
# specified with + will be ignored.
my_gear_contrasts <- matrix(c(1, -1, 0, 0, -1, 1), nrow = 3)
colnames(my_gear_contrasts) <- c("CMP1", "CMP2")
enlist_contrasts(
  my_df,
  gear ~ my_gear_contrasts,
  carb ~ forward_difference_code,
  verbose = FALSE
)
# Will inform you if there are factors you didn't set
enlist_contrasts(my_df, gear ~ scaled_sum_code)
# Use MASS::fractions to pretty print matrices for academic papers:
lapply(enlist_contrasts(my_df, gear ~ scaled_sum_code, carb ~ helmert_code),
       MASS::fractions)
# Use a list of formulas to use the same contrasts with different datasets
my_contrasts <- list(gear ~ scaled_sum_code, carb ~ helmert_code)
enlist_contrasts(my_df,  my_contrasts)
enlist_contrasts(mtcars, my_contrasts)
# Use tidyselect helpers to set multiple variables at once
# These are all equivalent
contr_list1 <- enlist_contrasts(mtcars,
                 cyl ~ sum_code, gear ~ sum_code,
                 verbose = FALSE)
contr_list2 <- enlist_contrasts(mtcars,
                 cyl + gear ~ sum_code,
                 verbose = FALSE)
contr_list3 <- enlist_contrasts(mtcars,
                 c(cyl, gear) ~ sum_code,
                 verbose = FALSE)
contr_list4 <- enlist_contrasts(mtcars,
                 all_of(c('cyl', 'gear')) ~ sum_code,
                 verbose = FALSE)
these_vars <- c("cyl", "gear")
contr_list5 <- enlist_contrasts(mtcars,
                                all_of(these_vars) ~ sum_code,
                                verbose = FALSE)
all.equal(contr_list1, contr_list2)
all.equal(contr_list2, contr_list3)
all.equal(contr_list3, contr_list4)
all.equal(contr_list4, contr_list5)
# You can also use [tidyselect::where()] with class checking helpers:
contr_list6 <- enlist_contrasts(mtcars,
                                where(is.numeric) ~ sum_code,
                                verbose = FALSE)
# Each variable name must only be set ONCE, e.g. these will fail:
try(enlist_contrasts(mtcars,
                     cyl ~ sum_code,
                     cyl ~ scaled_sum_code,
                     verbose = FALSE))
try(enlist_contrasts(mtcars,
                     cyl ~ sum_code,
                     all_of(these_vars) ~ scaled_sum_code,
                     verbose = FALSE))
try(enlist_contrasts(mtcars,
                     cyl ~ sum_code,
                     where(is.numeric) ~ scaled_sum_code,
                     verbose = FALSE))
Find column with same non-positive values
Description
The inverse matrix of a contrast matrix has a useful property where, after removing the row corresponding to the intercept, the reference level is the column index where each value in that column is (1) the same and (2) less than or equal to 0.
Usage
find_same_col(invmatrix)
Arguments
| invmatrix | Inverse of the hypothesis matrix | 
Details
For a contrast matrix generated from an expression x, with
number of levels n, consider the inverse matrices from
solve(.contrasts_to_hypotheses(x)) below for different x:
- contr.treatment: The first column contains all 0s, hence the reference level is the first level 
- contr.SAS: The last column contains all 0s, hence the reference level is the last level 
- scaled_sum_code: The first column contains all -1/n, hence the reference level is the first level 
- helmert_code: While the first column contains all negative numbers, they are not the same EXCEPT if n=2 
Note that "reference level" here is defined as a level from which every other level is compared to via pairwise comparisons.
Value
Integer index of the reference level, if there is no reference level, NA is returned
Forward difference code
Description
Compares the mean of level k to level k+1. Differs in direction from backward_difference_code, so be careful to pick the right function. See also contr.sdif.
Usage
forward_difference_code(n)
Arguments
| n | Integer umber of factor levels to compute contrasts for. | 
Details
Example interpretation for a 4 level factor:
- Intercept = Grand mean (mean of the means of each level) 
- grp1 = mean(grp1) - mean(grp2) 
- grp2 = mean(grp2) - mean(grp3) 
- grp3 = mean(grp3) - mean(grp4) 
Value
A contrast matrix with dimensions n rows and (n-1) columns.
Examples
mydf <- data.frame(
  grp = gl(4,5),
  resp = c(seq(1, 5), seq(5, 9), seq(10, 14), seq(15, 19))
)
mydf <- set_contrasts(mydf, grp ~ forward_difference_code)
lm(resp ~ grp, data = mydf)
Glimpse contrasts in dataframe
Description
Uses the same syntax as enlist_contrasts() and
set_contrasts(). Returns a summary table of the contrasts you've set. If
you set return.list=TRUE then you can access a list of contrasts in the
second element of the resulting list. The glimpse dataframe is the first
element. FALSE will return just the glimpse data frame.
Usage
glimpse_contrasts(
  model_data,
  ...,
  return_list = FALSE,
  show_all_factors = TRUE,
  add_namespace = FALSE,
  show_one_level_factors = FALSE,
  minimal = TRUE,
  verbose = getOption("contrastable.verbose")
)
Arguments
| model_data | Data to be passed to a model fitting function | 
| ... | Series of formulas | 
| return_list | Logical, defaults to FALSE, whether the output of enlist_contrasts should be returned | 
| show_all_factors | Logical, defaults to TRUE, whether the factors not explicitly set with formulas should be included | 
| add_namespace | Logical, defaults to FALSE, whether to append the namespace of the contrast scheme to the scheme name | 
| show_one_level_factors | Logical, should factors with only one level be included in the output? Default is FALSE to omit | 
| minimal | Logical, default TRUE, whether to omit the orthogonal, centered, dropped_trends, and explicitly_set columns from the output table | 
| verbose | Logical, defaults to TRUE, whether messages should be printed | 
Details
Generally, glimpse_contrasts will give warnings about mismatches between
the specified contrasts and what's actually set on the factors in a
dataframe. The warnings will typically tell you how to resolve these
mismatches. See the contrasts and warnings vignettes for more
information.
Value
A dataframe if return.list is FALSE, a list with a dataframe and list of named contrasts if TRUE.
See Also
enlist_contrasts() set_contrasts()
Examples
my_contrasts <- list(cyl ~ sum_code, carb ~ helmert_code)
my_data <- set_contrasts(mtcars, my_contrasts, verbose = FALSE)
my_data$gear <- factor(my_data$gear) # Make gear a factor manually
# View information about contrasts; gear will use default for unordered
glimpse_contrasts(my_data, my_contrasts)
Helmert code
Description
R's stats::contr.helmert() function is unscaled, meaning
that you need to scale the coefficients of a model fit to get the actual
comparisons of interest. This version will automatically scale the contrast
matrix such that the coefficients are the expected scaled values.
Usage
helmert_code(n)
Arguments
| n | Integer umber of factor levels to compute contrasts for. | 
Details
Helmert coding compares each level to the total mean of all levels that have come before it. Differs from backward difference coding, which compares only pairs of levels (not a level to a cumulative mean of levels)
Example interpretation for a 4 level factor:
- Intercept = Grand mean (mean of the means of each level) 
- grp2 = mean(grp2) - mean(grp1) 
- grp3 = mean(grp3) - mean(grp1, grp2) 
- grp4 = mean(grp4) - mean(grp1, grp2, grp3) 
Value
A contrast matrix with dimensions n rows and (n-1) columns.
Examples
mydf <- data.frame(
  grp = gl(4,5),
  resp = c(seq(1, 5), seq(5, 9), seq(10, 14), seq(15, 19))
)
mydf <- set_contrasts(mydf, grp ~ helmert_code)
lm(resp ~ grp, data = mydf)
Interpret intercept from contrasts
Description
Given a contrast matrix, try and interpret the intercept. Will usually be either the grand mean, the mean of a reference level (e.g. contr.treatment), the unweighted mean of multiple levels. Anything else would indicate custom weights that the user provided, hence they should know how to interpret it.
Usage
interpret_intercept(contrast_matrix)
Arguments
| contrast_matrix | Contrast matrix | 
Value
A string describing how to interpret the effect on the intercept this coding scheme has
Examples
interpret_intercept(contr.treatment(2)) # mean(1)
interpret_intercept(contr.SAS(2)) # mean(2)
interpret_intercept(contr.sum(2)) # grand mean
# Here there are 3 levels but the intercept is either an unweighted
# mean of 2 levels or a weighted mean of 2 levels
unweighted_intercept <-
  solve(t(matrix(c(.5, .5, 0, -1, 1, 0, -1, 0, 1), nrow = 3)))[, 2:3]
weighted_intercept <-
  solve(t(matrix(c(.8, .2, 0, -1, 1, 0, -1, 0, 1), nrow = 3)))[, 2:3]
interpret_intercept(unweighted_intercept) # mean(1,2)
interpret_intercept(weighted_intercept) # custom weights
Check for unordered factor
Description
Helper to check if a factor is exclusively unordered. is.factor(x) is TRUE when x is unordered OR ordered.
Usage
is.unordered(x)
Arguments
| x | a vector of data | 
Value
TRUE if x is an unordered factor, FALSE if x is not a factor or is an ordered factor
Examples
is.unordered(gl(5,1)) # True
is.unordered(gl(5,1,ordered = TRUE)) # False
Check for orthogonality
Description
Given a contrast matrix or list of contrast matrices (eg from
enlist_contrasts()), return a logical vector of whether each contrast is
centered or not.
Usage
is_centered(contrast_matrices, USE.NAMES = FALSE)
Arguments
| contrast_matrices | Contrast matrix or list of contrast matrices | 
| USE.NAMES | Logical, whether vector should be named | 
Value
Logical vector, will retain names of a passed list
Examples
is_centered(treatment_code(5)) # FALSE
is_centered(scaled_sum_code(5)) # TRUE
Check for orthogonality
Description
Given a contrast matrix or list of contrast matrices (eg from
enlist_contrasts() ), return a logical vector of whether each contrast is
orthogonal or not.
Usage
is_orthogonal(contrast_matrices, USE.NAMES = FALSE)
Arguments
| contrast_matrices | Contrast matrix or list of contrast matrices | 
| USE.NAMES | Logical, whether vector should be named | 
Value
Logical vector, will retain names of a passed list
Examples
is_orthogonal(treatment_code(5)) # FALSE
is_orthogonal(helmert_code(5)) # TRUE
Orthogonal Polynomial code
Description
Wrapper around stats::contr.poly(). You can also use polynomial_code()
as an alias.
Usage
orth_polynomial_code(n)
polynomial_code(n)
Arguments
| n | Integer umber of factor levels to compute contrasts for. | 
Details
For n levels of factors where k in 1:n, generate a matrix with n-1 comparisons where each comparison looks for a polynomial trend of degree k where each polynomial is independent of the others.
Value
A contrast matrix with dimensions n rows and (n-1) columns.
Examples
mydf <- data.frame(
  grp = rep(c("a", "b", "c", "d"), each = 2000),
  val = c(
    rnorm(200, 2, 1),
    rnorm(200, 5, 1),
    rnorm(200, 7.5, 1),
    rnorm(200, 15, 1)
  )
) |>
  set_contrasts(grp ~ polynomial_code)
stats::lm(val ~ grp, data = mydf)
Raw Polynomial code
Description
Make raw polynomial contrast, rather than orthogonal ones. Normally you would use orthogonal polynomials, so make sure this is what you want. Using raw polynomials may increase the collinearity in your model, especially with higher numbers of levels.
Usage
raw_polynomial_code(n)
Arguments
| n | Integer umber of factor levels to compute contrasts for. | 
Details
For n levels of factors where k in 1:n, generate a matrix with n-1
comparisons where each comparison looks for a polynomial trend of degree k,
where each polynomial may be correlated with the others. Normally you would
use orthogonal polynomials, see stats::contr.poly() and
orth_polynomial_code()
Value
A contrast matrix with dimensions n rows and (n-1) columns.
Examples
mydf <- data.frame(
  grp = rep(c("a", "b", "c", "d"), each = 2000),
  val = c(
    rnorm(200, 2, 1),
    rnorm(200, 5, 1),
    rnorm(200, 7.5, 1),
    rnorm(200, 15, 1)
  )
) |>
  set_contrasts(grp ~ raw_polynomial_code)
stats::lm(val ~ grp, data = mydf)
Reverse Helmert code
Description
Reverse helmert coding is the same concept as helmert coding, but the order of the groupings is reversed. See also helmert_code.
Usage
reverse_helmert_code(n)
Arguments
| n | Integer umber of factor levels to compute contrasts for. | 
Details
Reverse helmert coding compares each level to the total mean of all levels that come after it. Differs from forward difference coding, which only compares pairs of levels (not a level to a cumulative mean of levels).
Example interpretation for a 4 level factor:
- Intercept = Grand mean (mean of the means of each level) 
- grp1 = mean(grp4, grp3, grp2) - grp(1) 
- grp2 = mean(grp4, grp3) - mean(grp2) 
- grp3 = mean(grp3) - mean(grp4) 
Value
A contrast matrix with dimensions n rows and (n-1) columns.
Examples
mydf <- data.frame(
  grp = gl(4,5),
  resp = c(seq(1, 5), seq(5, 9), seq(10, 14), seq(15, 19))
)
mydf <- set_contrasts(mydf, grp ~ reverse_helmert_code)
lm(resp ~ grp, data = mydf)
Scaled sum coding
Description
Contrast coding scheme with a centered intercept and comparisons from a baseline reference level.
Usage
scaled_sum_code(n)
Arguments
| n | Integer umber of factor levels to compute contrasts for. | 
Details
The name for this contrast scheme varies widely in different fields
and across experimental psychology papers. It has been called simple, sum,
contrast, sum-to-zero, and deviation coding (among other names). This package
uses scaled sum coding to explicitly differentiate it from sum coding, which
has an implementation in base R with contr.sum.
For n levels of factors, generate a matrix with n-1 comparisons where:
- Reference level = -1/n 
- Comparison level = (n-1)/n 
- All others = -1/n 
Example interpretation for a 4 level factor:
- Intercept = Grand mean (mean of the means of each level) 
- grp2 = mean(grp2) - mean(grp1) 
- grp3 = mean(grp3) - mean(grp1) 
- grp4 = mean(grp4) - mean(grp1) 
Note: grp coefficient estimates are the same as with contr.treatment, but the intercept is changed to the grand mean instead of the mean of grp1.
It's also important to note that this coding scheme is NOT the same as
contr.sum/2 when the number of levels is greater than 2. When n=2,
estimates with contr.sum can be interpreted as "half the distance between
levels" but when k>2, contr.sum is to be interpreted as "the distance
between this level and the GRAND MEAN". You may be tempted to use
contr.sum(n)/2, but this tests the hypothesis that 3/2 times the mean of a
level is equal to half the sum of the means of the other levels, i.e.,
1.5\mu_1 - .5\mu_2 - .5\mu_3 - .5\mu_4 = 0, which is not likely to be
what you're looking for.
Value
A contrast matrix with dimensions n rows and (n-1) columns.
Examples
# Compare these two, note that contr.sum(4)/2 is not the same
scaled_sum_code(4)
contr.sum(4)
# Here they happen to be equivalent (modulo reference level)
scaled_sum_code(2)
contr.sum(2) / 2
mydf <- data.frame(
  grp = gl(4,5),
  resp = c(seq(1, 5), seq(5, 9), seq(10, 14), seq(15, 19))
)
mydf <- set_contrasts(mydf, grp ~ scaled_sum_code)
lm(resp ~ grp, data = mydf)
Set contrasts to dataframe
Description
Uses the same syntax as enlist_contrasts(),
but returns the dataframe with the new contrasts applied. Use this when
your model function doesnt have a contrasts argument and you want to avoid
writing contrasts<- multiple times. See
enlist_contrasts() for details about the
package-specific syntax.
Usage
set_contrasts(
  model_data,
  ...,
  verbose = getOption("contrastable.verbose"),
  print_contrasts = FALSE
)
Arguments
| model_data | Data frame you intend on passing to your model | 
| ... | A series of 2 sided formulas with factor name on the left hand
side and desired contrast scheme on the right hand side. The reference
level can be set with  | 
| verbose | Logical, defaults to FALSE, whether messages should be printed | 
| print_contrasts | Logical, default FALSE, whether to print the contrasts
set for each factor. Fractions are displayed using  | 
Details
enlist_contrasts(), set_contrasts(),
and glimpse_contrasts() use special syntax to set
contrasts for multiple factors. The syntax consists of two-sided formulas
with the desired factor column on the left hand side and the contrast
specification on the right hand side. For example, varname ~ scaled_sum_code. Many contrasts support additional kinds of contrast
manipulations using overloaded operators:
-  + X: Set the reference level to the level named X. Only supported for schemes that have a singular reference level such assum_code(),scaled_sum_code(),treatment_code(),stats::contr.treatment(),stats::contr.sum(),stats::contr.SAS(). Ignored for schemes likehelmert_code().
-  * X: Overwrite the intercept to the mean of the level named X
-  - A:B: For polynomial coding schemes only, drop comparisons A through B.
-  | c(...): Change the comparison labels for the contrast matrix to the character vectorc(...)of lengthn-1. These labels will appear in the output/summary of a statistical model. Note that forbrms::brm, instances of-(a minus sign) are replaced withM.
You can also specify multiple variables on the left hand side of a formula using tidyselect helpers. See examples for more information.
Typically model functions like lm will have a contrasts argument where you
can set the contrasts at model run time, rather than having to manually
change the contrasts on the underlying factor columns in your data. This
function will return such a named list of contrast matrices to pass to these
functions. Note that this function should not be used within a modeling
function call, e.g., lm(y~x, data = model_data, contrasts =
enlist_contrasts(model_data, x~sum_code)). Often, this will call
enlist_contrasts twice, rather than just once.
For some model fitting functions, like brms::brm, there is no
contrasts argument. For such cases, use set_contrasts() to
set contrasts directly to the factors in a dataframe.
One good way to use enlist_contrasts() is in conjunction
with MASS::fractions() to create a list of matrices that can be printed
to explicitly show the entire contrast matrices you're using for your models.
This can be especially helpful for supplementary materials in an academic
paper.
Sometimes when using orthogonal polynomial contrasts from
stats::contr.poly() people will drop higher level polynomials for
parsimony. Note however that these do capture some amount of variation, so
even though they're orthogonal contrasts the lower level polynomials will
have their estimates changed. Moreover, you cannot reduce a contrast matrix
to a matrix smaller than size n*n-1 in the dataframe you pass to a model
fitting function itself, as R will try to fill in the gaps with something
else. If you want to drop contrasts you'll need to use something like
enlist_contrasts(df, x ~ contr.poly - 3:5) and pass this to the
contrasts argument in the model fitting function.
Value
The model_data dataframe, but with updated contrasts.
See Also
enlist_contrasts() glimpse_contrasts()
Examples
head(
   set_contrasts(mtcars, carb + cyl ~ helmert_code, print_contrasts = TRUE)
)
Sum code
Description
Wrapper around contr.sum, but ensures that the reference level is the first level alphabetically, not the last. Returns a contrast matrix where comparisons give differences between comparison levels and the grand mean.
Usage
sum_code(n)
Arguments
| n | Integer umber of factor levels to compute contrasts for. | 
Details
For n levels of factors, generate a matrix with n-1 comparisons where:
- Reference level = -1 
- Comparison level = 1 
- All others = 0 
Example interpretation for a 4 level factor:
- Intercept = Grand mean (mean of the means of each level) 
- grp2 = grp2 - mean(grp4, grp3, grp2, grp1) 
- grp3 = grp3 - mean(grp4, grp3, grp2, grp1) 
- grp4 = grp4 - mean(grp4, grp3, grp2, grp1) 
Note that when n = 2, the coefficient estimate is half of the difference between the two levels. But, this coincidence does not hold when the number of levels is greater than 2.
Value
A contrast matrix with dimensions n rows and (n-1) columns.
Examples
mydf <- data.frame(
  grp = gl(4,5),
  resp = c(seq(1, 5), seq(5, 9), seq(10, 14), seq(15, 19))
)
mydf <- set_contrasts(mydf, grp ~ sum_code)
lm(resp ~ grp, data = mydf)
Treatment code
Description
Wrapper around stats::contr.treatment(). Returns a contrast
matrix where comparisons give differences between each comparison level and a
baseline reference level, while the intercept equals the first level of the
factor. See scaled_sum_code() for a function that centers
the intercept on the grand mean while retaining pairwise comparisons from a
reference level.
Usage
treatment_code(n)
Arguments
| n | Integer umber of factor levels to compute contrasts for. | 
Details
For n levels of factors, generate a matrix with n-1 comparisons where:
- Reference level = 0 
- Comparison level = 1 
- All others = 0 
Note that this function sets the first level (alphabetically) as the
reference level while  stats::contr.SAS() sets the LAST level as the
reference level. However, in functions like
set_contrasts(), and enlist_contrasts(), the reference level is
automatically set to be the first level alphabetically.
Value
A contrast matrix with dimensions n rows and (n-1) columns.
Examples
mydf <- data.frame(
  grp = gl(4,5),
  resp = c(seq(1, 5), seq(5, 9), seq(10, 14), seq(15, 19))
)
mydf <- set_contrasts(mydf, grp ~ treatment_code)
lm(resp ~ grp, data = mydf)
Contrast code factors
Description
Helper to do contrast coding. There are two options:
- Manually specify a matrix for code_by (implements use_contrast_matrix). Reference level is automatically set to the row that's always negative. 
- Specify a style of contrast coding as a function. Label of the reference level should be specified in ... 
Usage
use_contrasts(
  factor_col,
  code_by = NA,
  reference_level = NA,
  set_intercept = NA,
  drop_trends = NA,
  labels = NULL,
  as_is = FALSE,
  ...
)
Arguments
| factor_col | The factor column to use, eg data$gender | 
| code_by | Either a matrix or a function | 
| reference_level | The level to use as the reference level, default NA | 
| set_intercept | The intercept to use, default NA | 
| drop_trends | Whether to drop trends, default NA | 
| labels | Labels to use in the contrast matrix, must equal number of contrasts | 
| as_is | Logical, default FALSE, whether to suppress auto switching of the reference level to the first level if not specified | 
| ... | Additional arguments to be passed to use_contrast_function, specifically, which level you want the reference level to be | 
Value
A contrast coding matrix with labels and proper reference level
Examples
# Create a contrast matrix given some factor vector with the specified
# reference level
use_contrasts(gl(5,2), sum_code, reference_level = 3)
# Set column labels; order for labels is the same as the column indices
use_contrasts(gl(3,2), scaled_sum_code, labels = c("2-1", "3-1"))
my_data <- mtcars
my_data$gear <- factor(mtcars$gear)
MASS::fractions(use_contrasts(my_data$gear, helmert_code))
AsIs method for use_contrasts
Description
Evaluates code_by, then applies the appropriate use_contrasts method
Usage
## S3 method for class 'AsIs'
use_contrasts(
  factor_col,
  code_by = NA,
  reference_level = NA,
  set_intercept = NA,
  drop_trends = NA,
  labels = NULL,
  as_is = FALSE,
  ...
)
Arguments
| factor_col | A factor vector, eg from df$factorVarName | 
| code_by | A symbol to be evaluated | 
| reference_level | The level to use as the reference level, default NA | 
| set_intercept | The intercept to use, default NA | 
| drop_trends | The trends to drop, default NA | 
| labels | A vector of labels to apply to the matrix column names, default NULL (no new labels) | 
| as_is | Logical, default FALSE, whether to leave the resulting matrix as-is | 
| ... | Additional arguments to be passed on | 
Value
A contrast coding matrix with labels and proper reference level
Examples
use_contrasts(gl(5,1), I(scaled_sum_code))
Default method for use_contrasts
Description
If a user doesn't specify a contrast matrix, use the defaults from options(). If the user tries to use something we don't know how to work with, throw a warning that we'll be using the defaults from options().
Usage
## Default S3 method:
use_contrasts(
  factor_col,
  code_by = NA,
  reference_level = NA,
  set_intercept = NA,
  drop_trends = NA,
  labels = NULL,
  as_is = FALSE,
  ...
)
Arguments
| factor_col | A factor vector, eg from  | 
| code_by | Some object that's not a matrix or function. If NA, no warning will be thrown, and the default contrasts will be used. A warning will be thrown if it's not NA. | 
| reference_level | Not used | 
| set_intercept | Not used | 
| drop_trends | Not used | 
| labels | A vector of labels to apply to the matrix column names, default | 
| as_is | Logical, default FALSE, whether to leave the resulting matrix | 
| ... | Additional arguments, not used | 
Value
Contrast matrix, using the ordered or unordered default from
options()
Examples
use_contrasts(gl(5,1), helmert_code) # a function
my_matrix <- helmert_code(5)
use_contrasts(gl(5,1), my_matrix) # a matrix
Function method for use_contrasts
Description
If the user provides a function, use the function and supplied arguments to create a contrast matrix
Usage
## S3 method for class ''function''
use_contrasts(
  factor_col,
  code_by = NA,
  reference_level = NA,
  set_intercept = NA,
  drop_trends = NA,
  labels = NULL,
  as_is = FALSE,
  ...
)
Arguments
| factor_col | A factor vector, eg from df$factorVarName | 
| code_by | A function to be called, should return a contrast matrix | 
| reference_level | The name of the level to use as the reference level, default NA | 
| set_intercept | The intercept to use, default NA | 
| drop_trends | The trends to drop, default NA | 
| labels | A vector of labels to apply to the matrix column names, default | 
| as_is | Logical, default FALSE, whether to leave the resulting matrix | 
| ... | Additional arguments to be passed to  | 
Value
A contrast coding matrix with labels and proper reference level
Examples
use_contrasts(gl(5,1), sum_code)
Use a hypr object for contrasts
Description
Use a hypr object for contrasts
Usage
## S3 method for class 'hypr'
use_contrasts(
  factor_col,
  code_by = NA,
  reference_level = NA,
  set_intercept = NA,
  drop_trends = NA,
  labels = NULL,
  as_is = FALSE,
  ...
)
Arguments
| factor_col | A factor vector, eg from df$factorVarName | 
| code_by | A hypr object created with  | 
| reference_level | Not used | 
| set_intercept | Not used | 
| drop_trends | Not used | 
| labels | A vector of labels to apply to the matrix column names, default | 
| as_is | Logical, default FALSE, whether to leave the resulting matrix | 
| ... | Additional arguments, not used | 
Value
Contrast matrix specified by the hypr object
Examples
hypr_obj <- hypr::hypr(a ~ b, c ~ b) # centered pairwise comparisons to b
use_contrasts(factor(c('a', 'b', 'c')), hypr_obj)
Matrix method for use_contrasts
Description
If a user provides a raw matrix, then use that matrix as the contrast matrix
Usage
## S3 method for class 'matrix'
use_contrasts(
  factor_col,
  code_by = NA,
  reference_level = NA,
  set_intercept = NA,
  drop_trends = NA,
  labels = NULL,
  as_is = FALSE,
  ...
)
Arguments
| factor_col | A factor vector, eg from df$factorVarName | 
| code_by | A matrix to be used as the contrast matrix, should have the same dimensions as the contrast matrix already applied to code_by | 
| reference_level | Not used | 
| set_intercept | Not used | 
| drop_trends | Not used | 
| labels | A vector of labels to apply to the matrix column names, default | 
| as_is | Logical, default FALSE, whether to leave the resulting matrix | 
| ... | Additional arguments, not used | 
Value
A contrast coding matrix with labels and proper reference level
Examples
contrast_matrix <- sum_code(4)
use_contrasts(gl(4,1), contrast_matrix)
Symbol method for use_contrasts
Description
Evaluates code_by, then applies the appropriate use_contrasts method
Usage
## S3 method for class 'name'
use_contrasts(
  factor_col,
  code_by = NA,
  reference_level = NA,
  set_intercept = NA,
  drop_trends = NA,
  labels = NULL,
  as_is = FALSE,
  ...
)
Arguments
| factor_col | A factor vector, eg from df$factorVarName | 
| code_by | A symbol to be evaluated | 
| reference_level | The level to use as the reference level, default NA | 
| set_intercept | The intercept to use, default NA | 
| drop_trends | The trends to drop, default NA | 
| labels | A vector of labels to apply to the matrix column names, default NULL (no new labels) | 
| as_is | Logical, default FALSE, whether to leave the resulting matrix as-is | 
| ... | Additional arguments to be passed on | 
Value
A contrast coding matrix with labels and proper reference level
Examples
aliased_scheme <- sum_code
contrast_scheme <- rlang::sym("aliased_scheme")
# Result will be as if sum_code was used directly
use_contrasts(gl(5,1), contrast_scheme)