Skip to content

Commit

Permalink
simplify formatting auto-crating message
Browse files Browse the repository at this point in the history
  • Loading branch information
shikokuchuo committed Jan 27, 2025
1 parent 93eaa2c commit 6707b06
Show file tree
Hide file tree
Showing 2 changed files with 3 additions and 3 deletions.
4 changes: 2 additions & 2 deletions R/map.R
Original file line number Diff line number Diff line change
Expand Up @@ -142,7 +142,7 @@
#'
#' mtcars |> map_dbl(sum, .parallel = TRUE)
#'
#' # We recommend you crate() anonymous functions
#' # We recommend that you crate() anonymous functions
#' 1:10 |>
#' map(crate(function(x) stats::rnorm(10, mean = x)), .parallel = TRUE) |>
#' map_dbl(mean, .parallel = TRUE)
Expand Down Expand Up @@ -225,7 +225,7 @@ mmap_ <- function(.x, .f, .progress, .type, error_call, ...) {
if (!carrier::is_crate(.f) && !isNamespace(topenv(environment(.f)))) {
.f <- crate(rlang::set_env(.f))
cli::cli_alert_success(
"Automatically crated `.f`: {format(as_bytes(unclass(lobstr::obj_size(.f))))}"
"Automatically crated `.f`: {format(lobstr::obj_size(.f))}"
)
}

Expand Down
2 changes: 1 addition & 1 deletion man/map.Rd

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

0 comments on commit 6707b06

Please sign in to comment.