Skip to content

Commit

Permalink
address issues from tidymodels/tune#863
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch committed Feb 29, 2024
1 parent 7bbb18f commit 47f4137
Show file tree
Hide file tree
Showing 4 changed files with 8 additions and 8 deletions.
4 changes: 2 additions & 2 deletions R/racing_helpers.R
Original file line number Diff line number Diff line change
Expand Up @@ -670,7 +670,7 @@ collect_predictions.tune_race <-
all_configs = FALSE,
...) {
x <- dplyr::select(x, -.order)
res <- NextMethod(summarize = summarize, parameters = parameters)
res <- collect_predictions(x, summarize = summarize, parameters = parameters)
if (!all_configs) {
final_configs <- subset_finished_race(x)
res <- dplyr::inner_join(res, final_configs, by = ".config")
Expand All @@ -684,7 +684,7 @@ collect_predictions.tune_race <-
collect_metrics.tune_race <- function(x, summarize = TRUE, all_configs = FALSE, ...) {
x <- dplyr::select(x, -.order)
final_configs <- subset_finished_race(x)
res <- NextMethod(summarize = summarize, ...)
res <- collect_metrics(x, summarize = summarize)
if (!all_configs) {
final_configs <- subset_finished_race(x)
res <- dplyr::inner_join(res, final_configs, by = ".config")
Expand Down
4 changes: 2 additions & 2 deletions R/tune_race_anova.R
Original file line number Diff line number Diff line change
Expand Up @@ -303,8 +303,8 @@ tune_race_anova_workflow <-

opt_metric_time <- tune::first_eval_time(
metrics,
opt_metric_name,
eval_time,
metric = opt_metric_name,
eval_time = eval_time,
call = call
)

Expand Down
4 changes: 2 additions & 2 deletions R/tune_race_win_loss.R
Original file line number Diff line number Diff line change
Expand Up @@ -283,8 +283,8 @@ tune_race_win_loss_workflow <-

opt_metric_time <- tune::first_eval_time(
metrics,
opt_metric_name,
eval_time,
metric = opt_metric_name,
eval_time = eval_time,
call = call
)

Expand Down
4 changes: 2 additions & 2 deletions R/tune_sim_anneal.R
Original file line number Diff line number Diff line change
Expand Up @@ -344,8 +344,8 @@ tune_sim_anneal_workflow <-
eval_time <- tune::check_eval_time_arg(eval_time, metrics, call = call)
opt_metric_time <- tune::first_eval_time(
metrics,
opt_metric_name,
eval_time,
metric = opt_metric_name,
eval_time = eval_time,
call = call
)

Expand Down

0 comments on commit 47f4137

Please sign in to comment.