Learn R Programming

⚠️There's a newer version (0.12.4) of this package.Take me there.

performance

Test if your model is a good model!

The primary goal of the performance package is to provide utilities for computing indices of model quality and goodness of fit. This includes measures like r-squared, root mean squared error or intraclass correlation coefficient (ICC) , but also functions to check (mixed) models for overdispersion, zero-inflation, convergence or singularity.

Installation

Run the following:

install.packages("devtools")
devtools::install_github("easystats/performance")
library("performance")

Examples

Assessing model quality

R-squared

performance has a generic r2() function, which computes the r-squared for many different models, including mixed effects and Bayesian regression models.

r2() returns a list containing values related to the “most appropriate” r-squared for the given model.

model <- lm(mpg ~ wt + cyl, data = mtcars)
r2(model)
#> # R2 for linear models
#> 
#>        R2: 0.830
#>   adj. R2: 0.819

model <- glm(am ~ wt + cyl, data = mtcars, family = binomial)
r2(model)
#> $R2_Tjur
#> Tjur's R2 
#>    0.7051

library(MASS)
data(housing)
model <- polr(Sat ~ Infl + Type + Cont, weights = Freq, data = housing)
r2(model)
#> $R2_Nagelkerke
#> Nagelkerke's R2 
#>          0.1084

The different r-squared measures can also be accessed directly via functions like r2_bayes(), r2_coxsnell() or r2_nagelkerke() (see a full list of functions here).

For mixed models, the conditional and marginal r-squared are returned. The marginal r-squared considers only the variance of the fixed effects and indicates how much of the model’s variance is explained by the fixed effects part only. The conditional r-squared takes both the fixed and random effects into account and indicates how much of the model’s variance is explained by the “complete” model.

For frequentist mixed models, r2() (resp. r2_nakagawa()) computes the mean random effect variances, thus r2() is also appropriate for mixed models with more complex random effects structures, like random slopes or nested random effects (see Johnson 2014 and Nakagawa et al. 2017).

library(rstanarm)
model <- stan_glmer(Petal.Length ~ Petal.Width + (1 | Species), 
    data = iris, cores = 4)
r2(model)
#> # Bayesian R2 with Standard Error
#> 
#>   Conditional R2: 0.954 [0.002]
#>      Marginal R2: 0.412 [0.119]

library(lme4)
model <- lmer(Reaction ~ Days + (1 + Days | Subject), data = sleepstudy)
r2(model)
#> # R2 for mixed models
#> 
#>   Conditional R2: 0.799
#>      Marginal R2: 0.279

Intraclass Correlation Coefficient (ICC)

Similar to r-squared, the ICC provides information on the explained variance and can be interpreted as “the proportion of the variance explained by the grouping structure in the population” (Hox 2010: 15).

icc() calculates the ICC for various mixed model objects, including stanreg models.

library(lme4)
model <- lmer(Reaction ~ Days + (1 + Days | Subject), data = sleepstudy)
icc(model)
#> # Intraclass Correlation Coefficient
#> 
#>      Adjusted ICC: 0.722
#>   Conditional ICC: 0.521

For models of class brmsfit, an ICC based on variance decomposition is returned (for details, see the documentation).

library(brms)
set.seed(123)
model <- brm(mpg ~ wt + (1 | cyl) + (1 + wt | gear), data = mtcars)
icc(model)
#> # Random Effect Variances and ICC
#> 
#> Conditioned on: all random effects
#> 
#> ## Variance Ratio (comparable to ICC)
#> Ratio: 0.39  CI 95%: [-0.57 0.78]
#> 
#> ## Variances of Posterior Predicted Distribution
#> Conditioned on fixed effects: 22.79  CI 95%: [ 8.48 57.73]
#> Conditioned on rand. effects: 37.70  CI 95%: [25.08 55.43]
#> 
#> ## Difference in Variances
#> Difference: 14.42  CI 95%: [-18.82 36.07]

Model diagnostics

Check for overdispersion

Overdispersion occurs when the observed variance in the data is higher than the expected variance from the model assumption (for Poisson, variance roughly equals the mean of an outcome). check_overdispersion() checks if a count model (including mixed models) is overdispersed or not.

library(glmmTMB)
data(Salamanders)
model <- glm(count ~ spp + mined, family = poisson, data = Salamanders)
check_overdispersion(model)
#> # Overdispersion test
#> 
#>        dispersion ratio =    2.946
#>   Pearson's Chi-Squared = 1873.710
#>                 p-value =  < 0.001
#> Overdispersion detected.

Overdispersion can be fixed by either modelling the dispersion parameter (not possible with all packages), or by choosing a different distributional family (like Quasi-Poisson, or negative binomial, see Gelman and Hill 2007).

Check for zero-inflation

Zero-inflation (in (Quasi-)Poisson models) is indicated when the amount of observed zeros is larger than the amount of predicted zeros, so the model is underfitting zeros. In such cases, it is recommended to use negative binomial or zero-inflated models.

Use check_zeroinflation() to check if zero-inflation is present in the fitted model.

model <- glm(count ~ spp + mined, family = poisson, data = Salamanders)
check_zeroinflation(model)
#> # Check for zero-inflation
#> 
#>    Observed zeros: 387
#>   Predicted zeros: 298
#>             Ratio: 0.77
#> Model is underfitting zeros (probable zero-inflation).

Check for singular model fits

A “singular” model fit means that some dimensions of the variance-covariance matrix have been estimated as exactly zero. This often occurs for mixed models with overly complex random effects structures.

check_singularity() checks mixed models (of class lme, merMod, glmmTMB or MixMod) for singularity, and returns TRUE if the model fit is singular.

library(lme4)
data(sleepstudy)

# prepare data
set.seed(1)
sleepstudy$mygrp <- sample(1:5, size = 180, replace = TRUE)
sleepstudy$mysubgrp <- NA
for (i in 1:5) {
    filter_group <- sleepstudy$mygrp == i
    sleepstudy$mysubgrp[filter_group] <- sample(1:30, size = sum(filter_group), 
        replace = TRUE)
}

# fit strange model
model <- lmer(Reaction ~ Days + (1 | mygrp/mysubgrp) + (1 | Subject), 
    data = sleepstudy)

check_singularity(model)
#> [1] TRUE

Remedies to cure issues with singular fits can be found here.

Model performance summaries

model_performance() computes indices of model performance for regression models. Depending on the model object, typical indices might be r-squared, AIC, BIC, RMSE, ICC or LOOIC.

Linear model

m1 <- lm(mpg ~ wt + cyl, data = mtcars)
model_performance(m1)
AICBICR2R2_adjustedRMSE
156161.90.830.822.44

Logistic regression

m2 <- glm(vs ~ wt + mpg, data = mtcars, family = "binomial")
model_performance(m2)
AICBICR2_Tjur
31.335.70.48

Linear mixed model

library(lme4)
m3 <- lmer(Reaction ~ Days + (1 + Days | Subject), data = sleepstudy)
model_performance(m3)
AICBICR2_conditionalR2_marginalICC_adjustedICC_conditionalRMSE
175617750.80.280.720.5223.44

Comparing different models

compare_performance(m1, m2, m3)
nameclassAICBICRMSER2R2_adjustedR2_TjurR2_conditionalR2_marginalICC_adjustedICC_conditional
m1glm31.335.70.48
m2lm156.0161.92.440.830.82
m3lmerMod1755.61774.823.440.80.280.720.52

References

Gelman, A., & Hill, J. (2007). Data analysis using regression and multilevel/hierarchical models. Cambridge; New York: Cambridge University Press.

Hox, J. J. (2010). Multilevel analysis: techniques and applications (2nd ed). New York: Routledge.

Johnson, P. C. D. (2014). Extension of Nakagawa & Schielzeth’s R2 GLMM to random slopes models. Methods in Ecology and Evolution, 5(9), 944–946. https://doi.org/10.1111/2041-210X.12225

Nakagawa, S., Johnson, P. C. D., & Schielzeth, H. (2017). The coefficient of determination R2 and intra-class correlation coefficient from generalized linear mixed-effects models revisited and expanded. Journal of The Royal Society Interface, 14(134), 20170213. https://doi.org/10.1098/rsif.2017.0213

Copy Link

Version

Install

install.packages('performance')

Monthly Downloads

88,210

Version

0.1.0

License

GPL-3

Maintainer

Daniel Lüdecke

Last Published

April 24th, 2019

Functions in performance (0.1.0)

item_split_half

Split-Half Reliability
item_intercor

Mean Inter-Item-Correlation
item_difficulty

Difficulty of Questionnaire Items
r2_kl

Kullback-Leibler R2
r2_coxnell

Cox & Snell's R2
error_rate

Error Rate for Logistic Regression Models
icc

The Intraclass Correlation Coefficient (ICC) for mixed models
hosmer_lemeshow

Hosmer-Lemeshow goodness-of-fit test
looic

LOO-related Indices for Bayesian regressions.
r2_nagelkerke

Nagelkerke's R2
model_performance

Model Performance
model_performance.lm

Performance of (Generalized) Linear Models
r2_nakagawa

Nakagawa's R2 for mixed models
rse

Residual Standard Error for Linear Models
r2_loo

LOO-adjusted R2
r2_mcfadden

McFadden's R2
mse

Mean Square Error of Linear Models
item_reliability

Reliability Test for Items or Scales
r2

Compute the model's R2
r2_bayes

Bayesian R2
model_performance.stanreg

Performance of Bayesian Models
principal_components

Principal Components Analysis
r2_tjur

Tjur's R2 - coefficient of determination (D)
rmse

Root Mean Squared Error of Linear Models
binned_residuals

Binned residuals for logistic regression
check_zeroinflation

Check for zero-inflation in count models
.is_empty_object

is string empty?
.obj_has_name

has object an element with given name?
cronbachs_alpha

Cronbach's Alpha for Items or Scales
check_convergence

Convergence test for mixed effects models
check_overdispersion

Check overdispersion of GL(M)M's
check_singularity

Check mixed models for boundary fits
model_performance.merMod

Performance of Mixed Models