Skip to content

Commit 6da3d80

Browse files
authored
Merge branch 'tidymodels:main' into variable-fold-weights
2 parents 03c038f + 586afb9 commit 6da3d80

File tree

7 files changed

+210
-169
lines changed

7 files changed

+210
-169
lines changed

R/checks.R

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -190,7 +190,7 @@ check_parameters <- function(wflow, pset = NULL, data, grid_names = character(0)
190190
cli::format_inline(
191191
"Creating pre-processing data to finalize {num_unk} unknown parameter{?s}: {.val {unk_names}}")
192192

193-
tune_log(list(verbose = TRUE), split_labels = NULL, task = msg, type = "info")
193+
update_printer(list(verbose = TRUE), split_labels = NULL, task = msg, type = "info")
194194

195195
x <- workflows::.fit_pre(wflow, data)$pre$mold$predictors
196196
pset$object <- purrr::map(pset$object, dials::finalize, x = x)
@@ -436,7 +436,7 @@ check_initial <- function(x,
436436
if (ctrl$verbose) {
437437
message()
438438
msg <- cli::format_inline(" Generating a set of {nrow(x)} initial parameter results")
439-
tune_log(ctrl, split_labels = NULL, task = msg, type = "go")
439+
update_printer(ctrl, split_labels = NULL, task = msg, type = "go")
440440
}
441441

442442
grid_ctrl <- ctrl
@@ -452,7 +452,7 @@ check_initial <- function(x,
452452
)
453453

454454
if (ctrl$verbose) {
455-
tune_log(ctrl, split_labels = NULL, task = "Initialization complete", type = "success")
455+
update_printer(ctrl, split_labels = NULL, task = "Initialization complete", type = "success")
456456
message()
457457
}
458458
} else {

R/grid_performance.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -43,15 +43,15 @@ metrics_info <- function(x) {
4343
#' @param event_level A logical passed from the control function.
4444
#' @param x A character vector of package names.
4545
#' @param .expr Code to execute.
46-
#' @param ... Object to pass to the internal `tune_log()` function.
46+
#' @param ... Object to pass to the internal `update_printer()` function.
4747
#' @param bad_only A logical for whether warnings and errors should be caught.
4848
#' @param notes Character data to add to the logging.
4949
#' @param workflow A workflow.
5050
#' @param grid_preprocessor A tibble with parameter information.
5151
#' @param new_data A data frame or matrix of predictors to process.
5252
#' @param metrics_info The output of `tune:::metrics_info(metrics)`---only
5353
#' included as an argument to allow for pre-computing.
54-
#' @param catalog A logical passed to `tune_log()` giving whether the message
54+
#' @param catalog A logical passed to `update_printer()` giving whether the message
5555
#' is compatible with the issue cataloger. Defaults to `TRUE`. Updates that are
5656
#' always unique and do not represent a tuning "issue" can bypass the cataloger
5757
#' by setting `catalog = FALSE`.

0 commit comments

Comments
 (0)