Skip to content

Commit

Permalink
test interactive() before
Browse files Browse the repository at this point in the history
  • Loading branch information
larmarange committed Sep 23, 2022
1 parent 93f390e commit 04b90e7
Show file tree
Hide file tree
Showing 14 changed files with 14 additions and 14 deletions.
2 changes: 1 addition & 1 deletion R/model_list_variables.R
Original file line number Diff line number Diff line change
Expand Up @@ -18,7 +18,7 @@
#'
#' @export
#' @family model_helpers
#' @examplesIf .assert_package("gtsummary", boolean = TRUE) && interactive()
#' @examplesIf interactive() && .assert_package("gtsummary", boolean = TRUE)
#' Titanic %>%
#' dplyr::as_tibble() %>%
#' dplyr::mutate(Survived = factor(Survived, c("No", "Yes"))) %>%
Expand Down
2 changes: 1 addition & 1 deletion R/tidiers.R
Original file line number Diff line number Diff line change
Expand Up @@ -7,7 +7,7 @@
#' interval in the tidied output
#' @param conf.level the confidence level to use for the confidence interval
#' @param ... additional parameters passed to `parameters::model_parameters()`
#' @examplesIf .assert_package("parameters", boolean = TRUE)
#' @examplesIf interactive() && .assert_package("parameters", boolean = TRUE)
#' lm(Sepal.Length ~ Sepal.Width + Species, data = iris) %>%
#' tidy_parameters()
#' @export
Expand Down
2 changes: 1 addition & 1 deletion R/tidy_add_estimate_to_reference_rows.R
Original file line number Diff line number Diff line change
Expand Up @@ -27,7 +27,7 @@
#' @inheritParams tidy_plus_plus
#' @export
#' @family tidy_helpers
#' @examplesIf .assert_package("gtsummary", boolean = TRUE) && .assert_package("emmeans", boolean = TRUE)
#' @examplesIf interactive() && .assert_package("gtsummary", boolean = TRUE) && .assert_package("emmeans", boolean = TRUE)
#' df <- Titanic %>%
#' dplyr::as_tibble() %>%
#' dplyr::mutate(dplyr::across(where(is.character), factor))
Expand Down
2 changes: 1 addition & 1 deletion R/tidy_add_header_rows.R
Original file line number Diff line number Diff line change
Expand Up @@ -27,7 +27,7 @@
#' @inheritParams tidy_plus_plus
#' @export
#' @family tidy_helpers
#' @examplesIf .assert_package("gtsummary", boolean = TRUE) & interactive()
#' @examplesIf interactive() && .assert_package("gtsummary", boolean = TRUE)
#' df <- Titanic %>%
#' dplyr::as_tibble() %>%
#' dplyr::mutate(Survived = factor(Survived, c("No", "Yes")))
Expand Down
2 changes: 1 addition & 1 deletion R/tidy_add_reference_rows.R
Original file line number Diff line number Diff line change
Expand Up @@ -27,7 +27,7 @@
#' @inheritParams tidy_plus_plus
#' @export
#' @family tidy_helpers
#' @examplesIf .assert_package("gtsummary", boolean = TRUE) & interactive()
#' @examplesIf interactive() && .assert_package("gtsummary", boolean = TRUE)
#' df <- Titanic %>%
#' dplyr::as_tibble() %>%
#' dplyr::mutate(Survived = factor(Survived, c("No", "Yes")))
Expand Down
2 changes: 1 addition & 1 deletion R/tidy_disambiguate_terms.R
Original file line number Diff line number Diff line change
Expand Up @@ -14,7 +14,7 @@
#' @inheritParams tidy_plus_plus
#' @export
#' @family tidy_helpers
#' @examplesIf .assert_package("lme4", boolean = TRUE) && .assert_package("broom.mixed", boolean = TRUE) && .assert_package("gtsummary", boolean = TRUE)
#' @examplesIf interactive() && .assert_package("lme4", boolean = TRUE) && .assert_package("broom.mixed", boolean = TRUE) && .assert_package("gtsummary", boolean = TRUE)
#' mod <- lme4::lmer(marker ~ stage + (1|grade) + (death|response), gtsummary::trial)
#' mod %>% tidy_and_attach() %>% tidy_disambiguate_terms()

Expand Down
2 changes: 1 addition & 1 deletion R/tidy_plus_plus.R
Original file line number Diff line number Diff line change
Expand Up @@ -49,7 +49,7 @@
#' when requested output cannot be generated. Default is FALSE
#' @param ... other arguments passed to `tidy_fun()`
#' @family tidy_helpers
#' @examplesIf .assert_package("gtsummary", boolean = TRUE)
#' @examplesIf interactive() && .assert_package("gtsummary", boolean = TRUE)
#' ex1 <- lm(Sepal.Length ~ Sepal.Width + Species, data = iris) %>%
#' tidy_plus_plus()
#' ex1
Expand Down
2 changes: 1 addition & 1 deletion man/model_list_variables.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/tidy_add_estimate_to_reference_rows.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/tidy_add_header_rows.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/tidy_add_reference_rows.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/tidy_disambiguate_terms.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/tidy_parameters.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/tidy_plus_plus.Rd

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

0 comments on commit 04b90e7

Please sign in to comment.