diff --git a/DESCRIPTION b/DESCRIPTION
index 55ea6fa2..251e2507 100644
--- a/DESCRIPTION
+++ b/DESCRIPTION
@@ -1,6 +1,6 @@
Package: metafor
-Version: 4.7-54
-Date: 2024-11-21
+Version: 4.7-55
+Date: 2024-11-22
Title: Meta-Analysis Package for R
Authors@R: person(given = "Wolfgang", family = "Viechtbauer", role = c("aut","cre"), email = "wvb@metafor-project.org", comment = c(ORCID = "0000-0003-3463-4063"))
Depends: R (>= 4.0.0), methods, Matrix, metadat, numDeriv
diff --git a/NEWS.md b/NEWS.md
index 566681d1..ddc72c60 100644
--- a/NEWS.md
+++ b/NEWS.md
@@ -1,4 +1,4 @@
-# metafor 4.7-54 (2024-11-21)
+# metafor 4.7-55 (2024-11-22)
- some general changes to the various `forest()` functions: argument `header` is now `TRUE` by default, the y-axis is now created with `yaxs="i"`, and the y-axis limits have been tweaked slightly in accordance
diff --git a/R/confint.rma.uni.r b/R/confint.rma.uni.r
index 3c3be756..722006fc 100644
--- a/R/confint.rma.uni.r
+++ b/R/confint.rma.uni.r
@@ -41,6 +41,11 @@ confint.rma.uni <- function(object, parm, level, fixed=FALSE, random=TRUE, type,
if (missing(targs))
targs <- NULL
+ funlist <- lapply(list(transf.exp.int, transf.ilogit.int, transf.ztor.int, transf.exp.mode, transf.ilogit.mode, transf.ztor.mode), deparse)
+
+ if (is.null(targs) && any(sapply(funlist, identical, deparse(transf))) && inherits(x, c("rma.uni","rma.glmm")) && length(x$tau2 == 1L))
+ targs <- c(tau2=x$tau2)
+
if (missing(control))
control <- list()
diff --git a/R/confint.rma.uni.selmodel.r b/R/confint.rma.uni.selmodel.r
index ac648043..e72c549f 100644
--- a/R/confint.rma.uni.selmodel.r
+++ b/R/confint.rma.uni.selmodel.r
@@ -33,6 +33,11 @@ confint.rma.uni.selmodel <- function(object, parm, level, fixed=FALSE, tau2, del
if (missing(targs))
targs <- NULL
+ funlist <- lapply(list(transf.exp.int, transf.ilogit.int, transf.ztor.int, transf.exp.mode, transf.ilogit.mode, transf.ztor.mode), deparse)
+
+ if (is.null(targs) && any(sapply(funlist, identical, deparse(transf))) && inherits(x, c("rma.uni","rma.glmm")) && length(x$tau2 == 1L))
+ targs <- c(tau2=x$tau2)
+
if (missing(control))
control <- list()
diff --git a/R/cumul.rma.uni.r b/R/cumul.rma.uni.r
index 26b96d6c..3d84daa4 100644
--- a/R/cumul.rma.uni.r
+++ b/R/cumul.rma.uni.r
@@ -27,6 +27,11 @@ cumul.rma.uni <- function(x, order, digits, transf, targs, collapse=FALSE, progb
if (missing(targs))
targs <- NULL
+ funlist <- lapply(list(transf.exp.int, transf.ilogit.int, transf.ztor.int, transf.exp.mode, transf.ilogit.mode, transf.ztor.mode), deparse)
+
+ if (is.null(targs) && any(sapply(funlist, identical, deparse(transf))) && inherits(x, c("rma.uni","rma.glmm")) && length(x$tau2 == 1L))
+ targs <- c(tau2=x$tau2)
+
ddd <- list(...)
.chkdots(ddd, c("time", "decreasing"))
diff --git a/R/hc.rma.uni.r b/R/hc.rma.uni.r
index d224d337..8aac3cf9 100644
--- a/R/hc.rma.uni.r
+++ b/R/hc.rma.uni.r
@@ -24,6 +24,11 @@ hc.rma.uni <- function(object, digits, transf, targs, control, ...) {
if (missing(targs))
targs <- NULL
+ funlist <- lapply(list(transf.exp.int, transf.ilogit.int, transf.ztor.int, transf.exp.mode, transf.ilogit.mode, transf.ztor.mode), deparse)
+
+ if (is.null(targs) && any(sapply(funlist, identical, deparse(transf))) && inherits(x, c("rma.uni","rma.glmm")) && length(x$tau2 == 1L))
+ targs <- c(tau2=x$tau2)
+
yi <- x$yi
vi <- x$vi
k <- length(yi)
diff --git a/R/leave1out.rma.uni.r b/R/leave1out.rma.uni.r
index 252b0a32..ac5c2a02 100644
--- a/R/leave1out.rma.uni.r
+++ b/R/leave1out.rma.uni.r
@@ -30,6 +30,11 @@ leave1out.rma.uni <- function(x, digits, transf, targs, progbar=FALSE, ...) {
if (missing(targs))
targs <- NULL
+ funlist <- lapply(list(transf.exp.int, transf.ilogit.int, transf.ztor.int, transf.exp.mode, transf.ilogit.mode, transf.ztor.mode), deparse)
+
+ if (is.null(targs) && any(sapply(funlist, identical, deparse(transf))) && inherits(x, c("rma.uni","rma.glmm")) && length(x$tau2 == 1L))
+ targs <- c(tau2=x$tau2)
+
ddd <- list(...)
.chkdots(ddd, c("time"))
diff --git a/R/predict.rma.r b/R/predict.rma.r
index 32072bc9..04109320 100644
--- a/R/predict.rma.r
+++ b/R/predict.rma.r
@@ -52,6 +52,11 @@ level, adjust=FALSE, digits, transf, targs, vcov=FALSE, ...) {
if (missing(targs))
targs <- NULL
+ funlist <- lapply(list(transf.exp.int, transf.ilogit.int, transf.ztor.int, transf.exp.mode, transf.ilogit.mode, transf.ztor.mode), deparse)
+
+ if (is.null(targs) && any(sapply(funlist, identical, deparse(transf))) && inherits(x, c("rma.uni","rma.glmm")) && length(x$tau2 == 1L))
+ targs <- c(tau2=x$tau2)
+
level <- .level(level)
if (!is.logical(adjust))
@@ -543,9 +548,6 @@ level, adjust=FALSE, digits, transf, targs, vcov=FALSE, ...) {
### apply transformation function if one has been specified
if (is.function(transf)) {
- #funlist <- lapply(list(transf.exp.int, transf.ilogit.int, transf.ztor.int, transf.exp.mode, transf.ilogit.mode, transf.ztor.mode), deparse)
- #if (is.null(targs) && any(sapply(funlist, identical, deparse(transf))) && inherits(x, c("rma.uni","rma.glmm")) && length(x$tau2 == 1L))
- # targs <- c(tau2=x$tau2)
if (is.null(targs)) {
pred <- sapply(pred, transf)
se <- rep(NA_real_, k.new)
diff --git a/R/zzz.r b/R/zzz.r
index f93eafd9..20bd8327 100644
--- a/R/zzz.r
+++ b/R/zzz.r
@@ -1,6 +1,6 @@
.onAttach <- function(libname, pkgname) {
- ver <- "4.7-54"
+ ver <- "4.7-55"
loadmsg <- paste0("\nLoading the 'metafor' package (version ", ver, "). For an\nintroduction to the package please type: help(metafor)\n")
diff --git a/README.md b/README.md
index 27f6f364..6b05ff37 100644
--- a/README.md
+++ b/README.md
@@ -5,7 +5,7 @@ metafor: A Meta-Analysis Package for R
[![R build status](https://github.com/wviechtb/metafor/workflows/R-CMD-check/badge.svg)](https://github.com/wviechtb/metafor/actions)
[![Code Coverage](https://codecov.io/gh/wviechtb/metafor/branch/master/graph/badge.svg)](https://app.codecov.io/gh/wviechtb/metafor)
[![CRAN Version](https://www.r-pkg.org/badges/version/metafor)](https://cran.r-project.org/package=metafor)
-[![devel Version](https://img.shields.io/badge/devel-4.7--54-brightgreen.svg)](https://www.metafor-project.org/doku.php/installation#development_version)
+[![devel Version](https://img.shields.io/badge/devel-4.7--55-brightgreen.svg)](https://www.metafor-project.org/doku.php/installation#development_version)
[![Monthly Downloads](https://cranlogs.r-pkg.org/badges/metafor)](https://cranlogs.r-pkg.org/badges/metafor)
[![Total Downloads](https://cranlogs.r-pkg.org/badges/grand-total/metafor)](https://cranlogs.r-pkg.org/badges/grand-total/metafor)
diff --git a/docs/404.html b/docs/404.html
index 89ce6819..7d1caf9e 100644
--- a/docs/404.html
+++ b/docs/404.html
@@ -54,7 +54,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/ISSUE_TEMPLATE.html b/docs/ISSUE_TEMPLATE.html
index 8b4bb224..45e8b9c8 100644
--- a/docs/ISSUE_TEMPLATE.html
+++ b/docs/ISSUE_TEMPLATE.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/articles/index.html b/docs/articles/index.html
index 81773995..74afc1e4 100644
--- a/docs/articles/index.html
+++ b/docs/articles/index.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/articles/pkgdown/diagram.html b/docs/articles/pkgdown/diagram.html
index 7fbfee53..59640866 100644
--- a/docs/articles/pkgdown/diagram.html
+++ b/docs/articles/pkgdown/diagram.html
@@ -51,7 +51,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/authors.html b/docs/authors.html
index 3841e352..1268a66e 100644
--- a/docs/authors.html
+++ b/docs/authors.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/index.html b/docs/index.html
index 3e09e95e..7396712c 100644
--- a/docs/index.html
+++ b/docs/index.html
@@ -55,7 +55,7 @@
metafor
- 4.7-54
+ 4.7-55
@@ -121,7 +121,7 @@
-
+
some general changes to the various forest()
functions: argument header
is now TRUE
by default, the y-axis is now created with yaxs="i"
, and the y-axis limits have been tweaked slightly in accordance
forest.rma()
and the various addpoly()
functions now provides multiple styles for drawing the prediction interval via the predstyle
argument
forest.rma()
and addpoly.rma()
now write out the default label (instead of an abbreviation) for the model results; as before, the label can be changed via the mlab
argument
diff --git a/docs/pkgdown.yml b/docs/pkgdown.yml
index a679b718..db057a8c 100644
--- a/docs/pkgdown.yml
+++ b/docs/pkgdown.yml
@@ -3,7 +3,7 @@ pkgdown: 2.1.1.9000
pkgdown_sha: 0a18bc718640aee7160a0ebbcdef5ecaae2ac4a4
articles:
pkgdown/diagram: pkgdown/diagram.html
-last_built: 2024-11-21T16:31Z
+last_built: 2024-11-22T07:53Z
urls:
reference: https://wviechtb.github.io/metafor/reference
article: https://wviechtb.github.io/metafor/articles
diff --git a/docs/reference/addpoly.default.html b/docs/reference/addpoly.default.html
index 655e1fc1..2329dd00 100644
--- a/docs/reference/addpoly.default.html
+++ b/docs/reference/addpoly.default.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/addpoly.html b/docs/reference/addpoly.html
index d1e576c5..45e616b7 100644
--- a/docs/reference/addpoly.html
+++ b/docs/reference/addpoly.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/addpoly.predict.rma.html b/docs/reference/addpoly.predict.rma.html
index 87360725..2dda8aed 100644
--- a/docs/reference/addpoly.predict.rma.html
+++ b/docs/reference/addpoly.predict.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/addpoly.rma.html b/docs/reference/addpoly.rma.html
index 9fb1e4ed..02ed9bf2 100644
--- a/docs/reference/addpoly.rma.html
+++ b/docs/reference/addpoly.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/aggregate.escalc.html b/docs/reference/aggregate.escalc.html
index 9fdfe3d1..836d2c34 100644
--- a/docs/reference/aggregate.escalc.html
+++ b/docs/reference/aggregate.escalc.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/anova.rma.html b/docs/reference/anova.rma.html
index 1fad8fcd..6a792a99 100644
--- a/docs/reference/anova.rma.html
+++ b/docs/reference/anova.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/baujat.html b/docs/reference/baujat.html
index 96cad154..cf246feb 100644
--- a/docs/reference/baujat.html
+++ b/docs/reference/baujat.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/bldiag.html b/docs/reference/bldiag.html
index 86707e03..002664bc 100644
--- a/docs/reference/bldiag.html
+++ b/docs/reference/bldiag.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/blsplit.html b/docs/reference/blsplit.html
index 2c645902..ffda7d0b 100644
--- a/docs/reference/blsplit.html
+++ b/docs/reference/blsplit.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/blup.html b/docs/reference/blup.html
index 70b45747..f64d14b5 100644
--- a/docs/reference/blup.html
+++ b/docs/reference/blup.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/coef.permutest.rma.uni.html b/docs/reference/coef.permutest.rma.uni.html
index e3e06f03..22dff926 100644
--- a/docs/reference/coef.permutest.rma.uni.html
+++ b/docs/reference/coef.permutest.rma.uni.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/coef.rma.html b/docs/reference/coef.rma.html
index d2d00295..2524385a 100644
--- a/docs/reference/coef.rma.html
+++ b/docs/reference/coef.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/confint.rma.html b/docs/reference/confint.rma.html
index f4ae77fd..7ee9568e 100644
--- a/docs/reference/confint.rma.html
+++ b/docs/reference/confint.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/contrmat.html b/docs/reference/contrmat.html
index 504b6f65..2d12dd2c 100644
--- a/docs/reference/contrmat.html
+++ b/docs/reference/contrmat.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/conv.2x2.html b/docs/reference/conv.2x2.html
index 50b0a4da..8f8ab0d7 100644
--- a/docs/reference/conv.2x2.html
+++ b/docs/reference/conv.2x2.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/conv.delta.html b/docs/reference/conv.delta.html
index e943bf22..35c4e15e 100644
--- a/docs/reference/conv.delta.html
+++ b/docs/reference/conv.delta.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/conv.fivenum.html b/docs/reference/conv.fivenum.html
index 3588e888..298d5a1b 100644
--- a/docs/reference/conv.fivenum.html
+++ b/docs/reference/conv.fivenum.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/conv.wald.html b/docs/reference/conv.wald.html
index 90f26326..c01342d2 100644
--- a/docs/reference/conv.wald.html
+++ b/docs/reference/conv.wald.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/cumul.html b/docs/reference/cumul.html
index f41f0c92..1792ade7 100644
--- a/docs/reference/cumul.html
+++ b/docs/reference/cumul.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/deltamethod.html b/docs/reference/deltamethod.html
index 6cf5a381..d1365363 100644
--- a/docs/reference/deltamethod.html
+++ b/docs/reference/deltamethod.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/dfround.html b/docs/reference/dfround.html
index dcf21741..d7ec2bdd 100644
--- a/docs/reference/dfround.html
+++ b/docs/reference/dfround.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/emmprep.html b/docs/reference/emmprep.html
index 01631f8c..7fe44779 100644
--- a/docs/reference/emmprep.html
+++ b/docs/reference/emmprep.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/escalc.html b/docs/reference/escalc.html
index 3681b661..2c324230 100644
--- a/docs/reference/escalc.html
+++ b/docs/reference/escalc.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/fitstats.html b/docs/reference/fitstats.html
index 4e3edd9a..0f52d530 100644
--- a/docs/reference/fitstats.html
+++ b/docs/reference/fitstats.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/fitted.rma.html b/docs/reference/fitted.rma.html
index 12647fa2..e9aeea7f 100644
--- a/docs/reference/fitted.rma.html
+++ b/docs/reference/fitted.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/forest.cumul.rma.html b/docs/reference/forest.cumul.rma.html
index 4bb4c72e..2ab6c3ef 100644
--- a/docs/reference/forest.cumul.rma.html
+++ b/docs/reference/forest.cumul.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/forest.default.html b/docs/reference/forest.default.html
index a6a08c31..d4632ac2 100644
--- a/docs/reference/forest.default.html
+++ b/docs/reference/forest.default.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/forest.html b/docs/reference/forest.html
index c2c966e4..aa953018 100644
--- a/docs/reference/forest.html
+++ b/docs/reference/forest.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/forest.rma.html b/docs/reference/forest.rma.html
index f9e31fa2..ed05039b 100644
--- a/docs/reference/forest.rma.html
+++ b/docs/reference/forest.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/formatters.html b/docs/reference/formatters.html
index 62cc36e5..187286fa 100644
--- a/docs/reference/formatters.html
+++ b/docs/reference/formatters.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/formula.rma.html b/docs/reference/formula.rma.html
index 974c2536..6938177b 100644
--- a/docs/reference/formula.rma.html
+++ b/docs/reference/formula.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
@@ -142,13 +142,13 @@ Examples
res <- rma(yi, vi, mods = ~ ablat + alloc, data=dat)
formula(res, type="mods")
#> ~ablat + alloc
-#> <environment: 0x55e7da67f3f0>
+#> <environment: 0x5625fcaaa950>
### specify moderators via 'yi' argument
res <- rma(yi ~ ablat + alloc, vi, data=dat)
formula(res, type="yi")
#> yi ~ ablat + alloc
-#> <environment: 0x55e7d8a0a1e8>
+#> <environment: 0x5625fc4faa00>
diff --git a/docs/reference/fsn.html b/docs/reference/fsn.html
index 04f5973e..1a9cfb64 100644
--- a/docs/reference/fsn.html
+++ b/docs/reference/fsn.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/funnel.html b/docs/reference/funnel.html
index 5949b2f5..da579b14 100644
--- a/docs/reference/funnel.html
+++ b/docs/reference/funnel.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/gosh.html b/docs/reference/gosh.html
index 75fb289a..f82a8900 100644
--- a/docs/reference/gosh.html
+++ b/docs/reference/gosh.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/hc.html b/docs/reference/hc.html
index 47fdf390..1c916ac9 100644
--- a/docs/reference/hc.html
+++ b/docs/reference/hc.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/index.html b/docs/reference/index.html
index eea77ad4..3c79cd55 100644
--- a/docs/reference/index.html
+++ b/docs/reference/index.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/influence.rma.mv.html b/docs/reference/influence.rma.mv.html
index 489e984d..9ed0cd8e 100644
--- a/docs/reference/influence.rma.mv.html
+++ b/docs/reference/influence.rma.mv.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/influence.rma.uni.html b/docs/reference/influence.rma.uni.html
index 0d90e5cb..027d4970 100644
--- a/docs/reference/influence.rma.uni.html
+++ b/docs/reference/influence.rma.uni.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/labbe.html b/docs/reference/labbe.html
index 8220b7aa..22247b3c 100644
--- a/docs/reference/labbe.html
+++ b/docs/reference/labbe.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/leave1out.html b/docs/reference/leave1out.html
index 08e6ccea..6e6c680a 100644
--- a/docs/reference/leave1out.html
+++ b/docs/reference/leave1out.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/llplot.html b/docs/reference/llplot.html
index a8a84772..0bd1553d 100644
--- a/docs/reference/llplot.html
+++ b/docs/reference/llplot.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/matreg.html b/docs/reference/matreg.html
index 6290d51a..d59c9562 100644
--- a/docs/reference/matreg.html
+++ b/docs/reference/matreg.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/metafor-package.html b/docs/reference/metafor-package.html
index 2c793574..c5ac667c 100644
--- a/docs/reference/metafor-package.html
+++ b/docs/reference/metafor-package.html
@@ -31,7 +31,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/metafor.news.html b/docs/reference/metafor.news.html
index 22fbde53..6c08f723 100644
--- a/docs/reference/metafor.news.html
+++ b/docs/reference/metafor.news.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
@@ -115,7 +115,7 @@ References
Examples
# \dontrun{
metafor.news()
-#> Changes in version 4.7-54 (2024-11-21)
+#> Changes in version 4.7-55 (2024-11-22)
#>
#> - some general changes to the various forest() functions: argument
#> header is now TRUE by default, the y-axis is now created with
diff --git a/docs/reference/methods.anova.rma.html b/docs/reference/methods.anova.rma.html
index 6da327b0..775ed994 100644
--- a/docs/reference/methods.anova.rma.html
+++ b/docs/reference/methods.anova.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/methods.confint.rma.html b/docs/reference/methods.confint.rma.html
index 50421c8b..8c3595ce 100644
--- a/docs/reference/methods.confint.rma.html
+++ b/docs/reference/methods.confint.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/methods.deltamethod.html b/docs/reference/methods.deltamethod.html
index dafea9de..e1702c7f 100644
--- a/docs/reference/methods.deltamethod.html
+++ b/docs/reference/methods.deltamethod.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/methods.escalc.html b/docs/reference/methods.escalc.html
index 77d431f1..7050c051 100644
--- a/docs/reference/methods.escalc.html
+++ b/docs/reference/methods.escalc.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/methods.list.rma.html b/docs/reference/methods.list.rma.html
index be632c5d..8e0c4714 100644
--- a/docs/reference/methods.list.rma.html
+++ b/docs/reference/methods.list.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/methods.matreg.html b/docs/reference/methods.matreg.html
index dd128bbb..a3f115e0 100644
--- a/docs/reference/methods.matreg.html
+++ b/docs/reference/methods.matreg.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/methods.vif.rma.html b/docs/reference/methods.vif.rma.html
index 372c1705..71aa6bd9 100644
--- a/docs/reference/methods.vif.rma.html
+++ b/docs/reference/methods.vif.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/mfopt.html b/docs/reference/mfopt.html
index f2fb08f2..79d491ce 100644
--- a/docs/reference/mfopt.html
+++ b/docs/reference/mfopt.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/misc-models.html b/docs/reference/misc-models.html
index fe39c70a..0df2f4b7 100644
--- a/docs/reference/misc-models.html
+++ b/docs/reference/misc-models.html
@@ -31,7 +31,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/misc-options.html b/docs/reference/misc-options.html
index 412a925e..54446a97 100644
--- a/docs/reference/misc-options.html
+++ b/docs/reference/misc-options.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/misc-recs.html b/docs/reference/misc-recs.html
index a7d00cca..aa059af1 100644
--- a/docs/reference/misc-recs.html
+++ b/docs/reference/misc-recs.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/model.matrix.rma.html b/docs/reference/model.matrix.rma.html
index 821f4d12..72dd31f1 100644
--- a/docs/reference/model.matrix.rma.html
+++ b/docs/reference/model.matrix.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/pairmat.html b/docs/reference/pairmat.html
index afb1a0b2..2ab61161 100644
--- a/docs/reference/pairmat.html
+++ b/docs/reference/pairmat.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/permutest.html b/docs/reference/permutest.html
index 0294c87f..b3c3c8c5 100644
--- a/docs/reference/permutest.html
+++ b/docs/reference/permutest.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/plot.cumul.rma.html b/docs/reference/plot.cumul.rma.html
index efafc48a..dab4e435 100644
--- a/docs/reference/plot.cumul.rma.html
+++ b/docs/reference/plot.cumul.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/plot.gosh.rma.html b/docs/reference/plot.gosh.rma.html
index 2bda9400..6ac248e3 100644
--- a/docs/reference/plot.gosh.rma.html
+++ b/docs/reference/plot.gosh.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/plot.infl.rma.uni.html b/docs/reference/plot.infl.rma.uni.html
index 47983344..1efd8f68 100644
--- a/docs/reference/plot.infl.rma.uni.html
+++ b/docs/reference/plot.infl.rma.uni.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/plot.permutest.rma.uni.html b/docs/reference/plot.permutest.rma.uni.html
index 1fc1a47b..3b0dddaf 100644
--- a/docs/reference/plot.permutest.rma.uni.html
+++ b/docs/reference/plot.permutest.rma.uni.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/plot.rma.html b/docs/reference/plot.rma.html
index bcb2f151..a9d39b83 100644
--- a/docs/reference/plot.rma.html
+++ b/docs/reference/plot.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/plot.rma.uni.selmodel.html b/docs/reference/plot.rma.uni.selmodel.html
index 57b3bd76..5783085d 100644
--- a/docs/reference/plot.rma.uni.selmodel.html
+++ b/docs/reference/plot.rma.uni.selmodel.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/plot.vif.rma.html b/docs/reference/plot.vif.rma.html
index db5b80f6..6d17ab6e 100644
--- a/docs/reference/plot.vif.rma.html
+++ b/docs/reference/plot.vif.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/predict.rma.html b/docs/reference/predict.rma.html
index 155246d8..bf4e7710 100644
--- a/docs/reference/predict.rma.html
+++ b/docs/reference/predict.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/print.anova.rma.html b/docs/reference/print.anova.rma.html
index 9f3448a6..e63336a9 100644
--- a/docs/reference/print.anova.rma.html
+++ b/docs/reference/print.anova.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/print.confint.rma.html b/docs/reference/print.confint.rma.html
index 3aa213cc..76ed8dba 100644
--- a/docs/reference/print.confint.rma.html
+++ b/docs/reference/print.confint.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/print.deltamethod.html b/docs/reference/print.deltamethod.html
index ecf21891..1f8eae4e 100644
--- a/docs/reference/print.deltamethod.html
+++ b/docs/reference/print.deltamethod.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/print.escalc.html b/docs/reference/print.escalc.html
index 3528f57f..d7b4f735 100644
--- a/docs/reference/print.escalc.html
+++ b/docs/reference/print.escalc.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/print.fsn.html b/docs/reference/print.fsn.html
index f6214c1c..9dd4083e 100644
--- a/docs/reference/print.fsn.html
+++ b/docs/reference/print.fsn.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/print.gosh.rma.html b/docs/reference/print.gosh.rma.html
index 579aeb50..315f33eb 100644
--- a/docs/reference/print.gosh.rma.html
+++ b/docs/reference/print.gosh.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/print.hc.rma.uni.html b/docs/reference/print.hc.rma.uni.html
index 9cff02a5..285fefbe 100644
--- a/docs/reference/print.hc.rma.uni.html
+++ b/docs/reference/print.hc.rma.uni.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/print.list.rma.html b/docs/reference/print.list.rma.html
index 7ab35ed7..76472ad7 100644
--- a/docs/reference/print.list.rma.html
+++ b/docs/reference/print.list.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/print.matreg.html b/docs/reference/print.matreg.html
index 1e0da38a..f63ae25c 100644
--- a/docs/reference/print.matreg.html
+++ b/docs/reference/print.matreg.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/print.permutest.rma.uni.html b/docs/reference/print.permutest.rma.uni.html
index 80663159..5c262795 100644
--- a/docs/reference/print.permutest.rma.uni.html
+++ b/docs/reference/print.permutest.rma.uni.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/print.ranktest.rma.html b/docs/reference/print.ranktest.rma.html
index caac2e56..192ce168 100644
--- a/docs/reference/print.ranktest.rma.html
+++ b/docs/reference/print.ranktest.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/print.regtest.rma.html b/docs/reference/print.regtest.rma.html
index e0f04e78..133545e6 100644
--- a/docs/reference/print.regtest.rma.html
+++ b/docs/reference/print.regtest.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/print.rma.html b/docs/reference/print.rma.html
index e99bc03c..33324481 100644
--- a/docs/reference/print.rma.html
+++ b/docs/reference/print.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/profile.rma.html b/docs/reference/profile.rma.html
index c7d39abb..409646b0 100644
--- a/docs/reference/profile.rma.html
+++ b/docs/reference/profile.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/qqnorm.rma.html b/docs/reference/qqnorm.rma.html
index 8d97501a..d49895d6 100644
--- a/docs/reference/qqnorm.rma.html
+++ b/docs/reference/qqnorm.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/radial.html b/docs/reference/radial.html
index dd42a89f..da674322 100644
--- a/docs/reference/radial.html
+++ b/docs/reference/radial.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/ranef.html b/docs/reference/ranef.html
index b37f3ba4..47ec31e6 100644
--- a/docs/reference/ranef.html
+++ b/docs/reference/ranef.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/ranktest.html b/docs/reference/ranktest.html
index 982bb84d..35cd0131 100644
--- a/docs/reference/ranktest.html
+++ b/docs/reference/ranktest.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/rcalc.html b/docs/reference/rcalc.html
index 215cb169..0f9f42b1 100644
--- a/docs/reference/rcalc.html
+++ b/docs/reference/rcalc.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/regplot.html b/docs/reference/regplot.html
index d9c59074..2228301a 100644
--- a/docs/reference/regplot.html
+++ b/docs/reference/regplot.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/regtest.html b/docs/reference/regtest.html
index 8433d74b..7d260909 100644
--- a/docs/reference/regtest.html
+++ b/docs/reference/regtest.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/replmiss.html b/docs/reference/replmiss.html
index a76bd824..c8462f6b 100644
--- a/docs/reference/replmiss.html
+++ b/docs/reference/replmiss.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/reporter.html b/docs/reference/reporter.html
index a72afd1e..192c8229 100644
--- a/docs/reference/reporter.html
+++ b/docs/reference/reporter.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
@@ -184,12 +184,12 @@ Examples
### generate report
reporter(res)
#>
-#> Directory for generating the report is: /tmp/Rtmp7CSGbi
+#> Directory for generating the report is: /tmp/RtmpFa2XLd
#> Copying references.bib and apa.csl to report directory ...
#> Saving model object to report_res.rdata ...
#> Creating report_res.rmd file ...
#> Rendering report_res.rmd file ...
-#> Generated /tmp/Rtmp7CSGbi/report_res.html ...
+#> Generated /tmp/RtmpFa2XLd/report_res.html ...
#> Opening report ...
diff --git a/docs/reference/residuals.rma.html b/docs/reference/residuals.rma.html
index 34c22530..0976dabe 100644
--- a/docs/reference/residuals.rma.html
+++ b/docs/reference/residuals.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/rma.glmm.html b/docs/reference/rma.glmm.html
index 86e8d512..c7abdb39 100644
--- a/docs/reference/rma.glmm.html
+++ b/docs/reference/rma.glmm.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/rma.mh.html b/docs/reference/rma.mh.html
index 3508d95f..ed9d8a3b 100644
--- a/docs/reference/rma.mh.html
+++ b/docs/reference/rma.mh.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/rma.mv.html b/docs/reference/rma.mv.html
index ef52d4f4..bc231a1d 100644
--- a/docs/reference/rma.mv.html
+++ b/docs/reference/rma.mv.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/rma.peto.html b/docs/reference/rma.peto.html
index d15e4573..eb538eb9 100644
--- a/docs/reference/rma.peto.html
+++ b/docs/reference/rma.peto.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/rma.uni.html b/docs/reference/rma.uni.html
index 82f39b7d..0369ef01 100644
--- a/docs/reference/rma.uni.html
+++ b/docs/reference/rma.uni.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/robust.html b/docs/reference/robust.html
index 0fc2fe52..2f00ce1c 100644
--- a/docs/reference/robust.html
+++ b/docs/reference/robust.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/se.html b/docs/reference/se.html
index 3455d171..85c0b4b8 100644
--- a/docs/reference/se.html
+++ b/docs/reference/se.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/selmodel.html b/docs/reference/selmodel.html
index 0ded13ac..e3a76d9a 100644
--- a/docs/reference/selmodel.html
+++ b/docs/reference/selmodel.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/simulate.rma.html b/docs/reference/simulate.rma.html
index db9808d6..7d861c9e 100644
--- a/docs/reference/simulate.rma.html
+++ b/docs/reference/simulate.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/tes.html b/docs/reference/tes.html
index e34b1772..7660a39f 100644
--- a/docs/reference/tes.html
+++ b/docs/reference/tes.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/to.long.html b/docs/reference/to.long.html
index 4db9cd55..86c11150 100644
--- a/docs/reference/to.long.html
+++ b/docs/reference/to.long.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/to.table.html b/docs/reference/to.table.html
index 5a4263fc..4f643281 100644
--- a/docs/reference/to.table.html
+++ b/docs/reference/to.table.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/to.wide.html b/docs/reference/to.wide.html
index 22bada4b..ff8b39ce 100644
--- a/docs/reference/to.wide.html
+++ b/docs/reference/to.wide.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/transf.html b/docs/reference/transf.html
index 3712622e..058e60cc 100644
--- a/docs/reference/transf.html
+++ b/docs/reference/transf.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
@@ -192,10 +192,10 @@ Details
transf.iabt
: inverse of the former.
transf.r2toz
: variance stabilizing transformation for the coefficient of determination, given by \(z_i = \frac{1}{2} \log\mathopen{}\left(\frac{1+\sqrt{R_i^2}}{1-\sqrt{R_i^2}}\right)\mathclose{}\) (see Olkin & Finn, 1995, but with the additional \(\frac{1}{2}\) factor for consistency with the usual r-to-z transformation).
transf.ztor2
: inverse of the former.
-transf.ztor.int
: integral transformation method for the z-to-r transformation.
-transf.exp.int
: integral transformation method for the exponential transformation.
-transf.ilogit.int
: integral transformation method for the inverse logit transformation.
-transf.ztor.mode
: function to determine the mode of a atanh-normal variable.
+transf.ztor.int
: integral transformation method for the z-to-r transformation. See ‘Note’.
+transf.exp.int
: integral transformation method for the exponential transformation. See ‘Note’.
+transf.ilogit.int
: integral transformation method for the inverse logit transformation. See ‘Note’.
+transf.ztor.mode
: function to determine the mode of an atanh-normal variable.
transf.exp.mode
: function to determine the mode of a log-normal variable.
transf.ilogit.mode
: function to determine the mode of a logit-normal variable.
transf.dtou1
: transformation of standardized mean differences to Cohen's \(U_1\) values (Cohen, 1988). Under the assumption that the data for those in the first (say, treated) and second (say, control) group are normally distributed with equal variances but potentially different means, Cohen's \(U_1\) indicates the proportion of non-overlap between the two distributions (i.e., when \(d=0\), then \(U_1\) is equal to 0, which goes to 1 as \(d\) increases).
@@ -227,7 +227,7 @@ Value
Note
-
The integral transformation method for a transformation function \(h(z)\) is given by \[\int_{\text{lower}}^{\text{upper}} h(z) f(z) dz\] using the limits targs$lower
and targs$upper
, where \(f(z)\) is the density of a normal distribution with mean equal to xi
and variance equal to targs$tau2
. An example is provided below.
+
The integral transformation method for a transformation function \(h(z)\) is given by \[\int_{\text{lower}}^{\text{upper}} h(z) f(z) dz\] using the limits targs$lower
and targs$upper
, where \(f(z)\) is the density of a normal distribution with mean equal to xi
and variance equal to targs$tau2
. By default, targs$lower
and targs$upper
are set to reasonable values and, if possible, targs$tau2
is extracted from the model object in functions where such transformation functions are typically applied (e.g., predict
). An example is provided below.
Author
@@ -285,7 +285,7 @@
Examples
#>
### this as well
-
predict(res, transf=transf.exp.int, targs=res$tau2)
+
predict(res, transf=transf.exp.int)
#>
#> pred ci.lb ci.ub pi.lb pi.ub
#> 0.5724 0.4024 0.8142 0.1809 1.8117
diff --git a/docs/reference/trimfill.html b/docs/reference/trimfill.html
index 53ff867b..cbca0947 100644
--- a/docs/reference/trimfill.html
+++ b/docs/reference/trimfill.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/update.rma.html b/docs/reference/update.rma.html
index 893f7f4f..66e92029 100644
--- a/docs/reference/update.rma.html
+++ b/docs/reference/update.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/vcalc.html b/docs/reference/vcalc.html
index bd3afd38..00a958f2 100644
--- a/docs/reference/vcalc.html
+++ b/docs/reference/vcalc.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/vcov.rma.html b/docs/reference/vcov.rma.html
index b64ba5ba..6a283d32 100644
--- a/docs/reference/vcov.rma.html
+++ b/docs/reference/vcov.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/vec2mat.html b/docs/reference/vec2mat.html
index 2f44e2c1..80a0bdc1 100644
--- a/docs/reference/vec2mat.html
+++ b/docs/reference/vec2mat.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/vif.html b/docs/reference/vif.html
index 68d333c7..530ad552 100644
--- a/docs/reference/vif.html
+++ b/docs/reference/vif.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/docs/reference/weights.rma.html b/docs/reference/weights.rma.html
index 7441b77a..c7159a6a 100644
--- a/docs/reference/weights.rma.html
+++ b/docs/reference/weights.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.7-54
+ 4.7-55
diff --git a/man/transf.Rd b/man/transf.Rd
index c79a6ce2..527a9279 100644
--- a/man/transf.Rd
+++ b/man/transf.Rd
@@ -130,10 +130,10 @@ transf.lnortortet.digby(xi)
\item \code{transf.iabt}: inverse of the former.
\item \code{transf.r2toz}: variance stabilizing transformation for the coefficient of determination, given by \mjeqn{z_i = \frac{1}{2} \log\mathopen{}\left(\frac{1+\sqrt{R_i^2}}{1-\sqrt{R_i^2}}\right)\mathclose{}}{z_i = 1/2 log((1+\sqrt(R_i^2))/(1-\sqrt(R_i^2)))} (see Olkin & Finn, 1995, but with the additional \mjeqn{\frac{1}{2}}{1/2} factor for consistency with the usual r-to-z transformation).
\item \code{transf.ztor2}: inverse of the former.
- \item \code{transf.ztor.int}: integral transformation method for the z-to-r transformation.
- \item \code{transf.exp.int}: integral transformation method for the exponential transformation.
- \item \code{transf.ilogit.int}: integral transformation method for the inverse logit transformation.
- \item \code{transf.ztor.mode}: function to determine the mode of a atanh-normal variable.
+ \item \code{transf.ztor.int}: integral transformation method for the z-to-r transformation. See \sQuote{Note}.
+ \item \code{transf.exp.int}: integral transformation method for the exponential transformation. See \sQuote{Note}.
+ \item \code{transf.ilogit.int}: integral transformation method for the inverse logit transformation. See \sQuote{Note}.
+ \item \code{transf.ztor.mode}: function to determine the mode of an atanh-normal variable.
\item \code{transf.exp.mode}: function to determine the mode of a log-normal variable.
\item \code{transf.ilogit.mode}: function to determine the mode of a logit-normal variable.
\item \code{transf.dtou1}: transformation of standardized mean differences to Cohen's \mjseqn{U_1} values (Cohen, 1988). Under the assumption that the data for those in the first (say, treated) and second (say, control) group are normally distributed with equal variances but potentially different means, Cohen's \mjseqn{U_1} indicates the proportion of non-overlap between the two distributions (i.e., when \mjseqn{d=0}, then \mjseqn{U_1} is equal to 0, which goes to 1 as \mjseqn{d} increases).
@@ -164,7 +164,7 @@ transf.lnortortet.digby(xi)
A vector with the transformed values.
}
\note{
- The integral transformation method for a transformation function \mjseqn{h(z)} is given by \mjsdeqn{\int_{\text{lower}}^{\text{upper}} h(z) f(z) dz} using the limits \code{targs$lower} and \code{targs$upper}, where \mjseqn{f(z)} is the density of a normal distribution with mean equal to \code{xi} and variance equal to \code{targs$tau2}. An example is provided below.
+ The integral transformation method for a transformation function \mjseqn{h(z)} is given by \mjsdeqn{\int_{\text{lower}}^{\text{upper}} h(z) f(z) dz} using the limits \code{targs$lower} and \code{targs$upper}, where \mjseqn{f(z)} is the density of a normal distribution with mean equal to \code{xi} and variance equal to \code{targs$tau2}. By default, \code{targs$lower} and \code{targs$upper} are set to reasonable values and, if possible, \code{targs$tau2} is extracted from the model object in functions where such transformation functions are typically applied (e.g., \code{\link[=predict.rma]{predict}}). An example is provided below.
}
\author{
Wolfgang Viechtbauer (\email{wvb@metafor-project.org}, \url{https://www.metafor-project.org}).
@@ -222,6 +222,6 @@ predict(res, transf=transf.exp.int, targs=list(tau2=res$tau2, lower=-4, upper=4)
predict(res, transf=transf.exp.int, targs=list(tau2=res$tau2))
### this as well
-predict(res, transf=transf.exp.int, targs=res$tau2)
+predict(res, transf=transf.exp.int)
}
\keyword{manip}