apa7

CRAN status Lifecycle: experimental ggdiagram status badge

The goal of apa7 is to facilitate writing documents in APA Style (7th Edition).

Installation

You can install the development version of apa7 with:

 install.packages("apa7", repos = c('https://wjschne.r-universe.dev'))

Tables

The package provides functions to create APA-style tables, including correlation matrices and regression tables. The tables can be formatted using the flextable package.

 library(apa7)
 # Correlation matrix 
 apa_cor(trees, star_significant = TRUE)

A correlation matrix in APA style.

 # Make regression model, format parameters, and display flextable
 lm(Volume ~ Girth + Height, data = trees) |> 
 apa_parameters() |> 
 apa_flextable()

A regression table in APA style.

 # Contingency table with chi-square test of independence
d <- mtcars[, c("am", "gear")]
 colnames(d) <- c("Transmission", "Gears")
d$Transmission <- factor(d$Transmission, 
 levels = c(0, 1), 
 labels = c("Automatic", "Manual"))
 apa_chisq(d)

A contigency table with a chi-square test of independence e in APA style.

Formatting functions

The package provides functions to format p-values, numbers, and other statistical results according to APA Style.

 # Format p-values
 apa_p(c(0.0007, 0.001, 0.0081, 0.024, 0.454))
 #> [1] "<.001" ".001" ".008" ".02" ".45"

AltStyle によって変換されたページ (->オリジナル) /