Skip to content

Commit

Permalink
dontrun -> donttest
Browse files Browse the repository at this point in the history
  • Loading branch information
IndrajeetPatil committed Sep 19, 2023
1 parent 42d2322 commit 9ae24b1
Show file tree
Hide file tree
Showing 65 changed files with 68 additions and 68 deletions.
2 changes: 1 addition & 1 deletion R/bayesfactor.R
Original file line number Diff line number Diff line change
Expand Up @@ -30,7 +30,7 @@
#'
#' bayesfactor(posterior, prior = prior, verbose = FALSE)
#' }
#' \dontrun{
#' \donttest{
#' # rstanarm models
#' # ---------------
#' if (require("rstanarm")) {
Expand Down
2 changes: 1 addition & 1 deletion R/bayesfactor_inclusion.R
Original file line number Diff line number Diff line change
Expand Up @@ -52,7 +52,7 @@
#'
#' as.numeric(bf_inc)
#'
#' \dontrun{
#' \donttest{
#' # BayesFactor
#' # -------------------------------
#' library(BayesFactor)
Expand Down
2 changes: 1 addition & 1 deletion R/bayesfactor_models.R
Original file line number Diff line number Diff line change
Expand Up @@ -76,7 +76,7 @@
#' # Set check_response = TRUE for transformed responses
#' bayesfactor_models(lm2b, denominator = lm2, check_response = TRUE)
#'
#' \dontrun{
#' \donttest{
#' # With lmerMod objects:
#' # ---------------------
#' if (require("lme4")) {
Expand Down
2 changes: 1 addition & 1 deletion R/bayesfactor_parameters.R
Original file line number Diff line number Diff line change
Expand Up @@ -122,7 +122,7 @@
#'
#' as.numeric(BF_pars)
#' }
#' \dontrun{
#' \donttest{
#' # rstanarm models
#' # ---------------
#' if (require("rstanarm") && require("emmeans") && require("logspline")) {
Expand Down
4 changes: 2 additions & 2 deletions R/bayesfactor_restricted.R
Original file line number Diff line number Diff line change
Expand Up @@ -70,7 +70,7 @@
#' )
#'
#' @examplesIf require("rstanarm")
#' \dontrun{
#' \donttest{
#' # rstanarm models
#' # ---------------
#' data("mtcars")
Expand All @@ -88,7 +88,7 @@
#' }
#'
#' @examplesIf require("rstanarm") && require("emmeans")
#' \dontrun{
#' \donttest{
#' # emmGrid objects
#' # ---------------
#' # replicating http://bayesfactor.blogspot.com/2015/01/multiple-comparisons-with-bayesfactor-2.html
Expand Down
2 changes: 1 addition & 1 deletion R/check_prior.R
Original file line number Diff line number Diff line change
Expand Up @@ -21,7 +21,7 @@
#' determined).
#'
#' @examples
#' \dontrun{
#' \donttest{
#' library(bayestestR)
#' if (require("rstanarm")) {
#' model <- stan_glm(mpg ~ wt + am, data = mtcars, chains = 1, refresh = 0)
Expand Down
2 changes: 1 addition & 1 deletion R/convert_bayesian_to_frequentist.R
Original file line number Diff line number Diff line change
Expand Up @@ -20,7 +20,7 @@
#' }
#' }
#'
#' \dontrun{
#' \donttest{
#' if (require("rstanarm")) {
#' model <- stan_glm(vs ~ mpg,
#' family = "binomial",
Expand Down
2 changes: 1 addition & 1 deletion R/describe_posterior.R
Original file line number Diff line number Diff line change
Expand Up @@ -79,7 +79,7 @@
#' describe_posterior(df, keep_iterations = TRUE, verbose = FALSE)
#' ))
#' }
#' \dontrun{
#' \donttest{
#' # rstanarm models
#' # -----------------------------------------------
#' if (require("rstanarm") && require("emmeans")) {
Expand Down
2 changes: 1 addition & 1 deletion R/describe_prior.R
Original file line number Diff line number Diff line change
Expand Up @@ -7,7 +7,7 @@
#' @inheritParams describe_posterior
#'
#' @examples
#' \dontrun{
#' \donttest{
#' library(bayestestR)
#'
#' # rstanarm models
Expand Down
2 changes: 1 addition & 1 deletion R/diagnostic_draws.R
Original file line number Diff line number Diff line change
Expand Up @@ -4,7 +4,7 @@
#' @inheritParams diagnostic_posterior
#'
#' @examples
#' \dontrun{
#' \donttest{
#' set.seed(333)
#'
#' if (require("brms", quietly = TRUE)) {
Expand Down
2 changes: 1 addition & 1 deletion R/diagnostic_posterior.R
Original file line number Diff line number Diff line change
Expand Up @@ -28,7 +28,7 @@
#'
#'
#' @examples
#' \dontrun{
#' \donttest{
#' # rstanarm models
#' # -----------------------------------------------
#' if (require("rstanarm", quietly = TRUE)) {
Expand Down
2 changes: 1 addition & 1 deletion R/effective_sample.R
Original file line number Diff line number Diff line change
Expand Up @@ -16,7 +16,7 @@
#' }
#'
#' @examples
#' \dontrun{
#' \donttest{
#' library(rstanarm)
#' model <- suppressWarnings(
#' stan_glm(mpg ~ wt + gear, data = mtcars, chains = 2, iter = 200, refresh = 0)
Expand Down
2 changes: 1 addition & 1 deletion R/equivalence_test.R
Original file line number Diff line number Diff line change
Expand Up @@ -79,7 +79,7 @@
#' # print more digits
#' test <- equivalence_test(x = rnorm(1000, 1, 1), ci = c(.50, .99))
#' print(test, digits = 4)
#' \dontrun{
#' \donttest{
#' library(rstanarm)
#' model <- rstanarm::stan_glm(mpg ~ wt + cyl, data = mtcars)
#' equivalence_test(model)
Expand Down
2 changes: 1 addition & 1 deletion R/estimate_density.R
Original file line number Diff line number Diff line change
Expand Up @@ -72,7 +72,7 @@
#' # Grouped data
#' head(estimate_density(iris, at = "Species"))
#' head(estimate_density(iris$Petal.Width, at = iris$Species))
#' \dontrun{
#' \donttest{
#' # rstanarm models
#' # -----------------------------------------------
#' library(rstanarm)
Expand Down
2 changes: 1 addition & 1 deletion R/eti.R
Original file line number Diff line number Diff line change
Expand Up @@ -22,7 +22,7 @@
#' df <- data.frame(replicate(4, rnorm(100)))
#' eti(df)
#' eti(df, ci = c(0.80, 0.89, 0.95))
#' \dontrun{
#' \donttest{
#' library(rstanarm)
#' model <- suppressWarnings(
#' stan_glm(mpg ~ wt + gear, data = mtcars, chains = 2, iter = 200, refresh = 0)
Expand Down
2 changes: 1 addition & 1 deletion R/hdi.R
Original file line number Diff line number Diff line change
Expand Up @@ -89,7 +89,7 @@
#'
#' bayestestR::hdi(iris[1:4])
#' bayestestR::hdi(iris[1:4], ci = c(0.80, 0.90, 0.95))
#' \dontrun{
#' \donttest{
#' library(rstanarm)
#' model <- suppressWarnings(
#' stan_glm(mpg ~ wt + gear, data = mtcars, chains = 2, iter = 200, refresh = 0)
Expand Down
2 changes: 1 addition & 1 deletion R/map_estimate.R
Original file line number Diff line number Diff line change
Expand Up @@ -19,7 +19,7 @@
#' - `MAP_Estimate`: The MAP estimate for the posterior or each model parameter.
#'
#' @examples
#' \dontrun{
#' \donttest{
#' library(bayestestR)
#'
#' posterior <- rnorm(10000)
Expand Down
2 changes: 1 addition & 1 deletion R/mcse.R
Original file line number Diff line number Diff line change
Expand Up @@ -14,7 +14,7 @@
#' @references Kruschke, J. (2014). Doing Bayesian data analysis: A tutorial with R, JAGS, and Stan. Academic Press.
#'
#' @examples
#' \dontrun{
#' \donttest{
#' library(bayestestR)
#' library(rstanarm)
#'
Expand Down
2 changes: 1 addition & 1 deletion R/mediation.R
Original file line number Diff line number Diff line change
Expand Up @@ -76,7 +76,7 @@
#' the frequentist framework.
#'
#' @examples
#' \dontrun{
#' \donttest{
#' library(mediation)
#' library(brms)
#' library(rstanarm)
Expand Down
2 changes: 1 addition & 1 deletion R/model_to_priors.R
Original file line number Diff line number Diff line change
Expand Up @@ -7,7 +7,7 @@
#' @param ... Other arguments for \code{insight::get_prior()} or \code{\link{describe_posterior}}.
#'
#' @examples
#' \dontrun{
#' \donttest{
#' # brms models
#' # -----------------------------------------------
#' if (require("brms")) {
Expand Down
2 changes: 1 addition & 1 deletion R/p_direction.R
Original file line number Diff line number Diff line change
Expand Up @@ -113,7 +113,7 @@
#' df <- data.frame(replicate(4, rnorm(100)))
#' p_direction(df)
#' p_direction(df, method = "kernel")
#' \dontrun{
#' \donttest{
#' # rstanarm models
#' # -----------------------------------------------
#' if (require("rstanarm")) {
Expand Down
2 changes: 1 addition & 1 deletion R/p_map.R
Original file line number Diff line number Diff line change
Expand Up @@ -22,7 +22,7 @@
#'
#' p_map(rnorm(1000, 0, 1))
#' p_map(rnorm(1000, 10, 1))
#' \dontrun{
#' \donttest{
#' library(rstanarm)
#' model <- suppressWarnings(
#' stan_glm(mpg ~ wt + gear, data = mtcars, chains = 2, iter = 200, refresh = 0)
Expand Down
2 changes: 1 addition & 1 deletion R/p_significance.R
Original file line number Diff line number Diff line change
Expand Up @@ -31,7 +31,7 @@
#' # -----------------------------------------------
#' df <- data.frame(replicate(4, rnorm(100)))
#' p_significance(df)
#' \dontrun{
#' \donttest{
#' # rstanarm models
#' # -----------------------------------------------
#' if (require("rstanarm")) {
Expand Down
2 changes: 1 addition & 1 deletion R/point_estimate.R
Original file line number Diff line number Diff line change
Expand Up @@ -31,7 +31,7 @@
#' df <- data.frame(replicate(4, rnorm(100)))
#' point_estimate(df, centrality = "all", dispersion = TRUE)
#' point_estimate(df, centrality = c("median", "MAP"))
#' \dontrun{
#' \donttest{
#' # rstanarm models
#' # -----------------------------------------------
#' library(rstanarm)
Expand Down
2 changes: 1 addition & 1 deletion R/rope.R
Original file line number Diff line number Diff line change
Expand Up @@ -102,7 +102,7 @@
#' rope(x = rnorm(1000, 0, 1), range = c(-0.1, 0.1))
#' rope(x = rnorm(1000, 1, 0.01), range = c(-0.1, 0.1))
#' rope(x = rnorm(1000, 1, 1), ci = c(0.90, 0.95))
#' \dontrun{
#' \donttest{
#' library(rstanarm)
#' model <- suppressWarnings(
#' stan_glm(mpg ~ wt + gear, data = mtcars, chains = 2, iter = 200, refresh = 0)
Expand Down
2 changes: 1 addition & 1 deletion R/rope_range.R
Original file line number Diff line number Diff line change
Expand Up @@ -42,7 +42,7 @@
#' @inheritParams rope
#'
#' @examples
#' \dontrun{
#' \donttest{
#' if (require("rstanarm")) {
#' model <- suppressWarnings(stan_glm(
#' mpg ~ wt + gear,
Expand Down
2 changes: 1 addition & 1 deletion R/sensitivity_to_prior.R
Original file line number Diff line number Diff line change
Expand Up @@ -16,7 +16,7 @@
#' @param ... Arguments passed to or from other methods.
#'
#' @examples
#' \dontrun{
#' \donttest{
#' library(bayestestR)
#'
#' # rstanarm models
Expand Down
2 changes: 1 addition & 1 deletion R/sexit.R
Original file line number Diff line number Diff line change
Expand Up @@ -102,7 +102,7 @@
#' }
#'
#' @examples
#' \dontrun{
#' \donttest{
#' library(bayestestR)
#'
#' s <- sexit(rnorm(1000, -1, 1))
Expand Down
2 changes: 1 addition & 1 deletion R/sexit_thresholds.R
Original file line number Diff line number Diff line change
Expand Up @@ -10,7 +10,7 @@
#'
#' @examples
#' sexit_thresholds(rnorm(1000))
#' \dontrun{
#' \donttest{
#' if (require("rstanarm")) {
#' model <- suppressWarnings(stan_glm(
#' mpg ~ wt + gear,
Expand Down
2 changes: 1 addition & 1 deletion R/si.R
Original file line number Diff line number Diff line change
Expand Up @@ -49,7 +49,7 @@
#' posterior <- distribution_normal(1000, mean = 0.5, sd = 0.3)
#'
#' si(posterior, prior, verbose = FALSE)
#' \dontrun{
#' \donttest{
#' # rstanarm models
#' # ---------------
#' library(rstanarm)
Expand Down
2 changes: 1 addition & 1 deletion R/simulate_priors.R
Original file line number Diff line number Diff line change
Expand Up @@ -9,7 +9,7 @@
#' distribution (useful for complex priors and designs).
#'
#' @examples
#' \dontrun{
#' \donttest{
#' library(bayestestR)
#' if (require("rstanarm")) {
#' model <- suppressWarnings(
Expand Down
2 changes: 1 addition & 1 deletion R/spi.R
Original file line number Diff line number Diff line change
Expand Up @@ -33,7 +33,7 @@
#' df <- data.frame(replicate(4, rnorm(100)))
#' spi(df)
#' spi(df, ci = c(0.80, 0.89, 0.95))
#' \dontrun{
#' \donttest{
#' library(rstanarm)
#' model <- suppressWarnings(
#' stan_glm(mpg ~ wt + gear, data = mtcars, chains = 2, iter = 200, refresh = 0)
Expand Down
2 changes: 1 addition & 1 deletion man/bayesfactor.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/bayesfactor_inclusion.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/bayesfactor_models.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/bayesfactor_parameters.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/bayesfactor_restricted.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/check_prior.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/convert_bayesian_as_frequentist.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/describe_posterior.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/describe_prior.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/diagnostic_draws.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

Loading

0 comments on commit 9ae24b1

Please sign in to comment.