Learn R Programming

cNORM

cNORM (W. Lenhard, Lenhard & Gary) is a package for the R environment for statistical computing that aims at generating continuous test norms in psychometrics and biometrics and to analyze the model fit. Originally, cNorm exclusively used an approach that makes no assumptions about the specific distribution of the raw data (A. Lenhard, Lenhard, Suggate & Segerer, 2016). Since version 3.2 (2024), however, the package also offers the option of parametric modeling using the beta-binomial distribution.

cNORM was developed specifically for achievement tests (e.g. vocabulary development: A. Lenhard, Lenhard, Segerer & Suggate, 2015; written language acquisition: W. Lenhard, Lenhard & Schneider, 2017). However, the package can be used wherever mental (e.g. reaction time), physical (e.g. body weight) or other test scores depend on continuous (e.g. age, duration of schooling) or discrete explanatory variables (e.g. sex, test form). In addition, the package can also be used for "conventional" norming based on individual groups, i.e. without including explanatory variables.

The package estimates percentiles as a function of the explanatory variable. This is done either parametrically on the basis of the beta-binomial distribution or distribution-free using Taylor polynomials. For an in-depth tutorial, visit the project homepage, try the online demonstration and have a look at the vignettes.

In a nutshell

A quick guide to distribution-free modeling with the essential cNORM functions:

## Basic example code for modeling the sample dataset
library(cNORM)

# Start the graphical user interface (needs shiny installed)
# The GUI includes the most important functions. For specific cases,
# please use cNORM on the console.
cNORM.GUI()

# Using the syntax on the console: The function 'cnorm' performs
# all steps automatically. Please specify the raw score and the
# grouping variable. The resulting object contains the ranked data
# via object$data and the model via object$model.
cnorm.elfe <- cnorm(raw = elfe$raw, group = elfe$group)

# ... and since we love pop music as much as Taylor polynomials, you
# can also use the taylorSwift function to swiftly compute a distribution-
# free Taylor polynomial model (which is however identical to cnorm). Here
# with the sample dataset 'ppvt':
model <- taylorSwift(ppvt$raw, ppvt$group)

# Plot different indicators of model fit depending on the number of
# predictors
plot(cnorm.elfe, "subset", type=0) # plot R2
plot(cnorm.elfe, "subset", type=3) # plot MSE

# NOTE! At this point, you usually select a good fitting model and rerun
# the process with a fixed number of terms, e. g. 4. Avoid models
# with a high number of terms:
cnorm.elfe <- cnorm(raw = elfe$raw, group = elfe$group, terms = 4)

# Powers of age can be specified via the parameter 't'.
# Cubic modeling is usually sufficient, i.e., t = 3.
# In contrast, 'k' specifies the power of the person location.
# This parameter should be somewhat higher, e.g., k = 5.
cnorm.elfe <- cnorm(raw = elfe$raw, group = elfe$group, k = 5, t = 3)

# Visual inspection of the percentile curves of the fitted model
plot(cnorm.elfe, "percentiles")

# Visual inspection of the observed and fitted raw and norm scores
plot(cnorm.elfe, "norm")
plot(cnorm.elfe, "raw")

# In order to compare different models, generate a series of percentile
# plots with an ascending number of predictors, in this example between
# 5 and 14 predictors.
plot(cnorm.elfe, "series", start=5, end=14)

# Cross validation of number of terms with 80% of the data for training
# and 20% for validation. Due to the time intensity, the maximum
# number of terms is restricted to 10 in this example
# with 3 repetitions.
cnorm.cv(cnorm.elfe$data, max=10, repetitions=3)

# Cross validation with prespecified terms of an already
# existing model
cnorm.cv(cnorm.elfe, repetitions=3)

# Print norm table (in this case: 0, 3 or 6 months at grade level 3)
normTable(c(3, 3.25, 3.5), cnorm.elfe)

# The other way round: Print raw table (grade level 3; 0 months) together
# with 90% confidence intervalls for a test with a reliability of .94
rawTable(3, cnorm.elfe, CI = .9, reliability = .94)

Modelling norm data using beta-binomial distributions:

library(cNORM)
# cNORM can as well model norm data using the beta-binomial
# distribution, which usually performs well on tests with
# a fixed number of dichotomous items.
model.betabinomial <- cnorm.betabinomial(ppvt$age, ppvt$raw)

# Adapt the power parameters for α and β to increase or decrease
# the fit:
model.betabinomial <- cnorm.betabinomial(ppvt$age, ppvt$raw, alpha = 4)

# Plot percentile curves and display manifest and modelled norm scores.
plot(model.betabinomial, ppvt$age, ppvt$raw)
plotNorm(model.betabinomial, ppvt$age, ppvt$raw, width = 1)

# Display fit statistics:
summary(model.betabinomial)

# Prediction of norm scores for new data and generating norm tables
predict(model.betabinomial, c(8.9, 10.1), c(153, 121))
tables <- normTable.betabinomial(model.betabinomial, c(2, 3, 4),
                                 reliability=0.9)

Conventional norming:

library(cNORM)

# cNORM can as well be used for conventional norming:
cnorm(raw=elfe$raw)

Start vignettes in cNORM:

library(cNORM)

vignette("cNORM-Demo", package = "cNORM")
vignette("WeightedRegression", package = "cNORM")
vignette("BetaBinomial", package = "cNORM")

Sample Data

The package includes data from two large test norming projects, namely ELFE 1-6 (Lenhard & Schneider, 2006) and German adaption of the PPVT4 (A. Lenhard, Lenhard, Suggate & Seegerer, 2015), which can be used to run the analysis. Furthermore, large samples from the Center of Disease Control (CDC) on growth curves in childhood and adolescence (for computing Body Mass Index 'BMI' curves), Type ?elfe, ?ppvt or ?CDC to display information on the data sets.

Terms of use, license and declaration of interest

cNORM is licensed under GNU Affero General Public License v3 (AGPL-3.0). This means that copyrighted parts of cNORM can be used free of charge for commercial and non-commercial purposes that run under this same license, retain the copyright notice, provide their source code and correctly cite cNORM. Copyright protection includes, for example, the reproduction and distribution of source code or parts of the source code of cNORM or of graphics created with cNORM. The integration of the package into a server environment in order to access the functionality of the software (e.g. for online delivery of norm scores) is also subject to this license. However, a regression function determined with cNORM, the norm tables ... are not subject to copyright protection and may be used freely without preconditions. If you want to apply cNORM in a way that is not compatible with the terms of the AGPL 3.0 license, please do not hesitate to contact us to negotiate individual conditions. If you want to use cNORM for scientific publications, we would also ask you to quote the source.

The authors would like to thank WPS (https://www.wpspublish.com/) for providing funding for developing, integrating and evaluating weighting and post stratification in the cNORM package. The research project was conducted in 2022.

References

  • Gary, S., Lenhard, W., Lenhard, A. et al. A tutorial on automatic post-stratification and weighting in conventional and regression-based norming of psychometric tests. Behav Res (2023a). https://doi.org/10.3758/s13428-023-02207-0
  • Gary, S., Lenhard, A., Lenhard, W., & Herzberg, D. S. (2023b). Reducing the bias of norm scores in non-representative samples: Weighting as an adjunct to continuous norming methods. Assessment, 10731911231153832. https://doi.org/10.1177/10731911231153832
  • Lenhard, A., Lenhard, W., Segerer, R. & Suggate, S. (2015). Peabody Picture Vocabulary Test - Revision IV (Deutsche Adaption). Frankfurt a. M./Germany: Pearson Assessment.
  • Lenhard, A., Lenhard, W., Suggate, S. & Segerer, R. (2016). A continuous solution to the norming problem. Assessment, Online first, 1-14. https://doi.org/10.1177/1073191116656437
  • Lenhard, A., Lenhard, W., Gary, S. (2018). Continuous Norming (cNORM). The Comprehensive R Network, Package cNORM, available: https://CRAN.R-project.org/package=cNORM
  • Lenhard, A., Lenhard, W., Gary, S. (2019). Continuous norming of psychometric tests: A simulation study of parametric and semi-parametric approaches. PLoS ONE, 14(9), e0222279. https://doi.org/10.1371/journal.pone.0222279
  • Lenhard, W., & Lenhard, A. (2020). Improvement of Norm Score Quality via Regression-Based Continuous Norming. Educational and Psychological Measurement(Online First), 1-33. https://doi.org/10.1177/0013164420928457

Copy Link

Version

Install

install.packages('cNORM')

Monthly Downloads

1,063

Version

3.3.1

License

AGPL-3

Issues

Pull Requests

Stars

Forks

Maintainer

Wolfgang Lenhard

Last Published

October 16th, 2024

Functions in cNORM (3.3.1)

derive

Derivative of regression model
diagnostics.betabinomial

Diagnostic Information for Beta-Binomial Model
normTable

Create a norm table based on model for specific age
modelSummary

Prints the results and regression function of a cnorm model
getNormCurve

Computes the curve for a specific T value
getNormScoreSE

Calculates the standard error (SE) or root mean square error (RMSE) of the norm scores In case of large datasets, both results should be almost identical
plotDensity

Plot the density function per group by raw score
plot.cnormBetaBinomial

Plot cnormBetaBinomial Model with Data and Percentile Lines
plot.cnormBetaBinomial2

Plot cnormBetaBinomial Model with Data and Percentile Lines
plotCnorm

General convenience plotting function
checkWeights

Check, if NA or values <= 0 occur and issue warning
getGroups

Determine groups and group means
plot.cnorm

S3 function for plotting cnorm objects
elfe

Sentence completion test from ELFE 1-6
normTable.betabinomial

Calculate Cumulative Probabilities, Density, Percentiles, and Z-Scores for Beta-Binomial Distribution
predict.cnormBetaBinomial2

Predict Norm Scores from Raw Scores
predictNorm

Retrieve norm value for raw score at a specific age
predict.cnormBetaBinomial

Predict Norm Scores from Raw Scores
predictRaw

Predict raw values
predictCoefficients

Predict mean and standard deviation for a beta binomial regression model
predictCoefficients2

Predict alpha and beta parameters for a beta-binomial regression model
print.cnorm

S3 method for printing model selection information
printSubset

Print Model Selection Information
plotSubset

Evaluate information criteria for regression model
ppvt

Vocabulary development from 2.5 to 17
plotNorm

Plot manifest and fitted norm scores
plotDerivative

Plot first order derivative of regression model
summary.cnorm

S3 method for printing the results and regression function of a cnorm model
summary.cnormBetaBinomial

Summarize a Beta-Binomial Continuous Norming Model
rankBySlidingWindow

Determine the norm scores of the participants by sliding window
taylorSwift

Swiftly compute Taylor regression models for distribution free continuous norming
summary.cnormBetaBinomial2

Summarize a Beta-Binomial Continuous Norming Model
rawTable

Create a table with norm scores assigned to raw scores for a specific age based on the regression model
log_likelihood2

Calculate the negative log-likelihood for a beta-binomial regression model
plotPercentileSeries

Generates a series of plots with number curves by percentile for different models
standardize

Standardize a numeric vector
prepareData

Prepare data for modeling in one step (convenience method)
regressionFunction

Regression function
log_likelihood

Calculate the negative log-likelihood for a beta binomial regression model
weighted.quantile

Weighted quantile estimator
rangeCheck

Check for horizontal and vertical extrapolation
plotNormCurves

Plot norm curves
prettyPrint

Format raw and norm tables The function takes a raw or norm table, condenses intervals at the bottom and top and round the numbers to meaningful interval.
standardizeRakingWeights

Function for standardizing raking weights Raking weights get divided by the smallest weight. Thereby, all weights become larger or equal to 1 without changing the ratio of the weights to each other.
weighted.quantile.harrell.davis

Weighted Harrell-Davis quantile estimator
weighted.quantile.type7

Weighted type7 quantile estimator
simMean

Simulate mean per age
plotPercentiles

Plot norm curves against actual percentiles
plotRaw

Plot manifest and fitted raw scores
simSD

Simulate sd per age
weighted.quantile.inflation

Weighted quantile estimator through case inflation
weighted.rank

Weighted rank estimation
rankByGroup

Determine the norm scores of the participants in each subsample
simulateRasch

Simulate raw test scores based on Rasch model
CDC

BMI growth curves from age 2 to 25
calcPolyInL

Internal function for retrieving regression function coefficients at specific age
cNORM.GUI

Launcher for the graphical user interface of cNORM
calcPolyInLBase

Internal function for retrieving regression function coefficients at specific age
cnorm

Continuous Norming
bestModel

Determine Regression Model
betaCoefficients

Compute Parameters of a Beta Binomial Distribution
buildCnormObject

Build cnorm object from data and bestModel model object
calcPolyInLBase2

Internal function for retrieving regression function coefficients at specific age (optimized)
buildFunction

Build regression function for bestModel
derivationTable

Create a table based on first order derivative of the regression model for specific age
computeWeights

Weighting of cases through iterative proportional fitting (Raking)
checkConsistency

Check the consistency of the norm data model
computePowers

Compute powers of the explanatory variable a as well as of the person location l (data preparation)
cnorm.betabinomial

Fit a beta-binomial regression model for continuous norming
check_monotonicity

Check Monotonicity of Predicted Values
cnorm.betabinomial1

Fit a beta binomial regression model
cnorm.betabinomial2

Fit a beta-binomial regression model for continuous norming
cnorm.cv

Cross-validation for Term Selection in cNORM