diff --git a/DESCRIPTION b/DESCRIPTION
index f394d3bec..50ebf36d7 100644
--- a/DESCRIPTION
+++ b/DESCRIPTION
@@ -1,5 +1,5 @@
Package: metafor
-Version: 4.5-1
+Version: 4.5-2
Date: 2023-10-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"))
diff --git a/NEWS.md b/NEWS.md
index 784a06cad..d86d7b0f3 100644
--- a/NEWS.md
+++ b/NEWS.md
@@ -1,4 +1,4 @@
-# metafor 4.5-1 (2023-10-22)
+# metafor 4.5-2 (2023-10-22)
- a few minor fixes to the dynamic theming of plots based on the foreground and background colors of the plotting device
diff --git a/R/addpoly.default.r b/R/addpoly.default.r
index b8835edd1..6e6e62ae6 100644
--- a/R/addpoly.default.r
+++ b/R/addpoly.default.r
@@ -151,7 +151,7 @@ transf, atransf, targs, efac, col, border, lty, fonts, cex, constarea=FALSE, ...
yi <- x
if (!missing(vi) && is.function(vi)) # if vi is utils::vi()
- stop(mstyle$stop("Cannot find variable specified for 'vi' argument."), call.=FALSE)
+ stop(mstyle$stop("Cannot find variable specified for 'vi' argument."))
if (hasArg(ci.lb) && hasArg(ci.ub)) {
diff --git a/R/forest.default.r b/R/forest.default.r
index 386a3a1bf..559e0ead6 100644
--- a/R/forest.default.r
+++ b/R/forest.default.r
@@ -222,7 +222,7 @@ lty, fonts, cex, cex.lab, cex.axis, ...) {
### extract data, study labels, and other arguments
if (!missing(vi) && is.function(vi)) # if vi is utils::vi()
- stop(mstyle$stop("Cannot find variable specified for 'vi' argument."), call.=FALSE)
+ stop(mstyle$stop("Cannot find variable specified for 'vi' argument."))
if (hasArg(ci.lb) && hasArg(ci.ub)) { # CI bounds are specified by user
if (length(ci.lb) != length(ci.ub))
diff --git a/R/fsn.r b/R/fsn.r
index 5567f4d86..6705f4209 100644
--- a/R/fsn.r
+++ b/R/fsn.r
@@ -358,7 +358,7 @@ fsn <- function(x, vi, sei, subset, data, type, alpha=.05, target,
tmp <- try(rma(yi, vi, method=method, tau2=tau2fix, test=test, weighted=weighted, verbose=verbose), silent=!verbose)
if (inherits(tmp, "try-error"))
- stop(mstyle$stop("Could not fit random-effects model (use verbose=TRUE for more info)."), call.=FALSE)
+ stop(mstyle$stop("Could not fit random-effects model (use verbose=TRUE for more info)."))
vt <- 1 / mean(1/vi)
est <- tmp$beta[1]
diff --git a/R/funnel.default.r b/R/funnel.default.r
index ee55fee98..1636a1fd9 100644
--- a/R/funnel.default.r
+++ b/R/funnel.default.r
@@ -70,7 +70,7 @@ label=FALSE, offset=0.4, legend=FALSE, ...) {
vi <- NULL
if (is.function(vi)) # if vi is utils::vi()
- stop(mstyle$stop("Cannot find variable specified for 'vi' argument."), call.=FALSE)
+ stop(mstyle$stop("Cannot find variable specified for 'vi' argument."))
if (missing(sei))
sei <- NULL
diff --git a/R/predict.rma.ls.r b/R/predict.rma.ls.r
index 7f42271ec..1b1dd4c70 100644
--- a/R/predict.rma.ls.r
+++ b/R/predict.rma.ls.r
@@ -85,10 +85,10 @@ level, digits, transf, targs, vcov=FALSE, ...) {
pos <- sapply(colnames(X.new), function(colname) {
d <- c(adist(colname, colnames.mod, costs=c(ins=1, sub=Inf, del=Inf))) # compute edit distances with Inf costs for substitutions/deletions
if (all(is.infinite(d))) # if there is no match, then all elements are Inf
- stop(mstyle$stop(paste0("Could not find variable '", colname, "' in the model.")), call. = FALSE)
+ stop(mstyle$stop(paste0("Could not find variable '", colname, "' in the model.")))
d <- which(d == min(d)) # don't use which.min() since that only finds the first minimum
if (length(d) > 1L) # if there is no unique match, then there is more than one minimum
- stop(mstyle$stop(paste0("Could not match up variable '", colname, "' uniquely to a variable in the model.")), call. = FALSE)
+ stop(mstyle$stop(paste0("Could not match up variable '", colname, "' uniquely to a variable in the model.")))
return(d)
})
if (anyDuplicated(pos)) { # if the same name is used more than once, then there will be duplicated pos values
@@ -153,10 +153,10 @@ level, digits, transf, targs, vcov=FALSE, ...) {
pos <- sapply(colnames(Z.new), function(colname) {
d <- c(adist(colname, colnames.mod, costs=c(ins=1, sub=Inf, del=Inf))) # compute edit distances with Inf costs for substitutions/deletions
if (all(is.infinite(d))) # if there is no match, then all elements are Inf
- stop(mstyle$stop(paste0("Could not find variable '", colname, "' from 'newscale' in the model.")), call. = FALSE)
+ stop(mstyle$stop(paste0("Could not find variable '", colname, "' from 'newscale' in the model.")))
d <- which(d == min(d)) # don't use which.min() since that only finds the first minimum
if (length(d) > 1L) # if there is no unique match, then there is more than one minimum
- stop(mstyle$stop(paste0("Could not match up variable '", colname, "' from 'newscale' uniquely to a variable in the model.")), call. = FALSE)
+ stop(mstyle$stop(paste0("Could not match up variable '", colname, "' from 'newscale' uniquely to a variable in the model.")))
return(d)
})
if (anyDuplicated(pos)) { # if the same name is used more than once, then there will be duplicated pos values
diff --git a/R/predict.rma.r b/R/predict.rma.r
index d21bc21aa..4bf9d54ee 100644
--- a/R/predict.rma.r
+++ b/R/predict.rma.r
@@ -163,10 +163,10 @@ level, digits, transf, targs, vcov=FALSE, ...) {
pos <- sapply(colnames(X.new), function(colname) {
d <- c(adist(colname, colnames.mod, costs=c(ins=1, sub=Inf, del=Inf))) # compute edit distances with Inf costs for substitutions/deletions
if (all(is.infinite(d))) # if there is no match, then all elements are Inf
- stop(mstyle$stop(paste0("Could not find variable '", colname, "' in the model.")), call. = FALSE)
+ stop(mstyle$stop(paste0("Could not find variable '", colname, "' in the model.")))
d <- which(d == min(d)) # don't use which.min() since that only finds the first minimum
if (length(d) > 1L) # if there is no unique match, then there is more than one minimum
- stop(mstyle$stop(paste0("Could not match up variable '", colname, "' uniquely to a variable in the model.")), call. = FALSE)
+ stop(mstyle$stop(paste0("Could not match up variable '", colname, "' uniquely to a variable in the model.")))
return(d)
})
if (anyDuplicated(pos)) { # if the same name is used more than once, then there will be duplicated pos values
diff --git a/R/profile.rma.mv.r b/R/profile.rma.mv.r
index 520bff7e1..24c7c75f2 100644
--- a/R/profile.rma.mv.r
+++ b/R/profile.rma.mv.r
@@ -49,7 +49,7 @@ profile.rma.mv <- function(fitted, sigma2, tau2, rho, gamma2, phi,
time.start <- proc.time()
if (!is.null(ddd$startmethod))
- warning(mstyle$warning("Argument 'startmethod' has been deprecated."))
+ warning(mstyle$warning("Argument 'startmethod' has been deprecated."), call.=FALSE)
#########################################################################
diff --git a/R/regplot.rma.r b/R/regplot.rma.r
index f55de3041..ff9146207 100644
--- a/R/regplot.rma.r
+++ b/R/regplot.rma.r
@@ -404,7 +404,7 @@ lcol, lwd, lty, legend=FALSE, xvals, ...) {
pred <- pred$pred
if (!is.null(label) && is.character(label) && label %in% c("ciout", "piout")) {
- warning(mstyle$stop("Cannot label points based on the confidence/prediction interval when passing an object to 'pred'."))
+ warning(mstyle$stop("Cannot label points based on the confidence/prediction interval when passing an object to 'pred'."), call.=FALSE)
label <- NULL
}
diff --git a/R/rma.mv.r b/R/rma.mv.r
index 42dae4de8..324465265 100644
--- a/R/rma.mv.r
+++ b/R/rma.mv.r
@@ -1034,7 +1034,7 @@ cvvc=FALSE, sparse=FALSE, verbose=FALSE, digits, control, ...) {
### check if there are levels in R which are not in s.levels (if yes, issue a warning)
if (any(!is.element(colnames(R[[j]]), s.levels[[j]])))
- warning(mstyle$warning(paste0("There are rows/columns in the 'R' matrix for '", s.names[j], "' for which there are no data.")))
+ warning(mstyle$warning(paste0("There are rows/columns in the 'R' matrix for '", s.names[j], "' for which there are no data.")), call.=FALSE)
}
@@ -1413,7 +1413,7 @@ cvvc=FALSE, sparse=FALSE, verbose=FALSE, digits, control, ...) {
if (Rscale=="cor" || Rscale=="cor0") {
R[Rfix] <- lapply(R[Rfix], function(x) {
if (any(diag(x) <= 0))
- stop(mstyle$stop("Cannot use Rscale=\"cor\" or Rscale=\"cor0\" with non-positive values on the diagonal of an 'R' matrix."), call.=FALSE)
+ stop(mstyle$stop("Cannot use Rscale=\"cor\" or Rscale=\"cor0\" with non-positive values on the diagonal of an 'R' matrix."))
tmp <- cov2cor(x)
if (any(abs(tmp) > 1))
warning(mstyle$warning("Some values are larger than +-1 in an 'R' matrix after cov2cor() (see 'Rscale' argument)."), call.=FALSE)
diff --git a/R/rma.uni.r b/R/rma.uni.r
index 760737456..26bd73bd6 100644
--- a/R/rma.uni.r
+++ b/R/rma.uni.r
@@ -1315,7 +1315,7 @@ test="z", level=95, btt, att, tau2, verbose=FALSE, digits, control, ...) {
stop(mstyle$stop("Iterative DL estimator did not converge."))
} else {
if (verbose)
- warning(mstyle$warning("Iterative DL estimator did not converge."))
+ warning(mstyle$warning("Iterative DL estimator did not converge."), call.=FALSE)
}
}
@@ -1379,7 +1379,7 @@ test="z", level=95, btt, att, tau2, verbose=FALSE, digits, control, ...) {
stop(mstyle$stop("Value of 'tau2.max' too low. Try increasing 'tau2.max' or switch to another 'method'."))
} else {
if (verbose)
- warning(mstyle$warning("Value of 'tau2.max' too low. Try increasing 'tau2.max' or switch to another 'method'."))
+ warning(mstyle$warning("Value of 'tau2.max' too low. Try increasing 'tau2.max' or switch to another 'method'."), call.=FALSE)
}
} else {
@@ -1389,10 +1389,10 @@ test="z", level=95, btt, att, tau2, verbose=FALSE, digits, control, ...) {
if (inherits(tau2, "try-error")) {
conv <- FALSE
if (length(method) == 1L) {
- stop(mstyle$stop("Error in iterative search for tau2 using uniroot()."))
+ stop(mstyle$stop("Error in iterative search for tau^2 using uniroot()."))
} else {
if (verbose)
- warning(mstyle$warning("Error in iterative search for tau2 using uniroot()."))
+ warning(mstyle$warning("Error in iterative search for tau^2 using uniroot()."), call.=FALSE)
}
}
@@ -1471,7 +1471,7 @@ test="z", level=95, btt, att, tau2, verbose=FALSE, digits, control, ...) {
stop(mstyle$stop("Iterative SJ estimator did not converge."))
} else {
if (verbose)
- warning(mstyle$warning("Iterative SJ estimator did not converge."))
+ warning(mstyle$warning("Iterative SJ estimator did not converge."), call.=FALSE)
}
}
@@ -1506,7 +1506,7 @@ test="z", level=95, btt, att, tau2, verbose=FALSE, digits, control, ...) {
stop(mstyle$stop("Value of 'tau2.max' too low. Try increasing 'tau2.max' or switch to another 'method'."))
} else {
if (verbose)
- warning(mstyle$warning("Value of 'tau2.max' too low. Try increasing 'tau2.max' or switch to another 'method'."))
+ warning(mstyle$warning("Value of 'tau2.max' too low. Try increasing 'tau2.max' or switch to another 'method'."), call.=FALSE)
}
} else {
@@ -1516,10 +1516,10 @@ test="z", level=95, btt, att, tau2, verbose=FALSE, digits, control, ...) {
if (inherits(tau2, "try-error")) {
conv <- FALSE
if (length(method) == 1L) {
- stop(mstyle$stop("Error in iterative search for tau2 using uniroot()."))
+ stop(mstyle$stop("Error in iterative search for tau^2 using uniroot()."))
} else {
if (verbose)
- warning(mstyle$warning("Error in iterative search for tau2 using uniroot()."))
+ warning(mstyle$warning("Error in iterative search for tau^2 using uniroot()."), call.=FALSE)
}
}
@@ -1600,7 +1600,7 @@ test="z", level=95, btt, att, tau2, verbose=FALSE, digits, control, ...) {
stop(mstyle$stop("Fisher scoring algorithm did not converge. See 'help(rma)' for possible remedies."))
} else {
if (verbose)
- warning(mstyle$warning("Fisher scoring algorithm did not converge. See 'help(rma)' for possible remedies."))
+ warning(mstyle$warning("Fisher scoring algorithm did not converge. See 'help(rma)' for possible remedies."), call.=FALSE)
}
}
diff --git a/R/robust.rma.mv.r b/R/robust.rma.mv.r
index e22e4e6da..06a828e94 100644
--- a/R/robust.rma.mv.r
+++ b/R/robust.rma.mv.r
@@ -120,7 +120,7 @@ robust.rma.mv <- function(x, cluster, adjust=TRUE, clubSandwich=FALSE, digits, .
cs.wald <- try(clubSandwich::Wald_test(x, cluster=cluster, vcov=vb, test=ddd$wald_test, constraints=clubSandwich::constrain_zero(x$btt)), silent=!isTRUE(ddd$verbose))
if (inherits(cs.wald, "try-error")) {
- warning(mstyle$warning("Could not obtain the cluster-robust omnibus Wald test (use verbose=TRUE for more details)."))
+ warning(mstyle$warning("Could not obtain the cluster-robust omnibus Wald test (use verbose=TRUE for more details)."), call.=FALSE)
cs.wald <- list(Fstat=NA_real_, df_num=NA_integer_, df_denom=NA_real_)
}
@@ -255,7 +255,7 @@ robust.rma.mv <- function(x, cluster, adjust=TRUE, clubSandwich=FALSE, digits, .
QM <- try(as.vector(t(beta)[x$btt] %*% chol2inv(chol(vb[x$btt,x$btt])) %*% beta[x$btt]), silent=TRUE)
if (inherits(QM, "try-error") || is.na(QM)) {
- warning(mstyle$warning("Could not obtain the cluster-robust omnibus Wald test."))
+ warning(mstyle$warning("Could not obtain the cluster-robust omnibus Wald test."), call.=FALSE)
QM <- NA_real_
}
diff --git a/R/robust.rma.uni.r b/R/robust.rma.uni.r
index d05990059..037a354c6 100644
--- a/R/robust.rma.uni.r
+++ b/R/robust.rma.uni.r
@@ -120,7 +120,7 @@ robust.rma.uni <- function(x, cluster, adjust=TRUE, clubSandwich=FALSE, digits,
cs.wald <- try(clubSandwich::Wald_test(x, cluster=cluster, vcov=vb, test=ddd$wald_test, constraints=clubSandwich::constrain_zero(x$btt)), silent=!isTRUE(ddd$verbose))
if (inherits(cs.wald, "try-error")) {
- warning(mstyle$warning("Could not obtain the cluster-robust omnibus Wald test (use verbose=TRUE for more details)."))
+ warning(mstyle$warning("Could not obtain the cluster-robust omnibus Wald test (use verbose=TRUE for more details)."), call.=FALSE)
cs.wald <- list(Fstat=NA_real_, df_num=NA_integer_, df_denom=NA_real_)
}
@@ -256,7 +256,7 @@ robust.rma.uni <- function(x, cluster, adjust=TRUE, clubSandwich=FALSE, digits,
QM <- try(as.vector(t(beta)[x$btt] %*% chol2inv(chol(vb[x$btt,x$btt])) %*% beta[x$btt]), silent=TRUE)
if (inherits(QM, "try-error") || is.na(QM)) {
- warning(mstyle$warning("Could not obtain the cluster-robust omnibus Wald test."))
+ warning(mstyle$warning("Could not obtain the cluster-robust omnibus Wald test."), call.=FALSE)
QM <- NA_real_
}
diff --git a/R/vif.rma.r b/R/vif.rma.r
index f0d17eddd..6639ac574 100644
--- a/R/vif.rma.r
+++ b/R/vif.rma.r
@@ -220,7 +220,7 @@ vif.rma <- function(x, btt, att, table=FALSE, reestimate=FALSE, sim=FALSE, progb
sim.loc <- 0
if (sim >= 2 && any(x$coef.na)) {
- warning(mstyle$warning("Cannot use 'sim' when some redundant predictors were dropped from the model."))
+ warning(mstyle$warning("Cannot use 'sim' when some redundant predictors were dropped from the model."), call.=FALSE)
sim.loc <- 0
}
@@ -341,7 +341,7 @@ vif.rma <- function(x, btt, att, table=FALSE, reestimate=FALSE, sim=FALSE, progb
sim.scale <- 0
if (sim >= 2 && any(x$coef.na.Z)) {
- warning(mstyle$warning("Cannot use 'sim' when some redundant predictors were dropped from the model."))
+ warning(mstyle$warning("Cannot use 'sim' when some redundant predictors were dropped from the model."), call.=FALSE)
sim.scale <- 0
}
diff --git a/R/zzz.r b/R/zzz.r
index 1e4da2829..a25d5a838 100644
--- a/R/zzz.r
+++ b/R/zzz.r
@@ -1,6 +1,6 @@
.onAttach <- function(libname, pkgname) {
- ver <- "4.5-1"
+ ver <- "4.5-2"
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 e5629b7be..5d38ce84e 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.5--1-brightgreen.svg)](https://www.metafor-project.org/doku.php/installation#development_version)
+[![devel Version](https://img.shields.io/badge/devel-4.5--2-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 7279937d1..74898e69d 100644
--- a/docs/404.html
+++ b/docs/404.html
@@ -54,7 +54,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/ISSUE_TEMPLATE.html b/docs/ISSUE_TEMPLATE.html
index 2a4b15791..ec20fa952 100644
--- a/docs/ISSUE_TEMPLATE.html
+++ b/docs/ISSUE_TEMPLATE.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/articles/index.html b/docs/articles/index.html
index c14cb0501..665118d01 100644
--- a/docs/articles/index.html
+++ b/docs/articles/index.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/articles/pkgdown/diagram.html b/docs/articles/pkgdown/diagram.html
index 15fd3f47d..9a250d247 100644
--- a/docs/articles/pkgdown/diagram.html
+++ b/docs/articles/pkgdown/diagram.html
@@ -55,7 +55,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/authors.html b/docs/authors.html
index 59281119b..df0b63877 100644
--- a/docs/authors.html
+++ b/docs/authors.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/index.html b/docs/index.html
index d71f96e7e..8a51cf07c 100644
--- a/docs/index.html
+++ b/docs/index.html
@@ -55,7 +55,7 @@
metafor
- 4.5-1
+ 4.5-2
@@ -127,7 +127,7 @@
-
+
- a few minor fixes to the dynamic theming of plots based on the foreground and background colors of the plotting device
diff --git a/docs/pkgdown.yml b/docs/pkgdown.yml
index c80a393e1..f7c4087e3 100644
--- a/docs/pkgdown.yml
+++ b/docs/pkgdown.yml
@@ -3,7 +3,7 @@ pkgdown: 2.0.7
pkgdown_sha: ~
articles:
diagram: pkgdown/diagram.html
-last_built: 2023-10-22T14:05Z
+last_built: 2023-10-22T17:46Z
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 a51d09001..2bf8e26cb 100644
--- a/docs/reference/addpoly.default.html
+++ b/docs/reference/addpoly.default.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/addpoly.html b/docs/reference/addpoly.html
index 3f279aa07..fd0db654d 100644
--- a/docs/reference/addpoly.html
+++ b/docs/reference/addpoly.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/addpoly.predict.rma.html b/docs/reference/addpoly.predict.rma.html
index b86de376f..18819d2fb 100644
--- a/docs/reference/addpoly.predict.rma.html
+++ b/docs/reference/addpoly.predict.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/addpoly.rma.html b/docs/reference/addpoly.rma.html
index 523669e24..039cd95fe 100644
--- a/docs/reference/addpoly.rma.html
+++ b/docs/reference/addpoly.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/aggregate.escalc.html b/docs/reference/aggregate.escalc.html
index b0c12460b..eb0804cae 100644
--- a/docs/reference/aggregate.escalc.html
+++ b/docs/reference/aggregate.escalc.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/anova.rma.html b/docs/reference/anova.rma.html
index 965aa4f61..8c908bc88 100644
--- a/docs/reference/anova.rma.html
+++ b/docs/reference/anova.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/baujat.html b/docs/reference/baujat.html
index eda12bfff..92272aa7f 100644
--- a/docs/reference/baujat.html
+++ b/docs/reference/baujat.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/bldiag.html b/docs/reference/bldiag.html
index a16746f4f..754cb047b 100644
--- a/docs/reference/bldiag.html
+++ b/docs/reference/bldiag.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/blsplit.html b/docs/reference/blsplit.html
index cbfaa9f57..77d78b810 100644
--- a/docs/reference/blsplit.html
+++ b/docs/reference/blsplit.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/blup.html b/docs/reference/blup.html
index 4c967e3ef..846701a9c 100644
--- a/docs/reference/blup.html
+++ b/docs/reference/blup.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/coef.permutest.rma.uni.html b/docs/reference/coef.permutest.rma.uni.html
index 1a541c5a5..bd2195de6 100644
--- a/docs/reference/coef.permutest.rma.uni.html
+++ b/docs/reference/coef.permutest.rma.uni.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/coef.rma.html b/docs/reference/coef.rma.html
index 0c71e76df..330f08517 100644
--- a/docs/reference/coef.rma.html
+++ b/docs/reference/coef.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/confint.rma.html b/docs/reference/confint.rma.html
index 1d33af8d0..ced5d1704 100644
--- a/docs/reference/confint.rma.html
+++ b/docs/reference/confint.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/contrmat.html b/docs/reference/contrmat.html
index e5f065325..0b8054c2c 100644
--- a/docs/reference/contrmat.html
+++ b/docs/reference/contrmat.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/conv.2x2.html b/docs/reference/conv.2x2.html
index a8a93101e..bf09be18b 100644
--- a/docs/reference/conv.2x2.html
+++ b/docs/reference/conv.2x2.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/conv.delta.html b/docs/reference/conv.delta.html
index c26407b7c..421d645c5 100644
--- a/docs/reference/conv.delta.html
+++ b/docs/reference/conv.delta.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/conv.fivenum.html b/docs/reference/conv.fivenum.html
index cf70252d9..25bcb4e2f 100644
--- a/docs/reference/conv.fivenum.html
+++ b/docs/reference/conv.fivenum.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/conv.wald.html b/docs/reference/conv.wald.html
index 9fd2c3206..b24733dec 100644
--- a/docs/reference/conv.wald.html
+++ b/docs/reference/conv.wald.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/cumul.html b/docs/reference/cumul.html
index 1312ed28a..7e2eab2a8 100644
--- a/docs/reference/cumul.html
+++ b/docs/reference/cumul.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/dfround.html b/docs/reference/dfround.html
index faed38ed8..20ac1fd49 100644
--- a/docs/reference/dfround.html
+++ b/docs/reference/dfround.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/emmprep.html b/docs/reference/emmprep.html
index d6d76aeb5..de16b7533 100644
--- a/docs/reference/emmprep.html
+++ b/docs/reference/emmprep.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/escalc.html b/docs/reference/escalc.html
index c2d942dee..d928a9983 100644
--- a/docs/reference/escalc.html
+++ b/docs/reference/escalc.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/fitstats.html b/docs/reference/fitstats.html
index 2bf23e3d6..f454e7df0 100644
--- a/docs/reference/fitstats.html
+++ b/docs/reference/fitstats.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/fitted.rma.html b/docs/reference/fitted.rma.html
index ef2e5022a..2d3108090 100644
--- a/docs/reference/fitted.rma.html
+++ b/docs/reference/fitted.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/forest.cumul.rma.html b/docs/reference/forest.cumul.rma.html
index 993088ea6..7bab2c354 100644
--- a/docs/reference/forest.cumul.rma.html
+++ b/docs/reference/forest.cumul.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/forest.default.html b/docs/reference/forest.default.html
index e11bad632..cb4021236 100644
--- a/docs/reference/forest.default.html
+++ b/docs/reference/forest.default.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/forest.html b/docs/reference/forest.html
index f4931c0b5..5f11569fe 100644
--- a/docs/reference/forest.html
+++ b/docs/reference/forest.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/forest.rma.html b/docs/reference/forest.rma.html
index 1a04bf090..7d6abe6e4 100644
--- a/docs/reference/forest.rma.html
+++ b/docs/reference/forest.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/formatters.html b/docs/reference/formatters.html
index fa1c9830d..429d120d4 100644
--- a/docs/reference/formatters.html
+++ b/docs/reference/formatters.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/formula.rma.html b/docs/reference/formula.rma.html
index 615aa0758..680a9a404 100644
--- a/docs/reference/formula.rma.html
+++ b/docs/reference/formula.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
@@ -149,13 +149,13 @@ Examples
res <- rma(yi, vi, mods = ~ ablat + alloc, data=dat)
formula(res, type="mods")
#> ~ablat + alloc
-#> <environment: 0x55b2c4df2a90>
+#> <environment: 0x555b3a840af0>
### specify moderators via 'yi' argument
res <- rma(yi ~ ablat + alloc, vi, data=dat)
formula(res, type="yi")
#> yi ~ ablat + alloc
-#> <environment: 0x55b2bedd38b8>
+#> <environment: 0x555b39163dc0>
diff --git a/docs/reference/fsn.html b/docs/reference/fsn.html
index 7636945fa..a87fb9835 100644
--- a/docs/reference/fsn.html
+++ b/docs/reference/fsn.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/funnel.html b/docs/reference/funnel.html
index 23d094bc7..0a2cfd573 100644
--- a/docs/reference/funnel.html
+++ b/docs/reference/funnel.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/gosh.html b/docs/reference/gosh.html
index 5ab0b4f94..970cda0ca 100644
--- a/docs/reference/gosh.html
+++ b/docs/reference/gosh.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/hc.html b/docs/reference/hc.html
index fe99f473f..2c5670038 100644
--- a/docs/reference/hc.html
+++ b/docs/reference/hc.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/index.html b/docs/reference/index.html
index f280a0188..ce26387a5 100644
--- a/docs/reference/index.html
+++ b/docs/reference/index.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/influence.rma.mv.html b/docs/reference/influence.rma.mv.html
index 1bab7184d..e04b754b6 100644
--- a/docs/reference/influence.rma.mv.html
+++ b/docs/reference/influence.rma.mv.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/influence.rma.uni.html b/docs/reference/influence.rma.uni.html
index a3f80bb1d..88e5dd12e 100644
--- a/docs/reference/influence.rma.uni.html
+++ b/docs/reference/influence.rma.uni.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/labbe.html b/docs/reference/labbe.html
index 0ef29fd39..dc2c21071 100644
--- a/docs/reference/labbe.html
+++ b/docs/reference/labbe.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/leave1out.html b/docs/reference/leave1out.html
index 9b85de301..cb338b64b 100644
--- a/docs/reference/leave1out.html
+++ b/docs/reference/leave1out.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/llplot.html b/docs/reference/llplot.html
index bc19e95e2..23ddc9794 100644
--- a/docs/reference/llplot.html
+++ b/docs/reference/llplot.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/matreg.html b/docs/reference/matreg.html
index 2d6628c00..5f716be5d 100644
--- a/docs/reference/matreg.html
+++ b/docs/reference/matreg.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/metafor-package.html b/docs/reference/metafor-package.html
index 6d4e6a6f8..40db531c8 100644
--- a/docs/reference/metafor-package.html
+++ b/docs/reference/metafor-package.html
@@ -31,7 +31,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/metafor.news.html b/docs/reference/metafor.news.html
index 7f58aa614..269db968e 100644
--- a/docs/reference/metafor.news.html
+++ b/docs/reference/metafor.news.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
@@ -121,7 +121,7 @@ References
Examples
# \dontrun{
metafor.news()
-#> Changes in version 4.5-1 (2023-10-22)
+#> Changes in version 4.5-2 (2023-10-22)
#>
#> - a few minor fixes to the dynamic theming of plots based on the
#> foreground and background colors of the plotting device
diff --git a/docs/reference/methods.anova.rma.html b/docs/reference/methods.anova.rma.html
index b517fca8c..c56039ae7 100644
--- a/docs/reference/methods.anova.rma.html
+++ b/docs/reference/methods.anova.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/methods.confint.rma.html b/docs/reference/methods.confint.rma.html
index 7e782fda5..36353f847 100644
--- a/docs/reference/methods.confint.rma.html
+++ b/docs/reference/methods.confint.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/methods.escalc.html b/docs/reference/methods.escalc.html
index eb89d0587..3201e49ae 100644
--- a/docs/reference/methods.escalc.html
+++ b/docs/reference/methods.escalc.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/methods.list.rma.html b/docs/reference/methods.list.rma.html
index 956ffca4b..e898659fa 100644
--- a/docs/reference/methods.list.rma.html
+++ b/docs/reference/methods.list.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/methods.matreg.html b/docs/reference/methods.matreg.html
index a591e3371..06cf55c2d 100644
--- a/docs/reference/methods.matreg.html
+++ b/docs/reference/methods.matreg.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/methods.vif.rma.html b/docs/reference/methods.vif.rma.html
index 590184703..7c1da0123 100644
--- a/docs/reference/methods.vif.rma.html
+++ b/docs/reference/methods.vif.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/mfopt.html b/docs/reference/mfopt.html
index 8204aac1a..a4b4bfbf2 100644
--- a/docs/reference/mfopt.html
+++ b/docs/reference/mfopt.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/misc-models.html b/docs/reference/misc-models.html
index bb461efe8..d460582c5 100644
--- a/docs/reference/misc-models.html
+++ b/docs/reference/misc-models.html
@@ -31,7 +31,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/misc-options.html b/docs/reference/misc-options.html
index cf28ad78a..1fd050d2c 100644
--- a/docs/reference/misc-options.html
+++ b/docs/reference/misc-options.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/misc-recs.html b/docs/reference/misc-recs.html
index 59eb1973c..d29dab35f 100644
--- a/docs/reference/misc-recs.html
+++ b/docs/reference/misc-recs.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/model.matrix.rma.html b/docs/reference/model.matrix.rma.html
index 000f07183..baa3cf918 100644
--- a/docs/reference/model.matrix.rma.html
+++ b/docs/reference/model.matrix.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/permutest.html b/docs/reference/permutest.html
index 3c4e1c57d..334d6115f 100644
--- a/docs/reference/permutest.html
+++ b/docs/reference/permutest.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/plot.cumul.rma.html b/docs/reference/plot.cumul.rma.html
index 8f5de593c..118b390e9 100644
--- a/docs/reference/plot.cumul.rma.html
+++ b/docs/reference/plot.cumul.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/plot.gosh.rma.html b/docs/reference/plot.gosh.rma.html
index 70c7a877d..f2091a351 100644
--- a/docs/reference/plot.gosh.rma.html
+++ b/docs/reference/plot.gosh.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/plot.infl.rma.uni.html b/docs/reference/plot.infl.rma.uni.html
index d4fd29e32..2150940be 100644
--- a/docs/reference/plot.infl.rma.uni.html
+++ b/docs/reference/plot.infl.rma.uni.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/plot.permutest.rma.uni.html b/docs/reference/plot.permutest.rma.uni.html
index f7fff24a4..078941ead 100644
--- a/docs/reference/plot.permutest.rma.uni.html
+++ b/docs/reference/plot.permutest.rma.uni.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/plot.rma.html b/docs/reference/plot.rma.html
index 4d9f63ba6..5788075e3 100644
--- a/docs/reference/plot.rma.html
+++ b/docs/reference/plot.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/plot.rma.uni.selmodel.html b/docs/reference/plot.rma.uni.selmodel.html
index 6ecd55450..cced84407 100644
--- a/docs/reference/plot.rma.uni.selmodel.html
+++ b/docs/reference/plot.rma.uni.selmodel.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/plot.vif.rma.html b/docs/reference/plot.vif.rma.html
index aa2f686e9..dd4207c82 100644
--- a/docs/reference/plot.vif.rma.html
+++ b/docs/reference/plot.vif.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/predict.rma.html b/docs/reference/predict.rma.html
index d002074cd..6d0c4f357 100644
--- a/docs/reference/predict.rma.html
+++ b/docs/reference/predict.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/print.anova.rma.html b/docs/reference/print.anova.rma.html
index 008b8bb33..2aaa9fe62 100644
--- a/docs/reference/print.anova.rma.html
+++ b/docs/reference/print.anova.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/print.confint.rma.html b/docs/reference/print.confint.rma.html
index 52cb04ddc..3d3168163 100644
--- a/docs/reference/print.confint.rma.html
+++ b/docs/reference/print.confint.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/print.escalc.html b/docs/reference/print.escalc.html
index 18dd2de30..1e9a2a42e 100644
--- a/docs/reference/print.escalc.html
+++ b/docs/reference/print.escalc.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/print.fsn.html b/docs/reference/print.fsn.html
index 3274588ce..6703479e8 100644
--- a/docs/reference/print.fsn.html
+++ b/docs/reference/print.fsn.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/print.gosh.rma.html b/docs/reference/print.gosh.rma.html
index c193b4277..d735d1c4d 100644
--- a/docs/reference/print.gosh.rma.html
+++ b/docs/reference/print.gosh.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/print.hc.rma.uni.html b/docs/reference/print.hc.rma.uni.html
index 61056f8d4..0e7bdf4c6 100644
--- a/docs/reference/print.hc.rma.uni.html
+++ b/docs/reference/print.hc.rma.uni.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/print.list.rma.html b/docs/reference/print.list.rma.html
index 14d65b551..f73d62a5b 100644
--- a/docs/reference/print.list.rma.html
+++ b/docs/reference/print.list.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/print.matreg.html b/docs/reference/print.matreg.html
index a712886d7..140d4a3f7 100644
--- a/docs/reference/print.matreg.html
+++ b/docs/reference/print.matreg.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/print.permutest.rma.uni.html b/docs/reference/print.permutest.rma.uni.html
index 335452efb..d88990ede 100644
--- a/docs/reference/print.permutest.rma.uni.html
+++ b/docs/reference/print.permutest.rma.uni.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/print.ranktest.rma.html b/docs/reference/print.ranktest.rma.html
index d3b4a07ea..4155c00c8 100644
--- a/docs/reference/print.ranktest.rma.html
+++ b/docs/reference/print.ranktest.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/print.regtest.rma.html b/docs/reference/print.regtest.rma.html
index 9fc37332c..1eb76bbe3 100644
--- a/docs/reference/print.regtest.rma.html
+++ b/docs/reference/print.regtest.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/print.rma.html b/docs/reference/print.rma.html
index b456bd3af..8fae36fc3 100644
--- a/docs/reference/print.rma.html
+++ b/docs/reference/print.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/profile.rma.html b/docs/reference/profile.rma.html
index c60685376..7df0ef7eb 100644
--- a/docs/reference/profile.rma.html
+++ b/docs/reference/profile.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/qqnorm.rma.html b/docs/reference/qqnorm.rma.html
index da807d6c3..a0b3f892c 100644
--- a/docs/reference/qqnorm.rma.html
+++ b/docs/reference/qqnorm.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/radial.html b/docs/reference/radial.html
index f8e49026f..66d93145e 100644
--- a/docs/reference/radial.html
+++ b/docs/reference/radial.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/ranef.html b/docs/reference/ranef.html
index 192ffd26c..efec39d64 100644
--- a/docs/reference/ranef.html
+++ b/docs/reference/ranef.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/ranktest.html b/docs/reference/ranktest.html
index c8651bd8b..445f57c0a 100644
--- a/docs/reference/ranktest.html
+++ b/docs/reference/ranktest.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/rcalc.html b/docs/reference/rcalc.html
index 720d85d67..3448e5363 100644
--- a/docs/reference/rcalc.html
+++ b/docs/reference/rcalc.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/regplot.html b/docs/reference/regplot.html
index 013713195..9a16f3728 100644
--- a/docs/reference/regplot.html
+++ b/docs/reference/regplot.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/regtest.html b/docs/reference/regtest.html
index 52f1bfc1a..5b5cf23cb 100644
--- a/docs/reference/regtest.html
+++ b/docs/reference/regtest.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/replmiss.html b/docs/reference/replmiss.html
index af263a9f7..0f744462d 100644
--- a/docs/reference/replmiss.html
+++ b/docs/reference/replmiss.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/reporter.html b/docs/reference/reporter.html
index da5f47116..2e21165c9 100644
--- a/docs/reference/reporter.html
+++ b/docs/reference/reporter.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
@@ -191,12 +191,12 @@ Examples
### generate report
reporter(res)
#>
-#> Directory for generating the report is: /tmp/RtmpChMzyL
+#> Directory for generating the report is: /tmp/RtmpUbMOwz
#> 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/RtmpChMzyL/report_res.html ...
+#> Generated /tmp/RtmpUbMOwz/report_res.html ...
#> Opening report ...
diff --git a/docs/reference/residuals.rma.html b/docs/reference/residuals.rma.html
index 0b392e11b..99d466dde 100644
--- a/docs/reference/residuals.rma.html
+++ b/docs/reference/residuals.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/rma.glmm.html b/docs/reference/rma.glmm.html
index 7d320db1b..ae4faff61 100644
--- a/docs/reference/rma.glmm.html
+++ b/docs/reference/rma.glmm.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/rma.mh.html b/docs/reference/rma.mh.html
index aba904e87..00389c5e0 100644
--- a/docs/reference/rma.mh.html
+++ b/docs/reference/rma.mh.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/rma.mv.html b/docs/reference/rma.mv.html
index 9af4ba23f..5f13c2570 100644
--- a/docs/reference/rma.mv.html
+++ b/docs/reference/rma.mv.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/rma.peto.html b/docs/reference/rma.peto.html
index ccb9de100..c9d9c258c 100644
--- a/docs/reference/rma.peto.html
+++ b/docs/reference/rma.peto.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/rma.uni.html b/docs/reference/rma.uni.html
index 7a273c032..71a540cf4 100644
--- a/docs/reference/rma.uni.html
+++ b/docs/reference/rma.uni.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/robust.html b/docs/reference/robust.html
index 9195f4275..601c7cd00 100644
--- a/docs/reference/robust.html
+++ b/docs/reference/robust.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/selmodel.html b/docs/reference/selmodel.html
index 212a316ce..c5e48b453 100644
--- a/docs/reference/selmodel.html
+++ b/docs/reference/selmodel.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/simulate.rma.html b/docs/reference/simulate.rma.html
index b9749f865..dcfb3f2e6 100644
--- a/docs/reference/simulate.rma.html
+++ b/docs/reference/simulate.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/tes.html b/docs/reference/tes.html
index c7a84ee22..264b08e0e 100644
--- a/docs/reference/tes.html
+++ b/docs/reference/tes.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/to.long.html b/docs/reference/to.long.html
index e77a71392..a7dd9cbec 100644
--- a/docs/reference/to.long.html
+++ b/docs/reference/to.long.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/to.table.html b/docs/reference/to.table.html
index 20497e6b3..c56b8181b 100644
--- a/docs/reference/to.table.html
+++ b/docs/reference/to.table.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/to.wide.html b/docs/reference/to.wide.html
index 7f3a46435..082900726 100644
--- a/docs/reference/to.wide.html
+++ b/docs/reference/to.wide.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/transf.html b/docs/reference/transf.html
index e906fbfa8..7426e3c5c 100644
--- a/docs/reference/transf.html
+++ b/docs/reference/transf.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/trimfill.html b/docs/reference/trimfill.html
index 7f7b685c5..b445b8ed2 100644
--- a/docs/reference/trimfill.html
+++ b/docs/reference/trimfill.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/update.rma.html b/docs/reference/update.rma.html
index 631b285d0..e3cf1620e 100644
--- a/docs/reference/update.rma.html
+++ b/docs/reference/update.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/vcalc.html b/docs/reference/vcalc.html
index 2d0000486..c047a767b 100644
--- a/docs/reference/vcalc.html
+++ b/docs/reference/vcalc.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/vcov.rma.html b/docs/reference/vcov.rma.html
index 1d62db5b2..7378869ad 100644
--- a/docs/reference/vcov.rma.html
+++ b/docs/reference/vcov.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/vec2mat.html b/docs/reference/vec2mat.html
index e0460a743..320a5e926 100644
--- a/docs/reference/vec2mat.html
+++ b/docs/reference/vec2mat.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/vif.html b/docs/reference/vif.html
index fc19b9154..4262bb940 100644
--- a/docs/reference/vif.html
+++ b/docs/reference/vif.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2
diff --git a/docs/reference/weights.rma.html b/docs/reference/weights.rma.html
index 136f875a7..70ab0fed9 100644
--- a/docs/reference/weights.rma.html
+++ b/docs/reference/weights.rma.html
@@ -29,7 +29,7 @@
metafor
- 4.5-1
+ 4.5-2