From 83b3a4c1df38cfbac7480c393d43f3f66d208747 Mon Sep 17 00:00:00 2001 From: "Mattan S. Ben-Shachar" Date: Sat, 8 Jan 2022 15:32:37 +0200 Subject: [PATCH 01/15] weird bug fix for CRAN tests --- R/standardize_info.R | 4 +++- 1 file changed, 3 insertions(+), 1 deletion(-) diff --git a/R/standardize_info.R b/R/standardize_info.R index 364878b28..091f3e977 100644 --- a/R/standardize_info.R +++ b/R/standardize_info.R @@ -282,11 +282,13 @@ standardize_info.default <- function(model, robust = FALSE, two_sd = FALSE, incl means <- deviations <- rep(NA_real_, length = length(names(model_matrix))) for (i in seq_along(names(model_matrix))) { var <- names(model_matrix)[i] - if (types$Link[types$Parameter == var] == "Difference") { + if (any(types$Parameter == var) && + types$Link[types$Parameter == var] == "Difference") { parent_var <- types$Variable[types$Parameter == var] intercept <- unique(data[[parent_var]])[1] response_at_intercept <- response[data[[parent_var]] == intercept] weights_at_intercept <- if (length(w)) w[data[[parent_var]] == intercept] else NULL + std_info <- .compute_std_info( response = response_at_intercept, robust = robust, weights = weights_at_intercept From 5b33e05befedd7f634e4ea73d0d38aef4f8ab4a8 Mon Sep 17 00:00:00 2001 From: "Mattan S. Ben-Shachar" Date: Sat, 8 Jan 2022 15:32:48 +0200 Subject: [PATCH 02/15] version bump --- DESCRIPTION | 2 +- NEWS.md | 8 +++++++- 2 files changed, 8 insertions(+), 2 deletions(-) diff --git a/DESCRIPTION b/DESCRIPTION index ffa468e67..b09db46ae 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,7 +1,7 @@ Type: Package Package: effectsize Title: Indices of Effect Size and Standardized Parameters -Version: 0.5.0.2 +Version: 0.5.1 Authors@R: c(person(given = "Mattan S.", family = "Ben-Shachar", diff --git a/NEWS.md b/NEWS.md index 6b3b05b7d..27d160eed 100644 --- a/NEWS.md +++ b/NEWS.md @@ -1,4 +1,4 @@ -# effectsize 0.5.0.9 +# effectsize 0.5.1 ## Breaking Changes @@ -6,6 +6,12 @@ ## New features +### New API + +See [*Support functions for model extensions* vignette](https://easystats.github.io/effectsize/articles/effectsize_API.html). + +### Other features + - `eta_squared()` family now supports `afex::mixed()` models. - `cles()` for estimating common language effect sizes. - `rb_to_cles()` for converting rank-biserial correlation to Probability of superiority. From 69f74fce642d36d5fc217e7c75c77aafd3fd5b58 Mon Sep 17 00:00:00 2001 From: "Mattan S. Ben-Shachar" Date: Sat, 8 Jan 2022 15:35:13 +0200 Subject: [PATCH 03/15] use CRAN parameters --- DESCRIPTION | 4 +--- 1 file changed, 1 insertion(+), 3 deletions(-) diff --git a/DESCRIPTION b/DESCRIPTION index b09db46ae..70586d838 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -58,7 +58,7 @@ Depends: Imports: bayestestR (>= 0.10.5), insight (>= 0.14.3), - parameters (>= 0.15.0.1), + parameters (>= 0.15.0), performance (>= 0.8.0), datawizard (>= 0.2.2), stats, @@ -90,8 +90,6 @@ Suggests: spelling, testthat, tidymodels -Remotes: - easystats/parameters VignetteBuilder: knitr Encoding: UTF-8 From e8887cdfe3d35ff38983baab87d0dfe7758e658c Mon Sep 17 00:00:00 2001 From: "Mattan S. Ben-Shachar" Date: Sat, 8 Jan 2022 15:41:09 +0200 Subject: [PATCH 04/15] Revert "use CRAN parameters" This reverts commit 69f74fce642d36d5fc217e7c75c77aafd3fd5b58. --- DESCRIPTION | 4 +++- 1 file changed, 3 insertions(+), 1 deletion(-) diff --git a/DESCRIPTION b/DESCRIPTION index 70586d838..b09db46ae 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -58,7 +58,7 @@ Depends: Imports: bayestestR (>= 0.10.5), insight (>= 0.14.3), - parameters (>= 0.15.0), + parameters (>= 0.15.0.1), performance (>= 0.8.0), datawizard (>= 0.2.2), stats, @@ -90,6 +90,8 @@ Suggests: spelling, testthat, tidymodels +Remotes: + easystats/parameters VignetteBuilder: knitr Encoding: UTF-8 From 1ecec579bb7939ef96ffdb5ac72be1fdf38ebc73 Mon Sep 17 00:00:00 2001 From: "Mattan S. Ben-Shachar" Date: Mon, 10 Jan 2022 09:57:22 +0200 Subject: [PATCH 05/15] Update DESCRIPTION --- DESCRIPTION | 6 +++--- 1 file changed, 3 insertions(+), 3 deletions(-) diff --git a/DESCRIPTION b/DESCRIPTION index b09db46ae..120a527e0 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -56,9 +56,9 @@ BugReports: https://github.com/easystats/effectsize/issues/ Depends: R (>= 3.4) Imports: - bayestestR (>= 0.10.5), - insight (>= 0.14.3), - parameters (>= 0.15.0.1), + bayestestR (>= 0.11.5), + insight (>= 0.15.0), + parameters (>= 0.15.0.3), performance (>= 0.8.0), datawizard (>= 0.2.2), stats, From ce2fa472362897d151e69c1aaa831090058d1dd7 Mon Sep 17 00:00:00 2001 From: "Mattan S. Ben-Shachar" Date: Wed, 12 Jan 2022 21:11:28 +0200 Subject: [PATCH 06/15] use parameters from CRAN --- DESCRIPTION | 4 +--- 1 file changed, 1 insertion(+), 3 deletions(-) diff --git a/DESCRIPTION b/DESCRIPTION index 120a527e0..493cb2a8c 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -58,7 +58,7 @@ Depends: Imports: bayestestR (>= 0.11.5), insight (>= 0.15.0), - parameters (>= 0.15.0.3), + parameters (>= 0.16.0), performance (>= 0.8.0), datawizard (>= 0.2.2), stats, @@ -90,8 +90,6 @@ Suggests: spelling, testthat, tidymodels -Remotes: - easystats/parameters VignetteBuilder: knitr Encoding: UTF-8 From 4a7be50b8a33d9b6013a00916f457749405d8886 Mon Sep 17 00:00:00 2001 From: "Mattan S. Ben-Shachar" Date: Wed, 12 Jan 2022 21:11:37 +0200 Subject: [PATCH 07/15] Update DESCRIPTION --- DESCRIPTION | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/DESCRIPTION b/DESCRIPTION index 493cb2a8c..57c39ed23 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,7 +1,7 @@ Type: Package Package: effectsize Title: Indices of Effect Size and Standardized Parameters -Version: 0.5.1 +Version: 0.5.2 Authors@R: c(person(given = "Mattan S.", family = "Ben-Shachar", From 51240a925a67f1be035e55bd99c80ac1744fa380 Mon Sep 17 00:00:00 2001 From: "Mattan S. Ben-Shachar" Date: Wed, 12 Jan 2022 21:11:51 +0200 Subject: [PATCH 08/15] Update NEWS.md --- NEWS.md | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/NEWS.md b/NEWS.md index 27d160eed..455db78b6 100644 --- a/NEWS.md +++ b/NEWS.md @@ -1,4 +1,4 @@ -# effectsize 0.5.1 +# effectsize 0.5.2 ## Breaking Changes From 7da8635a854039ade05852a4d93571dbd8375e75 Mon Sep 17 00:00:00 2001 From: "Mattan S. Ben-Shachar" Date: Wed, 12 Jan 2022 21:12:17 +0200 Subject: [PATCH 09/15] v0.6 --- DESCRIPTION | 2 +- NEWS.md | 2 +- 2 files changed, 2 insertions(+), 2 deletions(-) diff --git a/DESCRIPTION b/DESCRIPTION index 57c39ed23..87d9c4e1e 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,7 +1,7 @@ Type: Package Package: effectsize Title: Indices of Effect Size and Standardized Parameters -Version: 0.5.2 +Version: 0.6.0 Authors@R: c(person(given = "Mattan S.", family = "Ben-Shachar", diff --git a/NEWS.md b/NEWS.md index 455db78b6..0a57c2d80 100644 --- a/NEWS.md +++ b/NEWS.md @@ -1,4 +1,4 @@ -# effectsize 0.5.2 +# effectsize 0.6.0 ## Breaking Changes From cae42f4e38ab19ed764881c002c25a2d9740f147 Mon Sep 17 00:00:00 2001 From: "Mattan S. Ben-Shachar" Date: Thu, 13 Jan 2022 08:55:12 +0200 Subject: [PATCH 10/15] Update cran-comments.md --- cran-comments.md | 24 +++++++++++++----------- 1 file changed, 13 insertions(+), 11 deletions(-) diff --git a/cran-comments.md b/cran-comments.md index 5c6417fcd..c78bf8fc6 100644 --- a/cran-comments.md +++ b/cran-comments.md @@ -1,25 +1,27 @@ ## Test environments -* local R installation: R 4.1.0 -* GitHub Actions (windows): devel, release, oldrel -* Github Actions (macOS): devel, release, oldrel -* GitHub Actions (ubuntu-16.04): devel, release, oldrel, 3.6, 3.5, 3.4 -* win-builder: release +* local installation: R 4.1.1 on Windows +* GitHub Actions + - Windows: devel, release, oldrel + - macOS: devel, release, oldrel + - ubuntu-16.04: devel, release, oldrel, 3.6, 3.5, 3.4 +* win-builder: release ## R CMD check results 0 errors | 0 warnings | 0 notes -### Known issues -- Failed handshake with shinyapps.io is a false positive. +### Known issues +- Failed handshake with *shinyapps.io* is a false positive. -## `revdepcheck` results +## revdepcheck results -We checked 15 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package. +We checked 16 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package. - * We saw 0 new problems - * We failed to check 0 packages \ No newline at end of file + * We saw 1 new problems + * `report`: Error is expected. Authors have been updated and will submit updated package. + * We failed to check 0 packages From c6f9c44b407a4a2dce61d742309df113adfee7f0 Mon Sep 17 00:00:00 2001 From: "Mattan S. Ben-Shachar" Date: Thu, 13 Jan 2022 20:28:01 +0200 Subject: [PATCH 11/15] fix urls --- LICENSE | 2 +- NEWS.md | 4 +- R/cohens_d.R | 2 +- R/convert_stat_to_anova.R | 2 +- R/convert_stat_to_r.R | 2 +- R/docs_extra.R | 2 +- R/equivalence_test.R | 6 +-- R/eta_squared.R | 2 +- R/interpret_omega_squared.R | 2 +- R/interpret_rope.R | 2 +- R/rank_effectsizes.R | 4 +- README.Rmd | 51 ++++++++++++------------ README.md | 10 ++--- _pkgdown.yml | 6 +-- inst/CITATION | 2 +- man/F_to_eta2.Rd | 2 +- man/cohens_d.Rd | 2 +- man/effectsize_API.Rd | 2 +- man/equivalence_test.effectsize_table.Rd | 6 +-- man/interpret_omega_squared.Rd | 2 +- man/interpret_rope.Rd | 2 +- man/t_to_r.Rd | 2 +- paper/paper.bib | 10 ++--- paper/paper.md | 12 +++--- vignettes/anovaES.Rmd | 6 +-- vignettes/bayesian_models.Rmd | 4 +- vignettes/bibliography.bib | 10 ++--- vignettes/effectsize.Rmd | 12 +++--- vignettes/interpret.Rmd | 2 +- vignettes/simple_htests.Rmd | 2 +- vignettes/standardize_parameters.Rmd | 8 ++-- 31 files changed, 92 insertions(+), 91 deletions(-) diff --git a/LICENSE b/LICENSE index f288702d2..f0fb72c6f 100644 --- a/LICENSE +++ b/LICENSE @@ -671,4 +671,4 @@ into proprietary programs. If your program is a subroutine library, you may consider it more useful to permit linking proprietary applications with the library. If this is what you want to do, use the GNU Lesser General Public License instead of this License. But first, please read -. +. diff --git a/NEWS.md b/NEWS.md index 0a57c2d80..ec249c088 100644 --- a/NEWS.md +++ b/NEWS.md @@ -8,7 +8,7 @@ ### New API -See [*Support functions for model extensions* vignette](https://easystats.github.io/effectsize/articles/effectsize_API.html). +See [*Support functions for model extensions* vignette](https://easystats.github.io/effectsize/articles/effectsize_API.html/). ### Other features @@ -45,7 +45,7 @@ See [*Support functions for model extensions* vignette](https://easystats.github - `oddsratio_to_riskratio()` can now convert OR coefficients to RR coefficients from a logistic GLM(M). - All effect-size functions gain an `alternative` argument which can be used to make one- or two-sided CIs. - `interpret()` now accepts as input the results from `cohens_d()`, `eta_squared()`, `rank_biserial()`, etc. -- `interpret_pd()` for the interpretation of the [*Probability of Direction*](https://easystats.github.io/bayestestR/reference/p_direction.html). +- `interpret_pd()` for the interpretation of the [*Probability of Direction*](https://easystats.github.io/bayestestR/reference/p_direction.html/). ## Bug fixes diff --git a/R/cohens_d.R b/R/cohens_d.R index bcdbd7feb..58b29c6de 100644 --- a/R/cohens_d.R +++ b/R/cohens_d.R @@ -117,7 +117,7 @@ #' #' - Delacre, M., Lakens, D., Ley, C., Liu, L., & Leys, C. (2021, May 7). Why #' Hedges’ g*s based on the non-pooled standard deviation should be reported -#' with Welch's t-test. https://doi.org/10.31234/osf.io/tu6mp +#' with Welch's t-test. https://doi.org/10.31234/osf.io/tu6mp/ #' #' - Hedges, L. V. & Olkin, I. (1985). Statistical methods for #' meta-analysis. Orlando, FL: Academic Press. diff --git a/R/convert_stat_to_anova.R b/R/convert_stat_to_anova.R index bf71926d7..13e39722a 100644 --- a/R/convert_stat_to_anova.R +++ b/R/convert_stat_to_anova.R @@ -10,7 +10,7 @@ #' from `lm` and `aov` models, these functions give exact results. For all other #' cases, they return close approximations. #' \cr -#' See [Effect Size from Test Statistics vignette.](https://easystats.github.io/effectsize/articles/from_test_statistics.html) +#' See [Effect Size from Test Statistics vignette.](https://easystats.github.io/effectsize/articles/from_test_statistics.html/) #' #' @param t,f The t or the F statistics. #' @param df,df_error Degrees of freedom of numerator or of the error estimate diff --git a/R/convert_stat_to_r.R b/R/convert_stat_to_r.R index 7452d7daf..bea902bec 100644 --- a/R/convert_stat_to_r.R +++ b/R/convert_stat_to_r.R @@ -9,7 +9,7 @@ #' computation is not straightforward (e.g., in liner mixed models, contrasts, #' etc.). #' \cr -#' See [Effect Size from Test Statistics vignette.](https://easystats.github.io/effectsize/articles/from_test_statistics.html) +#' See [Effect Size from Test Statistics vignette.](https://easystats.github.io/effectsize/articles/from_test_statistics.html/) #' #' @param t,f,z The t, the F or the z statistics. #' @param df,df_error Degrees of freedom of numerator or of the error estimate diff --git a/R/docs_extra.R b/R/docs_extra.R index bc392b9f4..dc978594d 100644 --- a/R/docs_extra.R +++ b/R/docs_extra.R @@ -145,7 +145,7 @@ NULL #' `effectsize` API #' -#' Read the [*Support functions for model extensions*](https://easystats.github.io/effectsize/articles/effectsize_API.html) vignette. +#' Read the [*Support functions for model extensions*](https://easystats.github.io/effectsize/articles/effectsize_API.html/) vignette. #' #' @rdname effectsize_API #' @name effectsize_API diff --git a/R/equivalence_test.R b/R/equivalence_test.R index 813e888fc..5f34f4ac2 100644 --- a/R/equivalence_test.R +++ b/R/equivalence_test.R @@ -45,18 +45,18 @@ bayestestR::equivalence_test #' @references #' - Campbell, H., & Gustafson, P. (2018). Conditional equivalence testing: An #' alternative remedy for publication bias. PLOS ONE, 13(4), e0195145. -#' https://doi.org/10.1371/journal.pone.0195145 +#' https://doi.org/10.1371/journal.pone.0195145/ #' #' - Kruschke, J. K. (2014). Doing Bayesian data analysis: A tutorial with R, #' JAGS, and Stan. Academic Press #' #' - Kruschke, J. K. (2018). Rejecting or accepting parameter values in Bayesian #' estimation. Advances in Methods and Practices in Psychological Science, 1(2), -#' 270-280. doi: 10.1177/2515245918771304 +#' 270-280. doi: 10.1177/2515245918771304/ #' #' - Lakens, D. (2017). Equivalence Tests: A Practical Primer for t Tests, #' Correlations, and Meta-Analyses. Social Psychological and Personality -#' Science, 8(4), 355–362. https://doi.org/10.1177/1948550617697177 +#' Science, 8(4), 355–362. https://doi.org/10.1177/1948550617697177/ #' #' @examples #' \donttest{ diff --git a/R/eta_squared.R b/R/eta_squared.R index ced9d94e8..a2c78ff12 100644 --- a/R/eta_squared.R +++ b/R/eta_squared.R @@ -584,7 +584,7 @@ cohens_f_squared <- function(model, partial = TRUE, ci = 0.95, alternative = "gr Sum_Squares_Subjects <- SSS_values$Sum_Squares_residuals Mean_Squares_Subjects <- SSS_values$Mean_Square_residuals - # implemented from https://www.jasonfinley.com/tools/OmegaSquaredQuickRef_JRF_3-31-13.pdf + # implemented from https://www.jasonfinley.com/tools/OmegaSquaredQuickRef_JRF_3-31-13.pdf/ if (!isTRUE(partial)) { aov_table$Omega2 <- (aov_table$Sum_Squares - aov_table$df * Mean_Square_residuals) / diff --git a/R/interpret_omega_squared.R b/R/interpret_omega_squared.R index c4ee711ef..1e5c84cf9 100644 --- a/R/interpret_omega_squared.R +++ b/R/interpret_omega_squared.R @@ -21,7 +21,7 @@ #' @examples #' interpret_eta_squared(.02) #' interpret_eta_squared(c(.5, .02), rules = "cohen1992") -#' @seealso http://imaging.mrc-cbu.cam.ac.uk/statswiki/FAQ/effectSize +#' @seealso https://imaging.mrc-cbu.cam.ac.uk/statswiki/FAQ/effectSize/ #' #' #' @references diff --git a/R/interpret_rope.R b/R/interpret_rope.R index f12b5480d..34dad1f47 100644 --- a/R/interpret_rope.R +++ b/R/interpret_rope.R @@ -25,7 +25,7 @@ #' interpret_rope(0, ci = 0.9) #' interpret_rope(c(0.005, 0.99), ci = 1) #' @references -#' [BayestestR's reporting guidelines](https://easystats.github.io/bayestestR/articles/guidelines.html) +#' [BayestestR's reporting guidelines](https://easystats.github.io/bayestestR/articles/guidelines.html/) #' #' @export interpret_rope <- function(rope, ci = 0.9, rules = "default") { diff --git a/R/rank_effectsizes.R b/R/rank_effectsizes.R index 5a89e2292..77964c505 100644 --- a/R/rank_effectsizes.R +++ b/R/rank_effectsizes.R @@ -235,7 +235,7 @@ rank_biserial <- function(x, nd <- sum((x - mu) != 0) maxw <- (nd^2 + nd) / 2 - # From: https://en.wikipedia.org/wiki/Wilcoxon_signed-rank_test#Historical_T_statistic + # From: https://en.wikipedia.org/wiki/Wilcoxon_signed-rank_test#Historical_T_statistic/ # wSE <- sqrt((n * (n + 1) * (2 * n + 1)) / 24) # Delta method for f(x) = w * 2 / (maxw) - 1 # r_rbsSE <- wSE * sqrt(4 / (maxw)^2) @@ -248,7 +248,7 @@ rank_biserial <- function(x, n1 <- length(x) n2 <- length(y) - # From: https://en.wikipedia.org/wiki/Mann%E2%80%93Whitney_U_test#Normal_approximation_and_tie_correction + # From: https://en.wikipedia.org/wiki/Mann%E2%80%93Whitney_U_test#Normal_approximation_and_tie_correction/ # wSE <- sqrt((n1 * n2 * (n1 + n2 + 1)) / 12) # Delta method for f(x) = 1 - 2 * w / (n1 * n2) * sign(diff) # r_rbsSE <- wSE * sqrt(4 / (n1 * n2)^2) diff --git a/README.Rmd b/README.Rmd index 50f845b6d..831dd82ad 100644 --- a/README.Rmd +++ b/README.Rmd @@ -30,9 +30,10 @@ knitr::opts_chunk$set( set.seed(111) ``` -[![DOI](https://joss.theoj.org/papers/10.21105/joss.02815/status.svg)](https://doi.org/10.21105/joss.02815) -[![downloads](http://cranlogs.r-pkg.org/badges/effectsize)](https://cran.r-project.org/package=effectsize) -[![total](https://cranlogs.r-pkg.org/badges/grand-total/effectsize)](https://cran.r-project.org/package=effectsize) [![status](https://tinyverse.netlify.com/badge/effectsize)](https://CRAN.R-project.org/package=effectsize) +[![DOI](https://joss.theoj.org/papers/10.21105/joss.02815/status.svg/)](https://doi.org/10.21105/joss.02815/) +[![downloads](https://cranlogs.r-pkg.org/badges/effectsize/)](https://cran.r-project.org/package=effectsize/) +[![total](https://cranlogs.r-pkg.org/badges/grand-total/effectsize/)](https://cran.r-project.org/package=effectsize/) +[![status](https://tinyverse.netlify.com/badge/effectsize/)](https://CRAN.R-project.org/package=effectsize/) ***Significant is just not enough!*** @@ -42,11 +43,11 @@ The goal of this package is to provide utilities to work with indices of effect ## Installation -[![CRAN](http://www.r-pkg.org/badges/version/effectsize)](https://cran.r-project.org/package=effectsize) -[![effectsize status badge](https://easystats.r-universe.dev/badges/effectsize)](https://easystats.r-universe.dev) -[![R-check](https://github.com/easystats/effectsize/workflows/R-check/badge.svg)](https://github.com/easystats/effectsize/actions) -[![pkgdown](https://github.com/easystats/effectsize/workflows/pkgdown/badge.svg)](https://github.com/easystats/effectsize/actions) -[![Codecov test coverage](https://codecov.io/gh/easystats/effectsize/branch/main/graph/badge.svg)](https://codecov.io/gh/easystats/effectsize?branch=main) +[![CRAN](https://www.r-pkg.org/badges/version/effectsize/)](https://cran.r-project.org/package=effectsize/) +[![effectsize status badge](https://easystats.r-universe.dev/badges/effectsize/)](https://easystats.r-universe.dev/) +[![R-check](https://github.com/easystats/effectsize/workflows/R-check/badge.svg/)](https://github.com/easystats/effectsize/actions/) +[![pkgdown](https://github.com/easystats/effectsize/workflows/pkgdown/badge.svg/)](https://github.com/easystats/effectsize/actions/) +[![Codecov test coverage](https://codecov.io/gh/easystats/effectsize/branch/main/graph/badge.svg/)](https://app.codecov.io/gh/easystats/effectsize?branch=main/) Run the following to install the stable release of **effectsize** from CRAN: @@ -54,10 +55,10 @@ Run the following to install the stable release of **effectsize** from CRAN: install.packages("effectsize") ``` -Or you can install the latest development version ``r available.packages(repos = "https://easystats.r-universe.dev")["effectsize","Version"]`` from [*R-universe*](https://easystats.r-universe.dev): +Or you can install the latest development version ``r available.packages(repos = "https://easystats.r-universe.dev/")["effectsize","Version"]`` from [*R-universe*](https://easystats.r-universe.dev): ```{r install-R-universe, warning=FALSE, message=FALSE, eval=FALSE} -install.packages("effectsize", repos = "https://easystats.r-universe.dev") +install.packages("effectsize", repos = "https://easystats.r-universe.dev/") ``` @@ -69,27 +70,27 @@ install.packages("effectsize", repos = "https://easystats.r-universe.dev") ## Documentation -[![Documentation](https://img.shields.io/badge/documentation-effectsize-orange.svg?colorB=E91E63)](https://easystats.github.io/effectsize/) -[![Blog](https://img.shields.io/badge/blog-easystats-orange.svg?colorB=FF9800)](https://easystats.github.io/blog/posts/) -[![Features](https://img.shields.io/badge/features-effectsize-orange.svg?colorB=2196F3)](https://easystats.github.io/effectsize/reference/index.html) +[![Documentation](https://img.shields.io/badge/documentation-effectsize-orange.svg?colorB=E91E63/)](https://easystats.github.io/effectsize/) +[![Blog](https://img.shields.io/badge/blog-easystats-orange.svg?colorB=FF9800/)](https://easystats.github.io/blog/posts/) +[![Features](https://img.shields.io/badge/features-effectsize-orange.svg?colorB=2196F3/)](https://easystats.github.io/effectsize/reference/index.html/) Click on the buttons above to access the package [**documentation**](https://easystats.github.io/effectsize/) and the [**easystats blog**](https://easystats.github.io/blog/posts/), and check-out these vignettes: - **Effect Sizes** - - [**Parameter and Model Standardization**](https://easystats.github.io/effectsize/articles/standardize_parameters.html) - - [**ANOVA Effect Sizes**](https://easystats.github.io/effectsize/articles/anovaES.html) - - [**Effect Sizes in Bayesian Models**](https://easystats.github.io/effectsize/articles/bayesian_models.html) - - [**For Simple Hypothesis Tests**](https://easystats.github.io/effectsize/articles/simple_htests.html) + - [**Parameter and Model Standardization**](https://easystats.github.io/effectsize/articles/standardize_parameters.html/) + - [**ANOVA Effect Sizes**](https://easystats.github.io/effectsize/articles/anovaES.html/) + - [**Effect Sizes in Bayesian Models**](https://easystats.github.io/effectsize/articles/bayesian_models.html/) + - [**For Simple Hypothesis Tests**](https://easystats.github.io/effectsize/articles/simple_htests.html/) - **Effect Sizes Conversion** - - [**Between Effect Sizes**](https://easystats.github.io/effectsize/articles/convert.html) - - [**Effect Size from Test Statistics**](https://easystats.github.io/effectsize/articles/from_test_statistics.html) -- [**Automated Interpretation of Indices of Effect Size**](https://easystats.github.io/effectsize/articles/interpret.html) + - [**Between Effect Sizes**](https://easystats.github.io/effectsize/articles/convert.html/) + - [**Effect Size from Test Statistics**](https://easystats.github.io/effectsize/articles/from_test_statistics.html/) +- [**Automated Interpretation of Indices of Effect Size**](https://easystats.github.io/effectsize/articles/interpret.html/) # Features -This package is focused on indices of effect size. Check out the package website for [**a full list of features and functions** provided by `effectsize`](https://easystats.github.io/effectsize/reference/index.html). +This package is focused on indices of effect size. Check out the package website for [**a full list of features and functions** provided by `effectsize`](https://easystats.github.io/effectsize/reference/index.html/). ```{r load, message=FALSE, warning=FALSE} library(effectsize) @@ -128,7 +129,7 @@ And more... ### Regression Models (Standardized Parameters) -Importantly, `effectsize` also provides [advanced methods](https://easystats.github.io/effectsize/articles/standardize_parameters.html) to compute standardized parameters for regression models. +Importantly, `effectsize` also provides [advanced methods](https://easystats.github.io/effectsize/articles/standardize_parameters.html/) to compute standardized parameters for regression models. ```{r beta, warning=FALSE, message=FALSE} m <- lm(rating ~ complaints + privileges + advance, data = attitude) @@ -170,7 +171,7 @@ The package allows for an automated interpretation of different indices. interpret_r(r = 0.3) ``` -Different sets of "rules of thumb" are implemented ([**guidelines are detailed here**](https://easystats.github.io/effectsize/articles/interpret.html)) and can be easily changed. +Different sets of "rules of thumb" are implemented ([**guidelines are detailed here**](https://easystats.github.io/effectsize/articles/interpret.html/)) and can be easily changed. ```{r interp-d, warning=FALSE, message=FALSE} @@ -199,10 +200,10 @@ Corresponding BibTeX entry: pages = {2815}, publisher = {The Open Journal}, doi = {10.21105/joss.02815}, - url = {https://doi.org/10.21105/joss.02815} + url = {https://doi.org/10.21105/joss.02815/} } ``` # Contributing and Support -If you have any questions regarding the the functionality of the package, you may either contact us via email or also [file an issue](https://github.com/easystats/effectsize/issues). Anyone wishing to contribute to the package by adding functions, features, or in another way, please follow [this guide](https://github.com/easystats/effectsize/blob/main/.github/CONTRIBUTING.md) and our [code of conduct](https://github.com/easystats/effectsize/blob/main/.github/CODE_OF_CONDUCT.md). +If you have any questions regarding the the functionality of the package, you may either contact us via email or also [file an issue](https://github.com/easystats/effectsize/issues/). Anyone wishing to contribute to the package by adding functions, features, or in another way, please follow [this guide](https://github.com/easystats/effectsize/blob/main/.github/CONTRIBUTING.md/) and our [code of conduct](https://github.com/easystats/effectsize/blob/main/.github/CODE_OF_CONDUCT.md/). diff --git a/README.md b/README.md index 53f38d7ef..a23675a96 100644 --- a/README.md +++ b/README.md @@ -1,10 +1,10 @@ # effectsize -[![DOI](https://joss.theoj.org/papers/10.21105/joss.02815/status.svg)](https://doi.org/10.21105/joss.02815) -[![downloads](http://cranlogs.r-pkg.org/badges/effectsize)](https://cran.r-project.org/package=effectsize) -[![total](https://cranlogs.r-pkg.org/badges/grand-total/effectsize)](https://cran.r-project.org/package=effectsize) -[![status](https://tinyverse.netlify.com/badge/effectsize)](https://CRAN.R-project.org/package=effectsize) +[![DOI](https://joss.theoj.org/papers/10.21105/joss.02815/status.svg/)](https://doi.org/10.21105/joss.02815/) +[![downloads](https://cranlogs.r-pkg.org/badges/effectsize/)](https://cran.r-project.org/package=effectsize/) +[![total](https://cranlogs.r-pkg.org/badges/grand-total/effectsize/)](https://cran.r-project.org/package=effectsize/) +[![status](https://tinyverse.netlify.com/badge/effectsize/)](https://CRAN.R-project.org/package=effectsize/) ***Significant is just not enough\!*** @@ -14,7 +14,7 @@ conversion of indices such as Cohen’s *d*, *r*, odds-ratios, etc. ## Installation -[![CRAN](http://www.r-pkg.org/badges/version/effectsize)](https://cran.r-project.org/package=effectsize) +[![CRAN](https://www.r-pkg.org/badges/version/effectsize)](https://cran.r-project.org/package=effectsize) [![effectsize status badge](https://easystats.r-universe.dev/badges/effectsize)](https://easystats.r-universe.dev) [![R-check](https://github.com/easystats/effectsize/workflows/R-check/badge.svg)](https://github.com/easystats/effectsize/actions) diff --git a/_pkgdown.yml b/_pkgdown.yml index b3a2cad32..d90223497 100644 --- a/_pkgdown.yml +++ b/_pkgdown.yml @@ -1,10 +1,10 @@ authors: Mattan S. Ben-Shachar: - href: https://github.com/mattansb + href: https://github.com/mattansb/ Dominique Makowski: href: https://dominiquemakowski.github.io/ Daniel Lüdecke: - href: https://github.com/strengejacke + href: https://github.com/strengejacke/ Indrajeet Patil: href: https://sites.google.com/site/indrajeetspatilmorality/ Brenton M. Wiernik: @@ -24,7 +24,7 @@ navbar: components: twitter: icon: fa-twitter - href: http://twitter.com/easystats4u + href: https://twitter.com/easystats4u aria-label: Twitter left: - icon: fa-home fa-lg diff --git a/inst/CITATION b/inst/CITATION index dfeac9c05..6a45af9e4 100644 --- a/inst/CITATION +++ b/inst/CITATION @@ -18,5 +18,5 @@ bibentry( pages = "2815", publisher = "The Open Journal", doi = "10.21105/joss.02815", - url = "https://doi.org/10.21105/joss.02815" + url = "https://doi.org/10.21105/joss.02815/" ) \ No newline at end of file diff --git a/man/F_to_eta2.Rd b/man/F_to_eta2.Rd index fd74c0805..5b39ed620 100644 --- a/man/F_to_eta2.Rd +++ b/man/F_to_eta2.Rd @@ -92,7 +92,7 @@ Squares are not easily available or their computation is not straightforward from \code{lm} and \code{aov} models, these functions give exact results. For all other cases, they return close approximations. \cr -See \href{https://easystats.github.io/effectsize/articles/from_test_statistics.html}{Effect Size from Test Statistics vignette.} +See \href{https://easystats.github.io/effectsize/articles/from_test_statistics.html/}{Effect Size from Test Statistics vignette.} } \details{ These functions use the following formulae: diff --git a/man/cohens_d.Rd b/man/cohens_d.Rd index 6ab2d95f4..998008a79 100644 --- a/man/cohens_d.Rd +++ b/man/cohens_d.Rd @@ -211,7 +211,7 @@ Statistical Methods, 5(1), 2. sciences (2nd Ed.). New York: Routledge. \item Delacre, M., Lakens, D., Ley, C., Liu, L., & Leys, C. (2021, May 7). Why Hedges’ g*s based on the non-pooled standard deviation should be reported -with Welch's t-test. https://doi.org/10.31234/osf.io/tu6mp +with Welch's t-test. https://doi.org/10.31234/osf.io/tu6mp/ \item Hedges, L. V. & Olkin, I. (1985). Statistical methods for meta-analysis. Orlando, FL: Academic Press. \item Hunter, J. E., & Schmidt, F. L. (2004). Methods of meta-analysis: diff --git a/man/effectsize_API.Rd b/man/effectsize_API.Rd index 7d0526f17..c731b7762 100644 --- a/man/effectsize_API.Rd +++ b/man/effectsize_API.Rd @@ -54,5 +54,5 @@ including the grouping variable (e.g., \code{"Subject"}).} } \description{ -Read the \href{https://easystats.github.io/effectsize/articles/effectsize_API.html}{\emph{Support functions for model extensions}} vignette. +Read the \href{https://easystats.github.io/effectsize/articles/effectsize_API.html/}{\emph{Support functions for model extensions}} vignette. } diff --git a/man/equivalence_test.effectsize_table.Rd b/man/equivalence_test.effectsize_table.Rd index f315a9816..67b918d60 100644 --- a/man/equivalence_test.effectsize_table.Rd +++ b/man/equivalence_test.effectsize_table.Rd @@ -88,15 +88,15 @@ if (require(see)) plot(equivalence_test(ds, range = 0.2, rule = "bayes")) \itemize{ \item Campbell, H., & Gustafson, P. (2018). Conditional equivalence testing: An alternative remedy for publication bias. PLOS ONE, 13(4), e0195145. -https://doi.org/10.1371/journal.pone.0195145 +https://doi.org/10.1371/journal.pone.0195145/ \item Kruschke, J. K. (2014). Doing Bayesian data analysis: A tutorial with R, JAGS, and Stan. Academic Press \item Kruschke, J. K. (2018). Rejecting or accepting parameter values in Bayesian estimation. Advances in Methods and Practices in Psychological Science, 1(2), -270-280. doi: 10.1177/2515245918771304 +270-280. doi: 10.1177/2515245918771304/ \item Lakens, D. (2017). Equivalence Tests: A Practical Primer for t Tests, Correlations, and Meta-Analyses. Social Psychological and Personality -Science, 8(4), 355–362. https://doi.org/10.1177/1948550617697177 +Science, 8(4), 355–362. https://doi.org/10.1177/1948550617697177/ } } \seealso{ diff --git a/man/interpret_omega_squared.Rd b/man/interpret_omega_squared.Rd index 09f2a7146..591d0ce56 100644 --- a/man/interpret_omega_squared.Rd +++ b/man/interpret_omega_squared.Rd @@ -55,5 +55,5 @@ Edition. Sage:London. } } \seealso{ -http://imaging.mrc-cbu.cam.ac.uk/statswiki/FAQ/effectSize +https://imaging.mrc-cbu.cam.ac.uk/statswiki/FAQ/effectSize/ } diff --git a/man/interpret_rope.Rd b/man/interpret_rope.Rd index 36a9b9e84..d76e8c1fc 100644 --- a/man/interpret_rope.Rd +++ b/man/interpret_rope.Rd @@ -44,5 +44,5 @@ interpret_rope(0, ci = 0.9) interpret_rope(c(0.005, 0.99), ci = 1) } \references{ -\href{https://easystats.github.io/bayestestR/articles/guidelines.html}{BayestestR's reporting guidelines} +\href{https://easystats.github.io/bayestestR/articles/guidelines.html/}{BayestestR's reporting guidelines} } diff --git a/man/t_to_r.Rd b/man/t_to_r.Rd index e114cdee9..f8cf4faf5 100644 --- a/man/t_to_r.Rd +++ b/man/t_to_r.Rd @@ -71,7 +71,7 @@ the data required to compute these are not easily available or their computation is not straightforward (e.g., in liner mixed models, contrasts, etc.). \cr -See \href{https://easystats.github.io/effectsize/articles/from_test_statistics.html}{Effect Size from Test Statistics vignette.} +See \href{https://easystats.github.io/effectsize/articles/from_test_statistics.html/}{Effect Size from Test Statistics vignette.} } \details{ These functions use the following formulae to approximate \emph{r} and \emph{d}: diff --git a/paper/paper.bib b/paper/paper.bib index 801faea46..034a7631b 100644 --- a/paper/paper.bib +++ b/paper/paper.bib @@ -79,7 +79,7 @@ @article{patil2020ggstatsplot author = {Indrajeet Patil}, year = {2018}, journal = {CRAN}, - url = {https://CRAN.R-project.org/package=ggstatsplot}, + url = {https://CRAN.R-project.org/package=ggstatsplot/}, doi = {10.5281/zenodo.2074621}, } @@ -88,7 +88,7 @@ @manual{sjoberg2020gtsummary author = {Daniel D. Sjoberg and Michael Curry and Margie Hannum and Karissa Whiting and Emily C. Zabor}, year = {2020}, note = {R package version 1.3.5}, - url = {https://CRAN.R-project.org/package=gtsummary}, + url = {https://CRAN.R-project.org/package=gtsummary/}, } @article{luedecke2019insight, @@ -107,7 +107,7 @@ @manual{behrendt2014lmbeta author = {Stefan Behrendt}, year = {2014}, note = {R package version 1.5-1}, - url = {https://CRAN.R-project.org/package=lm.beta}, + url = {https://CRAN.R-project.org/package=lm.beta/}, } @manual{buchanan2019MOTE, @@ -115,7 +115,7 @@ @manual{buchanan2019MOTE author = {Erin M. Buchanan and Amber Gillenwaters and John E. Scofield and K.D. Valentine}, year = {2019}, note = {R package version 1.0.2}, - url = {http://github.com/doomlab/MOTE}, + url = {https://github.com/doomlab/MOTE/}, } @manual{kelley2020MBESS, @@ -123,7 +123,7 @@ @manual{kelley2020MBESS author = {Ken Kelley}, year = {2020}, note = {R package version 4.8.0}, - url = {https://CRAN.R-project.org/package=MBESS}, + url = {https://CRAN.R-project.org/package=MBESS/}, } @book{cohen1988statistical, diff --git a/paper/paper.md b/paper/paper.md index 34566c226..b8cca158d 100644 --- a/paper/paper.md +++ b/paper/paper.md @@ -47,7 +47,7 @@ In both theoretical and applied research, it is often of interest to assess the # Examples of Features -**effectsize** provides various functions for extracting and estimating effect sizes and their confidence intervals [estimated using the noncentrality parameter method; @steiger2004beyond]. In this article, we provide basic usage examples for estimating some of the most common effect size. A comprehensive overview, including in-depth examples and [a full list of features and functions](https://easystats.github.io/effectsize/reference/index.html), are accessible via a dedicated website (https://easystats.github.io/effectsize/). +**effectsize** provides various functions for extracting and estimating effect sizes and their confidence intervals [estimated using the noncentrality parameter method; @steiger2004beyond]. In this article, we provide basic usage examples for estimating some of the most common effect size. A comprehensive overview, including in-depth examples and [a full list of features and functions](https://easystats.github.io/effectsize/reference/index.html/), are accessible via a dedicated website (https://easystats.github.io/effectsize/). ## Indices of Effect Size @@ -125,7 +125,7 @@ standardize_parameters(model, exponentiate = TRUE) #> # Standardization method: refit ``` -`standardize_parameters()` provides several standardization methods, such as robust standardization, or *pseudo*-standardized coefficients for (generalized) linear mixed models [@hoffman2015longitudinal]. A full review of these methods can be found in the [*Parameter and Model Standardization* vignette](https://easystats.github.io/effectsize/articles/standardize_parameters.html). +`standardize_parameters()` provides several standardization methods, such as robust standardization, or *pseudo*-standardized coefficients for (generalized) linear mixed models [@hoffman2015longitudinal]. A full review of these methods can be found in the [*Parameter and Model Standardization* vignette](https://easystats.github.io/effectsize/articles/standardize_parameters.html/). ## Effect Sizes for ANOVAs @@ -158,7 +158,7 @@ eta_squared(model, generalized = "Time") #> Chick:Time | Diet:Time | 0.03 | [0.00, 0.00] ``` -**effectsize** also offers $\epsilon^2_p$ (`epsilon_squared()`) and $\omega^2_p$ (`omega_squared()`), which are less biased estimates of the variance explained in the population [@kelley1935unbiased; @olejnik2003generalized]. For more details about the various effect size measures and their applications, see the [*Effect sizes for ANOVAs* vignette](https://easystats.github.io/effectsize/articles/anovaES.html). +**effectsize** also offers $\epsilon^2_p$ (`epsilon_squared()`) and $\omega^2_p$ (`omega_squared()`), which are less biased estimates of the variance explained in the population [@kelley1935unbiased; @olejnik2003generalized]. For more details about the various effect size measures and their applications, see the [*Effect sizes for ANOVAs* vignette](https://easystats.github.io/effectsize/articles/anovaES.html/). ## Effect Size Conversion @@ -225,7 +225,7 @@ oddsratio_to_r(34.99) ## Effect Size Interpretation -Finally, **effectsize** provides convenience functions to apply existing or custom interpretation rules of thumb, such as for instance Cohen's (1988). Although we strongly advocate for the cautious and parsimonious use of such judgment-replacing tools, we provide these functions to allow users and developers to explore and hopefully gain a deeper understanding of the relationship between data values and their interpretation. More information is available in the [*Automated Interpretation of Indices of Effect Size* vignette](https://easystats.github.io/effectsize/articles/interpret.html). +Finally, **effectsize** provides convenience functions to apply existing or custom interpretation rules of thumb, such as for instance Cohen's (1988). Although we strongly advocate for the cautious and parsimonious use of such judgment-replacing tools, we provide these functions to allow users and developers to explore and hopefully gain a deeper understanding of the relationship between data values and their interpretation. More information is available in the [*Automated Interpretation of Indices of Effect Size* vignette](https://easystats.github.io/effectsize/articles/interpret.html/). ``` r interpret_d(c(0.02, 0.52, 0.86), rules = "cohen1988") @@ -236,10 +236,10 @@ interpret_d(c(0.02, 0.52, 0.86), rules = "cohen1988") # Licensing and Availability -**effectsize** is licensed under the GNU General Public License (v3.0), with all source code stored at GitHub (https://github.com/easystats/effectsize), and with a corresponding issue tracker for bug reporting and feature enhancements. In the spirit of honest and open science, we encourage requests/tips for fixes, feature updates, as well as general questions and concerns via direct interaction with contributors and developers, by [filing an issue](https://github.com/easystats/effectsize/issues). See the package's [*Contribution Guidelines*](https://github.com/easystats/effectsize/blob/main/.github/CONTRIBUTING.md). +**effectsize** is licensed under the GNU General Public License (v3.0), with all source code stored at GitHub (https://github.com/easystats/effectsize), and with a corresponding issue tracker for bug reporting and feature enhancements. In the spirit of honest and open science, we encourage requests/tips for fixes, feature updates, as well as general questions and concerns via direct interaction with contributors and developers, by [filing an issue](https://github.com/easystats/effectsize/issues/). See the package's [*Contribution Guidelines*](https://github.com/easystats/effectsize/blob/main/.github/CONTRIBUTING.md/). # Acknowledgments -**effectsize** is part of the [*easystats*](https://github.com/easystats/easystats) ecosystem, a collaborative project created to facilitate the usage of R for statistical analyses. Thus, we would like to thank the [members of easystats](https://github.com/orgs/easystats/people) as well as the users. +**effectsize** is part of the [*easystats*](https://github.com/easystats/easystats/) ecosystem, a collaborative project created to facilitate the usage of R for statistical analyses. Thus, we would like to thank the [members of easystats](https://github.com/orgs/easystats/people/) as well as the users. # References diff --git a/vignettes/anovaES.Rmd b/vignettes/anovaES.Rmd index 3cd37bdcc..147f9aeb5 100644 --- a/vignettes/anovaES.Rmd +++ b/vignettes/anovaES.Rmd @@ -31,7 +31,7 @@ if (!all(sapply(pkgs, require, quietly = TRUE, character.only = TRUE))) { ## Eta2 -In the context of ANOVA-like tests, it is common to report ANOVA-like effect sizes. Unlike [standardized parameters](https://easystats.github.io/effectsize/articles/standardize_parameters.html), these effect sizes represent the amount of variance explained by each of the model's terms, where each term can be represented by 1 *or more* parameters. +In the context of ANOVA-like tests, it is common to report ANOVA-like effect sizes. Unlike [standardized parameters](https://easystats.github.io/effectsize/articles/standardize_parameters.html/), these effect sizes represent the amount of variance explained by each of the model's terms, where each term can be represented by 1 *or more* parameters. For example, in the following case, the parameters for the `treatment` term represent specific contrasts between the factor's levels (treatment groups) - the difference between each level and the reference level (`obk.long == 'control'`). @@ -231,7 +231,7 @@ repeated-measures ANOVA's - cases where the *SS*s are readily available, and so the various effect sized presented can easily be estimated. How ever this is not always the case. -For example, in linear mixed models (LMM/HLM/MLM), the estimation of all required *SS*s is not straightforward. However, we can still *approximate* these effect sizes (only their partial versions) based on the **test-statistic approximation method** (learn more in the [*Effect Size from Test Statistics* vignette](https://easystats.github.io/effectsize/articles/from_test_statistics.html)). +For example, in linear mixed models (LMM/HLM/MLM), the estimation of all required *SS*s is not straightforward. However, we can still *approximate* these effect sizes (only their partial versions) based on the **test-statistic approximation method** (learn more in the [*Effect Size from Test Statistics* vignette](https://easystats.github.io/effectsize/articles/from_test_statistics.html/)). ```{r, eval=require(lmerTest)} library(lmerTest) @@ -252,7 +252,7 @@ epsilon_squared(fit_lmm) omega_squared(fit_lmm) ``` -Another case where *SS*s are not available is when use Bayesian models. `effectsize` has Bayesian solutions for Bayesian models, about which you can read in the [*Effect Sizes for Bayesian Models* vignette](https://easystats.github.io/effectsize/articles/bayesian_models.html). +Another case where *SS*s are not available is when use Bayesian models. `effectsize` has Bayesian solutions for Bayesian models, about which you can read in the [*Effect Sizes for Bayesian Models* vignette](https://easystats.github.io/effectsize/articles/bayesian_models.html/). # References diff --git a/vignettes/bayesian_models.Rmd b/vignettes/bayesian_models.Rmd index ca776a0c1..71f09d52c 100644 --- a/vignettes/bayesian_models.Rmd +++ b/vignettes/bayesian_models.Rmd @@ -74,7 +74,7 @@ compliments, years), so comparing them is hard when looking at the raw data. This is where standardization comes in. Like with [frequentists -models](https://easystats.github.io/effectsize/articles/standardize_parameters.html) +models](https://easystats.github.io/effectsize/articles/standardize_parameters.html/) we can choose from the same standardization methods. Let's use the (slow) `"refit"` method. @@ -130,7 +130,7 @@ sampling from the PPD, we can generate a posterior distribution of explained variance estimates. But note that **these estimates are conditioned not only on the location-parameters of the model, but also on the scale-parameters of the model!** So it is vital to [validate the -PPD](https://mc-stan.org/docs/2_23/stan-users-guide/meta-models-part.html#meta-models.part) +PPD](https://mc-stan.org/docs/2_23/stan-users-guide/meta-models-part.html#meta-models.part/) before using it to estimate explained variance measures. ### Setup diff --git a/vignettes/bibliography.bib b/vignettes/bibliography.bib index 034c948cb..0226c5128 100644 --- a/vignettes/bibliography.bib +++ b/vignettes/bibliography.bib @@ -468,7 +468,7 @@ @article{patil2020ggstatsplot author = {Indrajeet Patil}, year = {2018}, journal = {CRAN}, - url = {https://CRAN.R-project.org/package=ggstatsplot}, + url = {https://CRAN.R-project.org/package=ggstatsplot/}, doi = {10.5281/zenodo.2074621}, } @@ -477,7 +477,7 @@ @manual{sjoberg2020gtsummary author = {Daniel D. Sjoberg and Michael Curry and Margie Hannum and Karissa Whiting and Emily C. Zabor}, year = {2020}, note = {R package version 1.3.5}, - url = {https://CRAN.R-project.org/package=gtsummary}, + url = {https://CRAN.R-project.org/package=gtsummary/}, } @manual{behrendt2014lmbeta, @@ -485,7 +485,7 @@ @manual{behrendt2014lmbeta author = {Stefan Behrendt}, year = {2014}, note = {R package version 1.5-1}, - url = {https://CRAN.R-project.org/package=lm.beta}, + url = {https://CRAN.R-project.org/package=lm.beta/}, } @manual{buchanan2019MOTE, @@ -493,7 +493,7 @@ @manual{buchanan2019MOTE author = {Erin M. Buchanan and Amber Gillenwaters and John E. Scofield and K.D. Valentine}, year = {2019}, note = {R package version 1.0.2}, - url = {http://github.com/doomlab/MOTE}, + url = {https://github.com/doomlab/MOTE/}, } @manual{kelley2020MBESS, @@ -501,7 +501,7 @@ @manual{kelley2020MBESS author = {Ken Kelley}, year = {2020}, note = {R package version 4.8.0}, - url = {https://CRAN.R-project.org/package=MBESS}, + url = {https://CRAN.R-project.org/package=MBESS/}, } @article{steiger2004beyond, diff --git a/vignettes/effectsize.Rmd b/vignettes/effectsize.Rmd index 9936042d4..6e4f7045c 100644 --- a/vignettes/effectsize.Rmd +++ b/vignettes/effectsize.Rmd @@ -36,7 +36,7 @@ In both theoretical and applied research, it is often of interest to assess the # Examples of Features -**effectsize** provides various functions for extracting and estimating effect sizes and their confidence intervals [estimated using the noncentrality parameter method; @steiger2004beyond]. In this article, we provide basic usage examples for estimating some of the most common effect size. A comprehensive overview, including in-depth examples and [a full list of features and functions](https://easystats.github.io/effectsize/reference/index.html), are accessible via a dedicated website (https://easystats.github.io/effectsize/). +**effectsize** provides various functions for extracting and estimating effect sizes and their confidence intervals [estimated using the noncentrality parameter method; @steiger2004beyond]. In this article, we provide basic usage examples for estimating some of the most common effect size. A comprehensive overview, including in-depth examples and [a full list of features and functions](https://easystats.github.io/effectsize/reference/index.html/), are accessible via a dedicated website (https://easystats.github.io/effectsize/). ## Indices of Effect Size @@ -85,7 +85,7 @@ model <- glm(am ~ cyl + hp, standardize_parameters(model, exponentiate = TRUE) ``` -`standardize_parameters()` provides several standardization methods, such as robust standardization, or *pseudo*-standardized coefficients for (generalized) linear mixed models [@hoffman2015longitudinal]. A full review of these methods can be found in the [*Parameter and Model Standardization* vignette](https://easystats.github.io/effectsize/articles/standardize_parameters.html). +`standardize_parameters()` provides several standardization methods, such as robust standardization, or *pseudo*-standardized coefficients for (generalized) linear mixed models [@hoffman2015longitudinal]. A full review of these methods can be found in the [*Parameter and Model Standardization* vignette](https://easystats.github.io/effectsize/articles/standardize_parameters.html/). ## Effect Sizes for ANOVAs @@ -107,7 +107,7 @@ eta_squared(model, partial = TRUE) eta_squared(model, generalized = "Time") ``` -**effectsize** also offers $\epsilon^2_p$ (`epsilon_squared()`) and $\omega^2_p$ (`omega_squared()`), which are less biased estimates of the variance explained in the population [@kelley1935unbiased; @olejnik2003generalized]. For more details about the various effect size measures and their applications, see the [*Effect sizes for ANOVAs* vignette](https://easystats.github.io/effectsize/articles/anovaES.html). +**effectsize** also offers $\epsilon^2_p$ (`epsilon_squared()`) and $\omega^2_p$ (`omega_squared()`), which are less biased estimates of the variance explained in the population [@kelley1935unbiased; @olejnik2003generalized]. For more details about the various effect size measures and their applications, see the [*Effect sizes for ANOVAs* vignette](https://easystats.github.io/effectsize/articles/anovaES.html/). ## Effect Size Conversion @@ -156,7 +156,7 @@ oddsratio_to_r(34.99) ## Effect Size Interpretation -Finally, **effectsize** provides convenience functions to apply existing or custom interpretation rules of thumb, such as for instance Cohen's (1988). Although we strongly advocate for the cautious and parsimonious use of such judgment-replacing tools, we provide these functions to allow users and developers to explore and hopefully gain a deeper understanding of the relationship between data values and their interpretation. More information is available in the [*Automated Interpretation of Indices of Effect Size* vignette](https://easystats.github.io/effectsize/articles/interpret.html). +Finally, **effectsize** provides convenience functions to apply existing or custom interpretation rules of thumb, such as for instance Cohen's (1988). Although we strongly advocate for the cautious and parsimonious use of such judgment-replacing tools, we provide these functions to allow users and developers to explore and hopefully gain a deeper understanding of the relationship between data values and their interpretation. More information is available in the [*Automated Interpretation of Indices of Effect Size* vignette](https://easystats.github.io/effectsize/articles/interpret.html/). ```{r} interpret_cohens_d(c(0.02, 0.52, 0.86), rules = "cohen1988") @@ -165,10 +165,10 @@ interpret_cohens_d(c(0.02, 0.52, 0.86), rules = "cohen1988") # Licensing and Availability -**effectsize** is licensed under the GNU General Public License (v3.0), with all source code stored at GitHub (https://github.com/easystats/effectsize), and with a corresponding issue tracker for bug reporting and feature enhancements. In the spirit of honest and open science, we encourage requests/tips for fixes, feature updates, as well as general questions and concerns via direct interaction with contributors and developers, by [filing an issue](https://github.com/easystats/effectsize/issues). See the package's [*Contribution Guidelines*](https://github.com/easystats/effectsize/blob/main/.github/CONTRIBUTING.md). +**effectsize** is licensed under the GNU General Public License (v3.0), with all source code stored at GitHub (https://github.com/easystats/effectsize), and with a corresponding issue tracker for bug reporting and feature enhancements. In the spirit of honest and open science, we encourage requests/tips for fixes, feature updates, as well as general questions and concerns via direct interaction with contributors and developers, by [filing an issue](https://github.com/easystats/effectsize/issues/). See the package's [*Contribution Guidelines*](https://github.com/easystats/effectsize/blob/main/.github/CONTRIBUTING.md/). # Acknowledgments -**effectsize** is part of the [*easystats*](https://github.com/easystats/easystats) ecosystem, a collaborative project created to facilitate the usage of R for statistical analyses. Thus, we would like to thank the [members of easystats](https://github.com/orgs/easystats/people) as well as the users. +**effectsize** is part of the [*easystats*](https://github.com/easystats/easystats/) ecosystem, a collaborative project created to facilitate the usage of R for statistical analyses. Thus, we would like to thank the [members of easystats](https://github.com/orgs/easystats/people/) as well as the users. # References diff --git a/vignettes/interpret.Rmd b/vignettes/interpret.Rmd index 88bd9e604..e8fc6df7a 100644 --- a/vignettes/interpret.Rmd +++ b/vignettes/interpret.Rmd @@ -235,7 +235,7 @@ can be used as indices of effect size. Note that the (log) odds ratio from logistic regression coefficients are *unstandardized*, as they depend on the scale of the predictor. In order to apply the following guidelines, make sure you -[*standardize*](https://easystats.github.io/effectsize/articles/standardize_parameters.html) +[*standardize*](https://easystats.github.io/effectsize/articles/standardize_parameters.html/) your predictors! Keep in mind that these apply to Odds *ratios*, so Odds ratio of 10 is as diff --git a/vignettes/simple_htests.Rmd b/vignettes/simple_htests.Rmd index facdb9dd6..50a7a504e 100644 --- a/vignettes/simple_htests.Rmd +++ b/vignettes/simple_htests.Rmd @@ -126,7 +126,7 @@ effectsize(BFt, test = NULL) ## One way ANOVA For more details, see [ANOVA -vignette](https://easystats.github.io/effectsize/articles/anovaES.html). +vignette](https://easystats.github.io/effectsize/articles/anovaES.html/). ```{r, message=FALSE} onew <- oneway.test(mpg ~ gear, data = mtcars, var.equal = TRUE) diff --git a/vignettes/standardize_parameters.Rmd b/vignettes/standardize_parameters.Rmd index 98f7500bf..f45ef46dc 100644 --- a/vignettes/standardize_parameters.Rmd +++ b/vignettes/standardize_parameters.Rmd @@ -40,7 +40,7 @@ within and between models, variables and studies. Moreover, as it returns coefficients expressed in terms of **change of variance** (for instance, coefficients expressed in terms of SD of the response variable), it can allow for the usage of [effect size interpretation -guidelines](https://easystats.github.io/effectsize/articles/interpret.html), +guidelines](https://easystats.github.io/effectsize/articles/interpret.html/), such as Cohen's (1988) famous rules of thumb. However, standardizing a model's parameters should *not* be automatically and @@ -113,7 +113,7 @@ When looking at the difference between groups as a **slope**, the standardized parameter is the difference between the means in $SD_{mpg}$. That is, the *slope* between `Manual` and `Automatic` is a change of 1.20 $SD_{mpg}$s. -However, when looking a the difference as a **distance between two populations**, Cohen's d is the distance between the means in units of [**pooled SDs**](https://easystats.github.io/effectsize/reference/sd_pooled.html). That +However, when looking a the difference as a **distance between two populations**, Cohen's d is the distance between the means in units of [**pooled SDs**](https://easystats.github.io/effectsize/reference/sd_pooled.html/). That is, the *distance* between `Manual` and `Automatic` is of 1.48 SDs of *each of the groups* (here assumed to be equal). @@ -387,7 +387,7 @@ standardize_parameters(mod_b, method = "refit", two_sd = TRUE, exponentiate = TR ## Cohen's *f* -Cohen's $f$ (of [ANOVA fame](https://easystats.github.io/effectsize/articles/anovaES.html)) can be used as a measure of effect size in the context of sequential multiple regression (i.e., [**nested models**](https://easystats.github.io/performance/reference/test_performance.html)). +Cohen's $f$ (of [ANOVA fame](https://easystats.github.io/effectsize/articles/anovaES.html/)) can be used as a measure of effect size in the context of sequential multiple regression (i.e., [**nested models**](https://easystats.github.io/performance/reference/test_performance.html/)). That is, when comparing two models, we can examine the ratio between the increase in $R^2$ and the unexplained variance: @@ -519,7 +519,7 @@ different (because the 0 corresponds to something different in standardzed and non-standardized data). In other words, when it comes to interaction, passing standardized data results in a different model, which coefficient have an intrinsically different meaning from unstandardized data. And as [for -now](https://github.com/easystats/effectsize/issues/6), we are unable to +now](https://github.com/easystats/effectsize/issues/6/), we are unable to retrieve one from another. --> From 9757bcbc1eed1d82d6052c57c01d321fcf3c4dee Mon Sep 17 00:00:00 2001 From: "Mattan S. Ben-Shachar" Date: Thu, 13 Jan 2022 20:54:51 +0200 Subject: [PATCH 12/15] oops/// --- LICENSE | 2 +- NEWS.md | 4 ++-- R/convert_stat_to_anova.R | 2 +- R/convert_stat_to_r.R | 2 +- R/docs_extra.R | 2 +- R/interpret_rope.R | 2 +- README.Rmd | 22 +++++++++++----------- man/F_to_eta2.Rd | 2 +- man/effectsize_API.Rd | 2 +- man/interpret_rope.Rd | 2 +- man/t_to_r.Rd | 2 +- paper/paper.md | 8 ++++---- vignettes/anovaES.Rmd | 6 +++--- vignettes/bayesian_models.Rmd | 2 +- vignettes/effectsize.Rmd | 8 ++++---- vignettes/interpret.Rmd | 2 +- vignettes/simple_htests.Rmd | 2 +- vignettes/standardize_parameters.Rmd | 6 +++--- 18 files changed, 39 insertions(+), 39 deletions(-) diff --git a/LICENSE b/LICENSE index f0fb72c6f..f288702d2 100644 --- a/LICENSE +++ b/LICENSE @@ -671,4 +671,4 @@ into proprietary programs. If your program is a subroutine library, you may consider it more useful to permit linking proprietary applications with the library. If this is what you want to do, use the GNU Lesser General Public License instead of this License. But first, please read -. +. diff --git a/NEWS.md b/NEWS.md index ec249c088..0a57c2d80 100644 --- a/NEWS.md +++ b/NEWS.md @@ -8,7 +8,7 @@ ### New API -See [*Support functions for model extensions* vignette](https://easystats.github.io/effectsize/articles/effectsize_API.html/). +See [*Support functions for model extensions* vignette](https://easystats.github.io/effectsize/articles/effectsize_API.html). ### Other features @@ -45,7 +45,7 @@ See [*Support functions for model extensions* vignette](https://easystats.github - `oddsratio_to_riskratio()` can now convert OR coefficients to RR coefficients from a logistic GLM(M). - All effect-size functions gain an `alternative` argument which can be used to make one- or two-sided CIs. - `interpret()` now accepts as input the results from `cohens_d()`, `eta_squared()`, `rank_biserial()`, etc. -- `interpret_pd()` for the interpretation of the [*Probability of Direction*](https://easystats.github.io/bayestestR/reference/p_direction.html/). +- `interpret_pd()` for the interpretation of the [*Probability of Direction*](https://easystats.github.io/bayestestR/reference/p_direction.html). ## Bug fixes diff --git a/R/convert_stat_to_anova.R b/R/convert_stat_to_anova.R index 13e39722a..bf71926d7 100644 --- a/R/convert_stat_to_anova.R +++ b/R/convert_stat_to_anova.R @@ -10,7 +10,7 @@ #' from `lm` and `aov` models, these functions give exact results. For all other #' cases, they return close approximations. #' \cr -#' See [Effect Size from Test Statistics vignette.](https://easystats.github.io/effectsize/articles/from_test_statistics.html/) +#' See [Effect Size from Test Statistics vignette.](https://easystats.github.io/effectsize/articles/from_test_statistics.html) #' #' @param t,f The t or the F statistics. #' @param df,df_error Degrees of freedom of numerator or of the error estimate diff --git a/R/convert_stat_to_r.R b/R/convert_stat_to_r.R index bea902bec..7452d7daf 100644 --- a/R/convert_stat_to_r.R +++ b/R/convert_stat_to_r.R @@ -9,7 +9,7 @@ #' computation is not straightforward (e.g., in liner mixed models, contrasts, #' etc.). #' \cr -#' See [Effect Size from Test Statistics vignette.](https://easystats.github.io/effectsize/articles/from_test_statistics.html/) +#' See [Effect Size from Test Statistics vignette.](https://easystats.github.io/effectsize/articles/from_test_statistics.html) #' #' @param t,f,z The t, the F or the z statistics. #' @param df,df_error Degrees of freedom of numerator or of the error estimate diff --git a/R/docs_extra.R b/R/docs_extra.R index dc978594d..bc392b9f4 100644 --- a/R/docs_extra.R +++ b/R/docs_extra.R @@ -145,7 +145,7 @@ NULL #' `effectsize` API #' -#' Read the [*Support functions for model extensions*](https://easystats.github.io/effectsize/articles/effectsize_API.html/) vignette. +#' Read the [*Support functions for model extensions*](https://easystats.github.io/effectsize/articles/effectsize_API.html) vignette. #' #' @rdname effectsize_API #' @name effectsize_API diff --git a/R/interpret_rope.R b/R/interpret_rope.R index 34dad1f47..f12b5480d 100644 --- a/R/interpret_rope.R +++ b/R/interpret_rope.R @@ -25,7 +25,7 @@ #' interpret_rope(0, ci = 0.9) #' interpret_rope(c(0.005, 0.99), ci = 1) #' @references -#' [BayestestR's reporting guidelines](https://easystats.github.io/bayestestR/articles/guidelines.html/) +#' [BayestestR's reporting guidelines](https://easystats.github.io/bayestestR/articles/guidelines.html) #' #' @export interpret_rope <- function(rope, ci = 0.9, rules = "default") { diff --git a/README.Rmd b/README.Rmd index 831dd82ad..8e3dc17f0 100644 --- a/README.Rmd +++ b/README.Rmd @@ -72,25 +72,25 @@ install.packages("effectsize", repos = "https://easystats.r-universe.dev/") [![Documentation](https://img.shields.io/badge/documentation-effectsize-orange.svg?colorB=E91E63/)](https://easystats.github.io/effectsize/) [![Blog](https://img.shields.io/badge/blog-easystats-orange.svg?colorB=FF9800/)](https://easystats.github.io/blog/posts/) -[![Features](https://img.shields.io/badge/features-effectsize-orange.svg?colorB=2196F3/)](https://easystats.github.io/effectsize/reference/index.html/) +[![Features](https://img.shields.io/badge/features-effectsize-orange.svg?colorB=2196F3/)](https://easystats.github.io/effectsize/reference/index.html) Click on the buttons above to access the package [**documentation**](https://easystats.github.io/effectsize/) and the [**easystats blog**](https://easystats.github.io/blog/posts/), and check-out these vignettes: - **Effect Sizes** - - [**Parameter and Model Standardization**](https://easystats.github.io/effectsize/articles/standardize_parameters.html/) - - [**ANOVA Effect Sizes**](https://easystats.github.io/effectsize/articles/anovaES.html/) - - [**Effect Sizes in Bayesian Models**](https://easystats.github.io/effectsize/articles/bayesian_models.html/) - - [**For Simple Hypothesis Tests**](https://easystats.github.io/effectsize/articles/simple_htests.html/) + - [**Parameter and Model Standardization**](https://easystats.github.io/effectsize/articles/standardize_parameters.html) + - [**ANOVA Effect Sizes**](https://easystats.github.io/effectsize/articles/anovaES.html) + - [**Effect Sizes in Bayesian Models**](https://easystats.github.io/effectsize/articles/bayesian_models.html) + - [**For Simple Hypothesis Tests**](https://easystats.github.io/effectsize/articles/simple_htests.html) - **Effect Sizes Conversion** - - [**Between Effect Sizes**](https://easystats.github.io/effectsize/articles/convert.html/) - - [**Effect Size from Test Statistics**](https://easystats.github.io/effectsize/articles/from_test_statistics.html/) -- [**Automated Interpretation of Indices of Effect Size**](https://easystats.github.io/effectsize/articles/interpret.html/) + - [**Between Effect Sizes**](https://easystats.github.io/effectsize/articles/convert.html) + - [**Effect Size from Test Statistics**](https://easystats.github.io/effectsize/articles/from_test_statistics.html) +- [**Automated Interpretation of Indices of Effect Size**](https://easystats.github.io/effectsize/articles/interpret.html) # Features -This package is focused on indices of effect size. Check out the package website for [**a full list of features and functions** provided by `effectsize`](https://easystats.github.io/effectsize/reference/index.html/). +This package is focused on indices of effect size. Check out the package website for [**a full list of features and functions** provided by `effectsize`](https://easystats.github.io/effectsize/reference/index.html). ```{r load, message=FALSE, warning=FALSE} library(effectsize) @@ -129,7 +129,7 @@ And more... ### Regression Models (Standardized Parameters) -Importantly, `effectsize` also provides [advanced methods](https://easystats.github.io/effectsize/articles/standardize_parameters.html/) to compute standardized parameters for regression models. +Importantly, `effectsize` also provides [advanced methods](https://easystats.github.io/effectsize/articles/standardize_parameters.html) to compute standardized parameters for regression models. ```{r beta, warning=FALSE, message=FALSE} m <- lm(rating ~ complaints + privileges + advance, data = attitude) @@ -171,7 +171,7 @@ The package allows for an automated interpretation of different indices. interpret_r(r = 0.3) ``` -Different sets of "rules of thumb" are implemented ([**guidelines are detailed here**](https://easystats.github.io/effectsize/articles/interpret.html/)) and can be easily changed. +Different sets of "rules of thumb" are implemented ([**guidelines are detailed here**](https://easystats.github.io/effectsize/articles/interpret.html)) and can be easily changed. ```{r interp-d, warning=FALSE, message=FALSE} diff --git a/man/F_to_eta2.Rd b/man/F_to_eta2.Rd index 5b39ed620..fd74c0805 100644 --- a/man/F_to_eta2.Rd +++ b/man/F_to_eta2.Rd @@ -92,7 +92,7 @@ Squares are not easily available or their computation is not straightforward from \code{lm} and \code{aov} models, these functions give exact results. For all other cases, they return close approximations. \cr -See \href{https://easystats.github.io/effectsize/articles/from_test_statistics.html/}{Effect Size from Test Statistics vignette.} +See \href{https://easystats.github.io/effectsize/articles/from_test_statistics.html}{Effect Size from Test Statistics vignette.} } \details{ These functions use the following formulae: diff --git a/man/effectsize_API.Rd b/man/effectsize_API.Rd index c731b7762..7d0526f17 100644 --- a/man/effectsize_API.Rd +++ b/man/effectsize_API.Rd @@ -54,5 +54,5 @@ including the grouping variable (e.g., \code{"Subject"}).} } \description{ -Read the \href{https://easystats.github.io/effectsize/articles/effectsize_API.html/}{\emph{Support functions for model extensions}} vignette. +Read the \href{https://easystats.github.io/effectsize/articles/effectsize_API.html}{\emph{Support functions for model extensions}} vignette. } diff --git a/man/interpret_rope.Rd b/man/interpret_rope.Rd index d76e8c1fc..36a9b9e84 100644 --- a/man/interpret_rope.Rd +++ b/man/interpret_rope.Rd @@ -44,5 +44,5 @@ interpret_rope(0, ci = 0.9) interpret_rope(c(0.005, 0.99), ci = 1) } \references{ -\href{https://easystats.github.io/bayestestR/articles/guidelines.html/}{BayestestR's reporting guidelines} +\href{https://easystats.github.io/bayestestR/articles/guidelines.html}{BayestestR's reporting guidelines} } diff --git a/man/t_to_r.Rd b/man/t_to_r.Rd index f8cf4faf5..e114cdee9 100644 --- a/man/t_to_r.Rd +++ b/man/t_to_r.Rd @@ -71,7 +71,7 @@ the data required to compute these are not easily available or their computation is not straightforward (e.g., in liner mixed models, contrasts, etc.). \cr -See \href{https://easystats.github.io/effectsize/articles/from_test_statistics.html/}{Effect Size from Test Statistics vignette.} +See \href{https://easystats.github.io/effectsize/articles/from_test_statistics.html}{Effect Size from Test Statistics vignette.} } \details{ These functions use the following formulae to approximate \emph{r} and \emph{d}: diff --git a/paper/paper.md b/paper/paper.md index b8cca158d..817212c7a 100644 --- a/paper/paper.md +++ b/paper/paper.md @@ -47,7 +47,7 @@ In both theoretical and applied research, it is often of interest to assess the # Examples of Features -**effectsize** provides various functions for extracting and estimating effect sizes and their confidence intervals [estimated using the noncentrality parameter method; @steiger2004beyond]. In this article, we provide basic usage examples for estimating some of the most common effect size. A comprehensive overview, including in-depth examples and [a full list of features and functions](https://easystats.github.io/effectsize/reference/index.html/), are accessible via a dedicated website (https://easystats.github.io/effectsize/). +**effectsize** provides various functions for extracting and estimating effect sizes and their confidence intervals [estimated using the noncentrality parameter method; @steiger2004beyond]. In this article, we provide basic usage examples for estimating some of the most common effect size. A comprehensive overview, including in-depth examples and [a full list of features and functions](https://easystats.github.io/effectsize/reference/index.html), are accessible via a dedicated website (https://easystats.github.io/effectsize/). ## Indices of Effect Size @@ -125,7 +125,7 @@ standardize_parameters(model, exponentiate = TRUE) #> # Standardization method: refit ``` -`standardize_parameters()` provides several standardization methods, such as robust standardization, or *pseudo*-standardized coefficients for (generalized) linear mixed models [@hoffman2015longitudinal]. A full review of these methods can be found in the [*Parameter and Model Standardization* vignette](https://easystats.github.io/effectsize/articles/standardize_parameters.html/). +`standardize_parameters()` provides several standardization methods, such as robust standardization, or *pseudo*-standardized coefficients for (generalized) linear mixed models [@hoffman2015longitudinal]. A full review of these methods can be found in the [*Parameter and Model Standardization* vignette](https://easystats.github.io/effectsize/articles/standardize_parameters.html). ## Effect Sizes for ANOVAs @@ -158,7 +158,7 @@ eta_squared(model, generalized = "Time") #> Chick:Time | Diet:Time | 0.03 | [0.00, 0.00] ``` -**effectsize** also offers $\epsilon^2_p$ (`epsilon_squared()`) and $\omega^2_p$ (`omega_squared()`), which are less biased estimates of the variance explained in the population [@kelley1935unbiased; @olejnik2003generalized]. For more details about the various effect size measures and their applications, see the [*Effect sizes for ANOVAs* vignette](https://easystats.github.io/effectsize/articles/anovaES.html/). +**effectsize** also offers $\epsilon^2_p$ (`epsilon_squared()`) and $\omega^2_p$ (`omega_squared()`), which are less biased estimates of the variance explained in the population [@kelley1935unbiased; @olejnik2003generalized]. For more details about the various effect size measures and their applications, see the [*Effect sizes for ANOVAs* vignette](https://easystats.github.io/effectsize/articles/anovaES.html). ## Effect Size Conversion @@ -225,7 +225,7 @@ oddsratio_to_r(34.99) ## Effect Size Interpretation -Finally, **effectsize** provides convenience functions to apply existing or custom interpretation rules of thumb, such as for instance Cohen's (1988). Although we strongly advocate for the cautious and parsimonious use of such judgment-replacing tools, we provide these functions to allow users and developers to explore and hopefully gain a deeper understanding of the relationship between data values and their interpretation. More information is available in the [*Automated Interpretation of Indices of Effect Size* vignette](https://easystats.github.io/effectsize/articles/interpret.html/). +Finally, **effectsize** provides convenience functions to apply existing or custom interpretation rules of thumb, such as for instance Cohen's (1988). Although we strongly advocate for the cautious and parsimonious use of such judgment-replacing tools, we provide these functions to allow users and developers to explore and hopefully gain a deeper understanding of the relationship between data values and their interpretation. More information is available in the [*Automated Interpretation of Indices of Effect Size* vignette](https://easystats.github.io/effectsize/articles/interpret.html). ``` r interpret_d(c(0.02, 0.52, 0.86), rules = "cohen1988") diff --git a/vignettes/anovaES.Rmd b/vignettes/anovaES.Rmd index 147f9aeb5..3cd37bdcc 100644 --- a/vignettes/anovaES.Rmd +++ b/vignettes/anovaES.Rmd @@ -31,7 +31,7 @@ if (!all(sapply(pkgs, require, quietly = TRUE, character.only = TRUE))) { ## Eta2 -In the context of ANOVA-like tests, it is common to report ANOVA-like effect sizes. Unlike [standardized parameters](https://easystats.github.io/effectsize/articles/standardize_parameters.html/), these effect sizes represent the amount of variance explained by each of the model's terms, where each term can be represented by 1 *or more* parameters. +In the context of ANOVA-like tests, it is common to report ANOVA-like effect sizes. Unlike [standardized parameters](https://easystats.github.io/effectsize/articles/standardize_parameters.html), these effect sizes represent the amount of variance explained by each of the model's terms, where each term can be represented by 1 *or more* parameters. For example, in the following case, the parameters for the `treatment` term represent specific contrasts between the factor's levels (treatment groups) - the difference between each level and the reference level (`obk.long == 'control'`). @@ -231,7 +231,7 @@ repeated-measures ANOVA's - cases where the *SS*s are readily available, and so the various effect sized presented can easily be estimated. How ever this is not always the case. -For example, in linear mixed models (LMM/HLM/MLM), the estimation of all required *SS*s is not straightforward. However, we can still *approximate* these effect sizes (only their partial versions) based on the **test-statistic approximation method** (learn more in the [*Effect Size from Test Statistics* vignette](https://easystats.github.io/effectsize/articles/from_test_statistics.html/)). +For example, in linear mixed models (LMM/HLM/MLM), the estimation of all required *SS*s is not straightforward. However, we can still *approximate* these effect sizes (only their partial versions) based on the **test-statistic approximation method** (learn more in the [*Effect Size from Test Statistics* vignette](https://easystats.github.io/effectsize/articles/from_test_statistics.html)). ```{r, eval=require(lmerTest)} library(lmerTest) @@ -252,7 +252,7 @@ epsilon_squared(fit_lmm) omega_squared(fit_lmm) ``` -Another case where *SS*s are not available is when use Bayesian models. `effectsize` has Bayesian solutions for Bayesian models, about which you can read in the [*Effect Sizes for Bayesian Models* vignette](https://easystats.github.io/effectsize/articles/bayesian_models.html/). +Another case where *SS*s are not available is when use Bayesian models. `effectsize` has Bayesian solutions for Bayesian models, about which you can read in the [*Effect Sizes for Bayesian Models* vignette](https://easystats.github.io/effectsize/articles/bayesian_models.html). # References diff --git a/vignettes/bayesian_models.Rmd b/vignettes/bayesian_models.Rmd index 71f09d52c..4f830ccd7 100644 --- a/vignettes/bayesian_models.Rmd +++ b/vignettes/bayesian_models.Rmd @@ -74,7 +74,7 @@ compliments, years), so comparing them is hard when looking at the raw data. This is where standardization comes in. Like with [frequentists -models](https://easystats.github.io/effectsize/articles/standardize_parameters.html/) +models](https://easystats.github.io/effectsize/articles/standardize_parameters.html) we can choose from the same standardization methods. Let's use the (slow) `"refit"` method. diff --git a/vignettes/effectsize.Rmd b/vignettes/effectsize.Rmd index 6e4f7045c..7feeac639 100644 --- a/vignettes/effectsize.Rmd +++ b/vignettes/effectsize.Rmd @@ -36,7 +36,7 @@ In both theoretical and applied research, it is often of interest to assess the # Examples of Features -**effectsize** provides various functions for extracting and estimating effect sizes and their confidence intervals [estimated using the noncentrality parameter method; @steiger2004beyond]. In this article, we provide basic usage examples for estimating some of the most common effect size. A comprehensive overview, including in-depth examples and [a full list of features and functions](https://easystats.github.io/effectsize/reference/index.html/), are accessible via a dedicated website (https://easystats.github.io/effectsize/). +**effectsize** provides various functions for extracting and estimating effect sizes and their confidence intervals [estimated using the noncentrality parameter method; @steiger2004beyond]. In this article, we provide basic usage examples for estimating some of the most common effect size. A comprehensive overview, including in-depth examples and [a full list of features and functions](https://easystats.github.io/effectsize/reference/index.html), are accessible via a dedicated website (https://easystats.github.io/effectsize/). ## Indices of Effect Size @@ -85,7 +85,7 @@ model <- glm(am ~ cyl + hp, standardize_parameters(model, exponentiate = TRUE) ``` -`standardize_parameters()` provides several standardization methods, such as robust standardization, or *pseudo*-standardized coefficients for (generalized) linear mixed models [@hoffman2015longitudinal]. A full review of these methods can be found in the [*Parameter and Model Standardization* vignette](https://easystats.github.io/effectsize/articles/standardize_parameters.html/). +`standardize_parameters()` provides several standardization methods, such as robust standardization, or *pseudo*-standardized coefficients for (generalized) linear mixed models [@hoffman2015longitudinal]. A full review of these methods can be found in the [*Parameter and Model Standardization* vignette](https://easystats.github.io/effectsize/articles/standardize_parameters.html). ## Effect Sizes for ANOVAs @@ -107,7 +107,7 @@ eta_squared(model, partial = TRUE) eta_squared(model, generalized = "Time") ``` -**effectsize** also offers $\epsilon^2_p$ (`epsilon_squared()`) and $\omega^2_p$ (`omega_squared()`), which are less biased estimates of the variance explained in the population [@kelley1935unbiased; @olejnik2003generalized]. For more details about the various effect size measures and their applications, see the [*Effect sizes for ANOVAs* vignette](https://easystats.github.io/effectsize/articles/anovaES.html/). +**effectsize** also offers $\epsilon^2_p$ (`epsilon_squared()`) and $\omega^2_p$ (`omega_squared()`), which are less biased estimates of the variance explained in the population [@kelley1935unbiased; @olejnik2003generalized]. For more details about the various effect size measures and their applications, see the [*Effect sizes for ANOVAs* vignette](https://easystats.github.io/effectsize/articles/anovaES.html). ## Effect Size Conversion @@ -156,7 +156,7 @@ oddsratio_to_r(34.99) ## Effect Size Interpretation -Finally, **effectsize** provides convenience functions to apply existing or custom interpretation rules of thumb, such as for instance Cohen's (1988). Although we strongly advocate for the cautious and parsimonious use of such judgment-replacing tools, we provide these functions to allow users and developers to explore and hopefully gain a deeper understanding of the relationship between data values and their interpretation. More information is available in the [*Automated Interpretation of Indices of Effect Size* vignette](https://easystats.github.io/effectsize/articles/interpret.html/). +Finally, **effectsize** provides convenience functions to apply existing or custom interpretation rules of thumb, such as for instance Cohen's (1988). Although we strongly advocate for the cautious and parsimonious use of such judgment-replacing tools, we provide these functions to allow users and developers to explore and hopefully gain a deeper understanding of the relationship between data values and their interpretation. More information is available in the [*Automated Interpretation of Indices of Effect Size* vignette](https://easystats.github.io/effectsize/articles/interpret.html). ```{r} interpret_cohens_d(c(0.02, 0.52, 0.86), rules = "cohen1988") diff --git a/vignettes/interpret.Rmd b/vignettes/interpret.Rmd index e8fc6df7a..88bd9e604 100644 --- a/vignettes/interpret.Rmd +++ b/vignettes/interpret.Rmd @@ -235,7 +235,7 @@ can be used as indices of effect size. Note that the (log) odds ratio from logistic regression coefficients are *unstandardized*, as they depend on the scale of the predictor. In order to apply the following guidelines, make sure you -[*standardize*](https://easystats.github.io/effectsize/articles/standardize_parameters.html/) +[*standardize*](https://easystats.github.io/effectsize/articles/standardize_parameters.html) your predictors! Keep in mind that these apply to Odds *ratios*, so Odds ratio of 10 is as diff --git a/vignettes/simple_htests.Rmd b/vignettes/simple_htests.Rmd index 50a7a504e..facdb9dd6 100644 --- a/vignettes/simple_htests.Rmd +++ b/vignettes/simple_htests.Rmd @@ -126,7 +126,7 @@ effectsize(BFt, test = NULL) ## One way ANOVA For more details, see [ANOVA -vignette](https://easystats.github.io/effectsize/articles/anovaES.html/). +vignette](https://easystats.github.io/effectsize/articles/anovaES.html). ```{r, message=FALSE} onew <- oneway.test(mpg ~ gear, data = mtcars, var.equal = TRUE) diff --git a/vignettes/standardize_parameters.Rmd b/vignettes/standardize_parameters.Rmd index f45ef46dc..2f2c2b079 100644 --- a/vignettes/standardize_parameters.Rmd +++ b/vignettes/standardize_parameters.Rmd @@ -40,7 +40,7 @@ within and between models, variables and studies. Moreover, as it returns coefficients expressed in terms of **change of variance** (for instance, coefficients expressed in terms of SD of the response variable), it can allow for the usage of [effect size interpretation -guidelines](https://easystats.github.io/effectsize/articles/interpret.html/), +guidelines](https://easystats.github.io/effectsize/articles/interpret.html), such as Cohen's (1988) famous rules of thumb. However, standardizing a model's parameters should *not* be automatically and @@ -113,7 +113,7 @@ When looking at the difference between groups as a **slope**, the standardized parameter is the difference between the means in $SD_{mpg}$. That is, the *slope* between `Manual` and `Automatic` is a change of 1.20 $SD_{mpg}$s. -However, when looking a the difference as a **distance between two populations**, Cohen's d is the distance between the means in units of [**pooled SDs**](https://easystats.github.io/effectsize/reference/sd_pooled.html/). That +However, when looking a the difference as a **distance between two populations**, Cohen's d is the distance between the means in units of [**pooled SDs**](https://easystats.github.io/effectsize/reference/sd_pooled.html). That is, the *distance* between `Manual` and `Automatic` is of 1.48 SDs of *each of the groups* (here assumed to be equal). @@ -387,7 +387,7 @@ standardize_parameters(mod_b, method = "refit", two_sd = TRUE, exponentiate = TR ## Cohen's *f* -Cohen's $f$ (of [ANOVA fame](https://easystats.github.io/effectsize/articles/anovaES.html/)) can be used as a measure of effect size in the context of sequential multiple regression (i.e., [**nested models**](https://easystats.github.io/performance/reference/test_performance.html/)). +Cohen's $f$ (of [ANOVA fame](https://easystats.github.io/effectsize/articles/anovaES.html)) can be used as a measure of effect size in the context of sequential multiple regression (i.e., [**nested models**](https://easystats.github.io/performance/reference/test_performance.html)). That is, when comparing two models, we can examine the ratio between the increase in $R^2$ and the unexplained variance: From 8f28d9b9e57d73ab5e6adae4df3e7c99626717d3 Mon Sep 17 00:00:00 2001 From: "Mattan S. Ben-Shachar" Date: Fri, 14 Jan 2022 13:59:19 +0200 Subject: [PATCH 13/15] fix more effing URLs --- R/cohens_d.R | 2 +- R/equivalence_test.R | 6 +++--- README.Rmd | 4 ++-- README.md | 2 +- inst/CITATION | 2 +- man/cohens_d.Rd | 2 +- man/equivalence_test.effectsize_table.Rd | 6 +++--- 7 files changed, 12 insertions(+), 12 deletions(-) diff --git a/R/cohens_d.R b/R/cohens_d.R index 58b29c6de..bcdbd7feb 100644 --- a/R/cohens_d.R +++ b/R/cohens_d.R @@ -117,7 +117,7 @@ #' #' - Delacre, M., Lakens, D., Ley, C., Liu, L., & Leys, C. (2021, May 7). Why #' Hedges’ g*s based on the non-pooled standard deviation should be reported -#' with Welch's t-test. https://doi.org/10.31234/osf.io/tu6mp/ +#' with Welch's t-test. https://doi.org/10.31234/osf.io/tu6mp #' #' - Hedges, L. V. & Olkin, I. (1985). Statistical methods for #' meta-analysis. Orlando, FL: Academic Press. diff --git a/R/equivalence_test.R b/R/equivalence_test.R index 5f34f4ac2..813e888fc 100644 --- a/R/equivalence_test.R +++ b/R/equivalence_test.R @@ -45,18 +45,18 @@ bayestestR::equivalence_test #' @references #' - Campbell, H., & Gustafson, P. (2018). Conditional equivalence testing: An #' alternative remedy for publication bias. PLOS ONE, 13(4), e0195145. -#' https://doi.org/10.1371/journal.pone.0195145/ +#' https://doi.org/10.1371/journal.pone.0195145 #' #' - Kruschke, J. K. (2014). Doing Bayesian data analysis: A tutorial with R, #' JAGS, and Stan. Academic Press #' #' - Kruschke, J. K. (2018). Rejecting or accepting parameter values in Bayesian #' estimation. Advances in Methods and Practices in Psychological Science, 1(2), -#' 270-280. doi: 10.1177/2515245918771304/ +#' 270-280. doi: 10.1177/2515245918771304 #' #' - Lakens, D. (2017). Equivalence Tests: A Practical Primer for t Tests, #' Correlations, and Meta-Analyses. Social Psychological and Personality -#' Science, 8(4), 355–362. https://doi.org/10.1177/1948550617697177/ +#' Science, 8(4), 355–362. https://doi.org/10.1177/1948550617697177 #' #' @examples #' \donttest{ diff --git a/README.Rmd b/README.Rmd index 8e3dc17f0..ea5e82f90 100644 --- a/README.Rmd +++ b/README.Rmd @@ -30,7 +30,7 @@ knitr::opts_chunk$set( set.seed(111) ``` -[![DOI](https://joss.theoj.org/papers/10.21105/joss.02815/status.svg/)](https://doi.org/10.21105/joss.02815/) +[![DOI](https://joss.theoj.org/papers/10.21105/joss.02815/status.svg/)](https://doi.org/10.21105/joss.02815) [![downloads](https://cranlogs.r-pkg.org/badges/effectsize/)](https://cran.r-project.org/package=effectsize/) [![total](https://cranlogs.r-pkg.org/badges/grand-total/effectsize/)](https://cran.r-project.org/package=effectsize/) [![status](https://tinyverse.netlify.com/badge/effectsize/)](https://CRAN.R-project.org/package=effectsize/) @@ -200,7 +200,7 @@ Corresponding BibTeX entry: pages = {2815}, publisher = {The Open Journal}, doi = {10.21105/joss.02815}, - url = {https://doi.org/10.21105/joss.02815/} + url = {https://doi.org/10.21105/joss.02815} } ``` diff --git a/README.md b/README.md index a23675a96..52dfef02b 100644 --- a/README.md +++ b/README.md @@ -1,7 +1,7 @@ # effectsize -[![DOI](https://joss.theoj.org/papers/10.21105/joss.02815/status.svg/)](https://doi.org/10.21105/joss.02815/) +[![DOI](https://joss.theoj.org/papers/10.21105/joss.02815/status.svg/)](https://doi.org/10.21105/joss.02815) [![downloads](https://cranlogs.r-pkg.org/badges/effectsize/)](https://cran.r-project.org/package=effectsize/) [![total](https://cranlogs.r-pkg.org/badges/grand-total/effectsize/)](https://cran.r-project.org/package=effectsize/) [![status](https://tinyverse.netlify.com/badge/effectsize/)](https://CRAN.R-project.org/package=effectsize/) diff --git a/inst/CITATION b/inst/CITATION index 6a45af9e4..dfeac9c05 100644 --- a/inst/CITATION +++ b/inst/CITATION @@ -18,5 +18,5 @@ bibentry( pages = "2815", publisher = "The Open Journal", doi = "10.21105/joss.02815", - url = "https://doi.org/10.21105/joss.02815/" + url = "https://doi.org/10.21105/joss.02815" ) \ No newline at end of file diff --git a/man/cohens_d.Rd b/man/cohens_d.Rd index 998008a79..6ab2d95f4 100644 --- a/man/cohens_d.Rd +++ b/man/cohens_d.Rd @@ -211,7 +211,7 @@ Statistical Methods, 5(1), 2. sciences (2nd Ed.). New York: Routledge. \item Delacre, M., Lakens, D., Ley, C., Liu, L., & Leys, C. (2021, May 7). Why Hedges’ g*s based on the non-pooled standard deviation should be reported -with Welch's t-test. https://doi.org/10.31234/osf.io/tu6mp/ +with Welch's t-test. https://doi.org/10.31234/osf.io/tu6mp \item Hedges, L. V. & Olkin, I. (1985). Statistical methods for meta-analysis. Orlando, FL: Academic Press. \item Hunter, J. E., & Schmidt, F. L. (2004). Methods of meta-analysis: diff --git a/man/equivalence_test.effectsize_table.Rd b/man/equivalence_test.effectsize_table.Rd index 67b918d60..f315a9816 100644 --- a/man/equivalence_test.effectsize_table.Rd +++ b/man/equivalence_test.effectsize_table.Rd @@ -88,15 +88,15 @@ if (require(see)) plot(equivalence_test(ds, range = 0.2, rule = "bayes")) \itemize{ \item Campbell, H., & Gustafson, P. (2018). Conditional equivalence testing: An alternative remedy for publication bias. PLOS ONE, 13(4), e0195145. -https://doi.org/10.1371/journal.pone.0195145/ +https://doi.org/10.1371/journal.pone.0195145 \item Kruschke, J. K. (2014). Doing Bayesian data analysis: A tutorial with R, JAGS, and Stan. Academic Press \item Kruschke, J. K. (2018). Rejecting or accepting parameter values in Bayesian estimation. Advances in Methods and Practices in Psychological Science, 1(2), -270-280. doi: 10.1177/2515245918771304/ +270-280. doi: 10.1177/2515245918771304 \item Lakens, D. (2017). Equivalence Tests: A Practical Primer for t Tests, Correlations, and Meta-Analyses. Social Psychological and Personality -Science, 8(4), 355–362. https://doi.org/10.1177/1948550617697177/ +Science, 8(4), 355–362. https://doi.org/10.1177/1948550617697177 } } \seealso{ From 01e7f29c3b5f25396cc7eb1afa855fa4e5fbefd5 Mon Sep 17 00:00:00 2001 From: "Mattan S. Ben-Shachar" Date: Fri, 14 Jan 2022 14:04:56 +0200 Subject: [PATCH 14/15] Update cran-comments.md --- cran-comments.md | 2 ++ 1 file changed, 2 insertions(+) diff --git a/cran-comments.md b/cran-comments.md index c78bf8fc6..717d72f64 100644 --- a/cran-comments.md +++ b/cran-comments.md @@ -1,3 +1,5 @@ +All URL issues have been resolved. + ## Test environments * local installation: R 4.1.1 on Windows From f92648677cbf7b6f1123bad65a3981ab23c57bd2 Mon Sep 17 00:00:00 2001 From: "Mattan S. Ben-Shachar" Date: Fri, 14 Jan 2022 14:12:44 +0200 Subject: [PATCH 15/15] FINAL URL @IndrajeetPatil THANKS! --- README.Rmd | 6 +++--- README.md | 54 +++++++++++++++++++++++++----------------------------- 2 files changed, 28 insertions(+), 32 deletions(-) diff --git a/README.Rmd b/README.Rmd index ea5e82f90..54a9b3c8b 100644 --- a/README.Rmd +++ b/README.Rmd @@ -31,8 +31,8 @@ set.seed(111) ``` [![DOI](https://joss.theoj.org/papers/10.21105/joss.02815/status.svg/)](https://doi.org/10.21105/joss.02815) -[![downloads](https://cranlogs.r-pkg.org/badges/effectsize/)](https://cran.r-project.org/package=effectsize/) -[![total](https://cranlogs.r-pkg.org/badges/grand-total/effectsize/)](https://cran.r-project.org/package=effectsize/) +[![downloads](https://cranlogs.r-pkg.org/badges/effectsize)](https://cran.r-project.org/package=effectsize/) +[![total](https://cranlogs.r-pkg.org/badges/grand-total/effectsize)](https://cran.r-project.org/package=effectsize/) [![status](https://tinyverse.netlify.com/badge/effectsize/)](https://CRAN.R-project.org/package=effectsize/) @@ -43,7 +43,7 @@ The goal of this package is to provide utilities to work with indices of effect ## Installation -[![CRAN](https://www.r-pkg.org/badges/version/effectsize/)](https://cran.r-project.org/package=effectsize/) +[![CRAN](https://www.r-pkg.org/badges/version/effectsize)](https://cran.r-project.org/package=effectsize/) [![effectsize status badge](https://easystats.r-universe.dev/badges/effectsize/)](https://easystats.r-universe.dev/) [![R-check](https://github.com/easystats/effectsize/workflows/R-check/badge.svg/)](https://github.com/easystats/effectsize/actions/) [![pkgdown](https://github.com/easystats/effectsize/workflows/pkgdown/badge.svg/)](https://github.com/easystats/effectsize/actions/) diff --git a/README.md b/README.md index 52dfef02b..67958c34a 100644 --- a/README.md +++ b/README.md @@ -2,11 +2,11 @@ # effectsize [![DOI](https://joss.theoj.org/papers/10.21105/joss.02815/status.svg/)](https://doi.org/10.21105/joss.02815) -[![downloads](https://cranlogs.r-pkg.org/badges/effectsize/)](https://cran.r-project.org/package=effectsize/) -[![total](https://cranlogs.r-pkg.org/badges/grand-total/effectsize/)](https://cran.r-project.org/package=effectsize/) +[![downloads](https://cranlogs.r-pkg.org/badges/effectsize)](https://cran.r-project.org/package=effectsize/) +[![total](https://cranlogs.r-pkg.org/badges/grand-total/effectsize)](https://cran.r-project.org/package=effectsize/) [![status](https://tinyverse.netlify.com/badge/effectsize/)](https://CRAN.R-project.org/package=effectsize/) -***Significant is just not enough\!*** +***Significant is just not enough!*** The goal of this package is to provide utilities to work with indices of effect size and standardized parameters, allowing computation and @@ -14,13 +14,13 @@ conversion of indices such as Cohen’s *d*, *r*, odds-ratios, etc. ## Installation -[![CRAN](https://www.r-pkg.org/badges/version/effectsize)](https://cran.r-project.org/package=effectsize) +[![CRAN](https://www.r-pkg.org/badges/version/effectsize)](https://cran.r-project.org/package=effectsize/) [![effectsize status -badge](https://easystats.r-universe.dev/badges/effectsize)](https://easystats.r-universe.dev) -[![R-check](https://github.com/easystats/effectsize/workflows/R-check/badge.svg)](https://github.com/easystats/effectsize/actions) -[![pkgdown](https://github.com/easystats/effectsize/workflows/pkgdown/badge.svg)](https://github.com/easystats/effectsize/actions) +badge](https://easystats.r-universe.dev/badges/effectsize/)](https://easystats.r-universe.dev/) +[![R-check](https://github.com/easystats/effectsize/workflows/R-check/badge.svg/)](https://github.com/easystats/effectsize/actions/) +[![pkgdown](https://github.com/easystats/effectsize/workflows/pkgdown/badge.svg/)](https://github.com/easystats/effectsize/actions/) [![Codecov test -coverage](https://codecov.io/gh/easystats/effectsize/branch/main/graph/badge.svg)](https://codecov.io/gh/easystats/effectsize?branch=main) +coverage](https://codecov.io/gh/easystats/effectsize/branch/main/graph/badge.svg/)](https://app.codecov.io/gh/easystats/effectsize?branch=main/) Run the following to install the stable release of **effectsize** from CRAN: @@ -33,45 +33,41 @@ Or you can install the latest development version `0.5.0.2` from [*R-universe*](https://easystats.r-universe.dev): ``` r -install.packages("effectsize", repos = "https://easystats.r-universe.dev") +install.packages("effectsize", repos = "https://easystats.r-universe.dev/") ``` - - - - ## Documentation -[![Documentation](https://img.shields.io/badge/documentation-effectsize-orange.svg?colorB=E91E63)](https://easystats.github.io/effectsize/) -[![Blog](https://img.shields.io/badge/blog-easystats-orange.svg?colorB=FF9800)](https://easystats.github.io/blog/posts/) -[![Features](https://img.shields.io/badge/features-effectsize-orange.svg?colorB=2196F3)](https://easystats.github.io/effectsize/reference/index.html) +[![Documentation](https://img.shields.io/badge/documentation-effectsize-orange.svg?colorB=E91E63/)](https://easystats.github.io/effectsize/) +[![Blog](https://img.shields.io/badge/blog-easystats-orange.svg?colorB=FF9800/)](https://easystats.github.io/blog/posts/) +[![Features](https://img.shields.io/badge/features-effectsize-orange.svg?colorB=2196F3/)](https://easystats.github.io/effectsize/reference/index.html) Click on the buttons above to access the package [**documentation**](https://easystats.github.io/effectsize/) and the [**easystats blog**](https://easystats.github.io/blog/posts/), and check-out these vignettes: - - **Effect Sizes** - - [**Parameter and Model +- **Effect Sizes** + - [**Parameter and Model Standardization**](https://easystats.github.io/effectsize/articles/standardize_parameters.html) - - [**ANOVA Effect + - [**ANOVA Effect Sizes**](https://easystats.github.io/effectsize/articles/anovaES.html) - - [**Effect Sizes in Bayesian + - [**Effect Sizes in Bayesian Models**](https://easystats.github.io/effectsize/articles/bayesian_models.html) - - [**For Simple Hypothesis + - [**For Simple Hypothesis Tests**](https://easystats.github.io/effectsize/articles/simple_htests.html) - - **Effect Sizes Conversion** - - [**Between Effect +- **Effect Sizes Conversion** + - [**Between Effect Sizes**](https://easystats.github.io/effectsize/articles/convert.html) - - [**Effect Size from Test + - [**Effect Size from Test Statistics**](https://easystats.github.io/effectsize/articles/from_test_statistics.html) - - [**Automated Interpretation of Indices of Effect +- [**Automated Interpretation of Indices of Effect Size**](https://easystats.github.io/effectsize/articles/interpret.html) # Features @@ -245,7 +241,7 @@ interpret_cohens_d(d = 0.45, rules = "gignac2016") In order to cite this package, please use the following citation: - - Ben-Shachar M, Lüdecke D, Makowski D (2020). effectsize: Estimation +- Ben-Shachar M, Lüdecke D, Makowski D (2020). effectsize: Estimation of Effect Size Indices and Standardized Parameters. *Journal of Open Source Software*, *5*(56), 2815. doi: 10.21105/joss.02815 @@ -268,9 +264,9 @@ Corresponding BibTeX entry: If you have any questions regarding the the functionality of the package, you may either contact us via email or also [file an -issue](https://github.com/easystats/effectsize/issues). Anyone wishing +issue](https://github.com/easystats/effectsize/issues/). Anyone wishing to contribute to the package by adding functions, features, or in another way, please follow [this -guide](https://github.com/easystats/effectsize/blob/main/.github/CONTRIBUTING.md) +guide](https://github.com/easystats/effectsize/blob/main/.github/CONTRIBUTING.md/) and our [code of -conduct](https://github.com/easystats/effectsize/blob/main/.github/CODE_OF_CONDUCT.md). +conduct](https://github.com/easystats/effectsize/blob/main/.github/CODE_OF_CONDUCT.md/).