Test if your model is a good model!
A crucial aspect when building regression models is to evaluate the quality of modelfit. It is important to investigate how well models fit to the data and which fit indices to report. Functions to create diagnostic plots or to compute fit measures do exist, however, mostly spread over different packages. There is no unique and consistent approach to assess the model quality for different kind of models.
The primary goal of the performance package is to fill this gap and to provide utilities for computing indices of model quality and goodness of fit. These include measures like r-squared (R2), root mean squared error (RMSE) or intraclass correlation coefficient (ICC) , but also functions to check (mixed) models for overdispersion, zero-inflation, convergence or singularity.
The performance package is available on CRAN, while its latest development version is available on R-universe (from rOpenSci).
Type | Source | Command |
---|---|---|
Release | CRAN | install.packages("performance") |
Development | R-universe | install.packages("performance", repos = "https://easystats.r-universe.dev") |
Once you have downloaded the package, you can then load it using:
library("performance")
Tip
Instead of
library(performance)
, uselibrary(easystats)
. This will make all features of the easystats-ecosystem available.To stay updated, use
easystats::install_latest()
.
To cite performance in publications use:
citation("performance")
#> To cite package 'performance' in publications use:
#>
#> Lüdecke et al., (2021). performance: An R Package for Assessment, Comparison and
#> Testing of Statistical Models. Journal of Open Source Software, 6(60), 3139.
#> https://doi.org/10.21105/joss.03139
#>
#> A BibTeX entry for LaTeX users is
#>
#> @Article{,
#> title = {{performance}: An {R} Package for Assessment, Comparison and Testing of Statistical Models},
#> author = {Daniel Lüdecke and Mattan S. Ben-Shachar and Indrajeet Patil and Philip Waggoner and Dominique Makowski},
#> year = {2021},
#> journal = {Journal of Open Source Software},
#> volume = {6},
#> number = {60},
#> pages = {3139},
#> doi = {10.21105/joss.03139},
#> }
There is a nice introduction into the package on youtube.
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.
<- lm(mpg ~ wt + cyl, data = mtcars)
model r2(model)
#> # R2 for Linear Regression
#> R2: 0.830
#> adj. R2: 0.819
<- glm(am ~ wt + cyl, data = mtcars, family = binomial)
model r2(model)
#> # R2 for Logistic Regression
#> Tjur's R2: 0.705
library(MASS)
data(housing)
<- polr(Sat ~ Infl + Type + Cont, weights = Freq, data = housing)
model r2(model)
#> Nagelkerke's R2: 0.108
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 (Johnson 2014; Nakagawa, Johnson, and Schielzeth
2017).
set.seed(123)
library(rstanarm)
<- stan_glmer(
model ~ Petal.Width + (1 | Species),
Petal.Length data = iris,
cores = 4
)
r2(model)
#> # Bayesian R2 with Compatibility Interval
#>
#> Conditional R2: 0.954 (95% CI [0.951, 0.957])
#> Marginal R2: 0.414 (95% CI [0.204, 0.644])
library(lme4)
<- lmer(Reaction ~ Days + (1 + Days | Subject), data = sleepstudy)
model r2(model)
#> # R2 for Mixed Models
#>
#> Conditional R2: 0.799
#> Marginal R2: 0.279
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).
icc()
calculates the ICC for various mixed model
objects, including stanreg
models.
library(lme4)
<- lmer(Reaction ~ Days + (1 + Days | Subject), data = sleepstudy)
model icc(model)
#> # Intraclass Correlation Coefficient
#>
#> Adjusted ICC: 0.722
#> Unadjusted ICC: 0.521
…and models of class brmsfit
.
library(brms)
set.seed(123)
<- brm(mpg ~ wt + (1 | cyl) + (1 + wt | gear), data = mtcars) model
icc(model)
#> # Intraclass Correlation Coefficient
#>
#> Adjusted ICC: 0.941
#> Unadjusted ICC: 0.779
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)
<- glm(count ~ spp + mined, family = poisson, data = Salamanders)
model check_overdispersion(model)
#> # Overdispersion test
#>
#> dispersion ratio = 2.946
#> Pearson's Chi-Squared = 1873.710
#> p-value = < 0.001
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)).
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.
<- glm(count ~ spp + mined, family = poisson, data = Salamanders)
model check_zeroinflation(model)
#> # Check for zero-inflation
#>
#> Observed zeros: 387
#> Predicted zeros: 298
#> Ratio: 0.77
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(123)
$mygrp <- sample(1:5, size = 180, replace = TRUE)
sleepstudy$mysubgrp <- NA
sleepstudyfor (i in 1:5) {
<- sleepstudy$mygrp == i
filter_group $mysubgrp[filter_group] <-
sleepstudysample(1:30, size = sum(filter_group), replace = TRUE)
}
# fit strange model
<- lmer(
model ~ Days + (1 | mygrp / mysubgrp) + (1 | Subject),
Reaction data = sleepstudy
)
check_singularity(model)
#> [1] TRUE
Remedies to cure issues with singular fits can be found here.
Linear models assume constant error variance (homoskedasticity).
The check_heteroscedasticity()
functions assess if this
assumption has been violated:
data(cars)
<- lm(dist ~ speed, data = cars)
model
check_heteroscedasticity(model)
#> Warning: Heteroscedasticity (non-constant error variance) detected (p = 0.031).
performance provides many functions to check model
assumptions, like check_collinearity()
,
check_normality()
or
check_heteroscedasticity()
. To get a comprehensive check,
use check_model()
.
# defining a model
<- lm(mpg ~ wt + am + gear + vs * cyl, data = mtcars)
model
# checking model assumptions
check_model(model)
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.
<- lm(mpg ~ wt + cyl, data = mtcars)
m1 model_performance(m1)
#> # Indices of model performance
#>
#> AIC | AICc | BIC | R2 | R2 (adj.) | RMSE | Sigma
#> ---------------------------------------------------------------
#> 156.010 | 157.492 | 161.873 | 0.830 | 0.819 | 2.444 | 2.568
<- glm(vs ~ wt + mpg, data = mtcars, family = "binomial")
m2 model_performance(m2)
#> # Indices of model performance
#>
#> AIC | AICc | BIC | Tjur's R2 | RMSE | Sigma | Log_loss | Score_log | Score_spherical | PCP
#> -----------------------------------------------------------------------------------------------------
#> 31.298 | 32.155 | 35.695 | 0.478 | 0.359 | 1.000 | 0.395 | -14.903 | 0.095 | 0.743
library(lme4)
<- lmer(Reaction ~ Days + (1 + Days | Subject), data = sleepstudy)
m3 model_performance(m3)
#> # Indices of model performance
#>
#> AIC | AICc | BIC | R2 (cond.) | R2 (marg.) | ICC | RMSE | Sigma
#> ----------------------------------------------------------------------------------
#> 1755.628 | 1756.114 | 1774.786 | 0.799 | 0.279 | 0.722 | 23.438 | 25.592
The compare_performance()
function can be used to
compare the performance and quality of several models (including models
of different types).
<- c(18, 17, 15, 20, 10, 20, 25, 13, 12)
counts <- gl(3, 1, 9)
outcome <- gl(3, 3)
treatment <- glm(counts ~ outcome + treatment, family = poisson())
m4
compare_performance(m1, m2, m3, m4, verbose = FALSE)
#> # Comparison of Model Performance Indices
#>
#> Name | Model | AIC (weights) | AICc (weights) | BIC (weights) | RMSE | Sigma | Score_log | Score_spherical | R2 | R2 (adj.) | Tjur's R2 | Log_loss | PCP | R2 (cond.) | R2 (marg.) | ICC | Nagelkerke's R2
#> ------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------
#> m1 | lm | 156.0 (<.001) | 157.5 (<.001) | 161.9 (<.001) | 2.444 | 2.568 | | | 0.830 | 0.819 | | | | | | |
#> m2 | glm | 31.3 (>.999) | 32.2 (>.999) | 35.7 (>.999) | 0.359 | 1.000 | -14.903 | 0.095 | | | 0.478 | 0.395 | 0.743 | | | |
#> m3 | lmerMod | 1764.0 (<.001) | 1764.5 (<.001) | 1783.1 (<.001) | 23.438 | 25.592 | | | | | | | | 0.799 | 0.279 | 0.722 |
#> m4 | glm | 56.8 (<.001) | 76.8 (<.001) | 57.7 (<.001) | 3.043 | 1.000 | -2.598 | 0.324 | | | | | | | | | 0.657
One can also easily compute and a composite index of model performance and sort the models from the best one to the worse.
compare_performance(m1, m2, m3, m4, rank = TRUE, verbose = FALSE)
#> # Comparison of Model Performance Indices
#>
#> Name | Model | RMSE | Sigma | AIC weights | AICc weights | BIC weights | Performance-Score
#> -----------------------------------------------------------------------------------------------
#> m2 | glm | 0.359 | 1.000 | 1.000 | 1.000 | 1.000 | 100.00%
#> m4 | glm | 3.043 | 1.000 | 2.96e-06 | 2.06e-10 | 1.63e-05 | 37.67%
#> m1 | lm | 2.444 | 2.568 | 8.30e-28 | 6.07e-28 | 3.99e-28 | 36.92%
#> m3 | lmerMod | 23.438 | 25.592 | 0.00e+00 | 0.00e+00 | 0.00e+00 | 0.00%
Finally, we provide convenient visualisation (the see
package must be installed).
plot(compare_performance(m1, m2, m4, rank = TRUE, verbose = FALSE))
test_performance()
(and test_bf
, its
Bayesian sister) carries out the most relevant and appropriate tests
based on the input (for instance, whether the models are nested or
not).
set.seed(123)
data(iris)
<- lm(Sepal.Length ~ Species, data = iris)
lm1 <- lm(Sepal.Length ~ Species + Petal.Length, data = iris)
lm2 <- lm(Sepal.Length ~ Species * Sepal.Width, data = iris)
lm3 <- lm(Sepal.Length ~ Species * Sepal.Width + Petal.Length + Petal.Width, data = iris)
lm4
test_performance(lm1, lm2, lm3, lm4)
#> Name | Model | BF | Omega2 | p (Omega2) | LR | p (LR)
#> ------------------------------------------------------------
#> lm1 | lm | | | | |
#> lm2 | lm | > 1000 | 0.69 | < .001 | -6.25 | < .001
#> lm3 | lm | > 1000 | 0.36 | < .001 | -3.44 | < .001
#> lm4 | lm | > 1000 | 0.73 | < .001 | -7.77 | < .001
#> Each model is compared to lm1.
test_bf(lm1, lm2, lm3, lm4)
#> Bayes Factors for Model Comparison
#>
#> Model BF
#> [lm2] Species + Petal.Length 3.45e+26
#> [lm3] Species * Sepal.Width 4.69e+07
#> [lm4] Species * Sepal.Width + Petal.Length + Petal.Width 7.58e+29
#>
#> * Against Denominator: [lm1] Species
#> * Bayes Factor Type: BIC approximation
Plotting functions are available through the see package.
Please note that the performance project is released with a Contributor Code of Conduct. By contributing to this project, you agree to abide by its terms.
We are happy to receive bug reports, suggestions, questions, and (most of all) contributions to fix problems and add features.
Please follow contributing guidelines mentioned here:
https://easystats.github.io/performance/CONTRIBUTING.html