@@ -170,7 +170,7 @@ check_parameters <- function(wflow, pset = NULL, data, grid_names = character(0)
170
170
cli :: format_inline(
171
171
" Creating pre-processing data to finalize {num_unk} unknown parameter{?s}: {.val {unk_names}}" )
172
172
173
- tune_log (list (verbose = TRUE ), split_labels = NULL , task = msg , type = " info" )
173
+ update_printer (list (verbose = TRUE ), split_labels = NULL , task = msg , type = " info" )
174
174
175
175
x <- workflows :: .fit_pre(wflow , data )$ pre $ mold $ predictors
176
176
pset $ object <- purrr :: map(pset $ object , dials :: finalize , x = x )
@@ -416,7 +416,7 @@ check_initial <- function(x,
416
416
if (ctrl $ verbose ) {
417
417
message()
418
418
msg <- cli :: format_inline(" Generating a set of {nrow(x)} initial parameter results" )
419
- tune_log (ctrl , split_labels = NULL , task = msg , type = " go" )
419
+ update_printer (ctrl , split_labels = NULL , task = msg , type = " go" )
420
420
}
421
421
422
422
grid_ctrl <- ctrl
@@ -432,7 +432,7 @@ check_initial <- function(x,
432
432
)
433
433
434
434
if (ctrl $ verbose ) {
435
- tune_log (ctrl , split_labels = NULL , task = " Initialization complete" , type = " success" )
435
+ update_printer (ctrl , split_labels = NULL , task = " Initialization complete" , type = " success" )
436
436
message()
437
437
}
438
438
} else {
0 commit comments