Skip to content

Commit

Permalink
update name of internal workflows function
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch committed Jun 3, 2024
1 parent 02e5632 commit 0ea505c
Showing 1 changed file with 3 additions and 3 deletions.
6 changes: 3 additions & 3 deletions R/grid_code_paths.R
Original file line number Diff line number Diff line change
Expand Up @@ -384,7 +384,7 @@ tune_grid_loop_iter <- function(split,
assessment_rows <- as.integer(split, data = "assessment")
assessment <- vctrs::vec_slice(split$data, assessment_rows)

if (workflows::should_inner_split(workflow)) {
if (workflows::.should_inner_split(workflow)) {
# if the workflow has a postprocessor that needs training (i.e. calibration),
# further split the analysis data into an "inner" analysis and
# assessment set.
Expand Down Expand Up @@ -504,7 +504,7 @@ tune_grid_loop_iter <- function(split,
iter_grid_model
)

if (!workflows::should_inner_split(workflow)) {
if (!workflows::.should_inner_split(workflow)) {
elt_extract <- .catch_and_log(
extract_details(workflow, control$extract),
control,
Expand Down Expand Up @@ -535,7 +535,7 @@ tune_grid_loop_iter <- function(split,
next
}

if (workflows::should_inner_split(workflow)) {
if (workflows::.should_inner_split(workflow)) {
# note that, since we're training a postprocessor, `iter_predictions`
# are the predictions from the potato set rather than the
# assessment set
Expand Down

0 comments on commit 0ea505c

Please sign in to comment.