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 a117efb commit d555b2a
Show file tree
Hide file tree
Showing 20 changed files with 20 additions and 20 deletions.
2 changes: 1 addition & 1 deletion R/binned_residuals.R
Original file line number Diff line number Diff line change
Expand Up @@ -49,7 +49,7 @@
#' # look at the data frame
#' as.data.frame(result)
#'
#' \dontrun{
#' \donttest{
#' # plot
#' if (require("see")) {
#' plot(result, show_dots = TRUE)
Expand Down
2 changes: 1 addition & 1 deletion R/check_convergence.R
Original file line number Diff line number Diff line change
Expand Up @@ -60,7 +60,7 @@
#'
#' check_convergence(model)
#'
#' \dontrun{
#' \donttest{
#' model <- suppressWarnings(glmmTMB::glmmTMB(
#' Sepal.Length ~ poly(Petal.Width, 4) * poly(Petal.Length, 4) +
#' (1 + poly(Petal.Width, 4) | Species),
Expand Down
2 changes: 1 addition & 1 deletion R/check_model.R
Original file line number Diff line number Diff line change
Expand Up @@ -141,7 +141,7 @@
#' @family functions to check model assumptions and and assess model quality
#'
#' @examplesIf require("lme4")
#' \dontrun{
#' \donttest{
#' m <- lm(mpg ~ wt + cyl + gear + disp, data = mtcars)
#' check_model(m)
#'
Expand Down
2 changes: 1 addition & 1 deletion R/check_multimodal.R
Original file line number Diff line number Diff line change
Expand Up @@ -11,7 +11,7 @@
#' @param ... Arguments passed to or from other methods.
#'
#' @examplesIf require("multimode") && require("mclust")
#' \dontrun{
#' \donttest{
#' # Univariate
#' x <- rnorm(1000)
#' check_multimodal(x)
Expand Down
2 changes: 1 addition & 1 deletion R/check_normality.R
Original file line number Diff line number Diff line change
Expand Up @@ -35,7 +35,7 @@
#' x <- check_normality(m)
#' plot(x)
#'
#' \dontrun{
#' \donttest{
#' # QQ-plot
#' plot(check_normality(m), type = "qq")
#'
Expand Down
2 changes: 1 addition & 1 deletion R/check_outliers.R
Original file line number Diff line number Diff line change
Expand Up @@ -299,7 +299,7 @@
#' group_iris <- datawizard::data_group(iris, "Species")
#' check_outliers(group_iris)
#'
#' \dontrun{
#' \donttest{
#' # You can also run all the methods
#' check_outliers(data, method = "all")
#'
Expand Down
2 changes: 1 addition & 1 deletion R/model_performance.bayesian.R
Original file line number Diff line number Diff line change
Expand Up @@ -41,7 +41,7 @@
#' - **PCP**: percentage of correct predictions, see [performance_pcp()].
#'
#' @examplesIf require("rstanarm") && require("rstantools") && require("BayesFactor")
#' \dontrun{
#' \donttest{
#' model <- suppressWarnings(rstanarm::stan_glm(
#' mpg ~ wt + cyl,
#' data = mtcars,
Expand Down
2 changes: 1 addition & 1 deletion R/performance_score.R
Original file line number Diff line number Diff line change
Expand Up @@ -40,7 +40,7 @@
#' model <- glm(counts ~ outcome + treatment, family = poisson())
#'
#' performance_score(model)
#' \dontrun{
#' \donttest{
#' data(Salamanders, package = "glmmTMB")
#' model <- glmmTMB::glmmTMB(
#' count ~ spp + mined + (1 | site),
Expand Down
2 changes: 1 addition & 1 deletion R/r2_bayes.R
Original file line number Diff line number Diff line change
Expand Up @@ -73,7 +73,7 @@
#' r2_bayes(model)
#' }
#'
#' \dontrun{
#' \donttest{
#' if (require("brms")) {
#' model <- suppressWarnings(brms::brm(
#' mpg ~ wt + cyl,
Expand Down
2 changes: 1 addition & 1 deletion R/r2_somers.R
Original file line number Diff line number Diff line change
Expand Up @@ -8,7 +8,7 @@
#' @return A named vector with the R2 value.
#'
#' @examples
#' \dontrun{
#' \donttest{
#' if (require("correlation") && require("Hmisc")) {
#' model <- glm(vs ~ wt + mpg, data = mtcars, family = "binomial")
#' r2_somers(model)
Expand Down
2 changes: 1 addition & 1 deletion man/binned_residuals.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_convergence.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_model.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_multimodal.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_normality.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_outliers.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/model_performance.stanreg.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/performance_score.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/r2_bayes.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/r2_somers.Rd

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

0 comments on commit d555b2a

Please sign in to comment.