Skip to content

Commit

Permalink
switch to cli from cat()
Browse files Browse the repository at this point in the history
  • Loading branch information
hfrick committed Sep 25, 2024
1 parent 21943e5 commit 2ca6b5e
Show file tree
Hide file tree
Showing 3 changed files with 3 additions and 2 deletions.
1 change: 1 addition & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -417,6 +417,7 @@ export(vfold_cv)
import(rlang)
import(vctrs)
importFrom(cli,cli_abort)
importFrom(cli,cli_text)
importFrom(cli,cli_warn)
importFrom(dplyr,"%>%")
importFrom(dplyr,arrange)
Expand Down
2 changes: 1 addition & 1 deletion R/bootci.R
Original file line number Diff line number Diff line change
Expand Up @@ -418,7 +418,7 @@ bca_calc <- function(stats, orig_data, alpha = 0.05, .fn, ..., call = caller_env
# To test, we run on the first LOO data set and see if it is a vector or df
loo_test <- try(rlang::exec(.fn, loo_rs$splits[[1]], ...), silent = TRUE)
if (inherits(loo_test, "try-error")) {
cat("Running `.fn` on the LOO resamples produced an error:\n")
cli_text("Running {.fn .fn} on the LOO resamples produced an error:")
print(loo_test)
cli_abort("{.arg .fn} failed.", call = call)
}
Expand Down
2 changes: 1 addition & 1 deletion R/rsample-package.R
Original file line number Diff line number Diff line change
Expand Up @@ -4,7 +4,7 @@
## usethis namespace: start
#' @import rlang
#' @importFrom lifecycle deprecated
#' @importFrom cli cli_abort cli_warn
#' @importFrom cli cli_abort cli_warn cli_text
#' @importFrom utils globalVariables
#' @importFrom purrr map map2 map_dbl pluck map_lgl list_rbind
#' @importFrom tibble tibble is_tibble as_tibble obj_sum
Expand Down

0 comments on commit 2ca6b5e

Please sign in to comment.