Skip to content

Commit

Permalink
choose_eval_time() needs a metric that's not NULL (#146)
Browse files Browse the repository at this point in the history
  • Loading branch information
hfrick authored Feb 29, 2024
1 parent 34b673f commit 02b3fff
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions R/rank_results.R
Original file line number Diff line number Diff line change
Expand Up @@ -37,13 +37,13 @@ rank_results <- function(x, rank_metric = NULL, eval_time = NULL, select_best =
tune::check_metric_in_tune_results(tibble::as_tibble(met_set), rank_metric)
}

eval_time <- tune::choose_eval_time(result_1, rank_metric, eval_time)

metric_info <- pick_metric(x, rank_metric)
metric <- metric_info$metric
direction <- metric_info$direction
wflow_info <- dplyr::bind_cols(purrr::map_dfr(x$info, I), dplyr::select(x, wflow_id))

eval_time <- tune::choose_eval_time(result_1, metric, eval_time)

results <- collect_metrics(x) %>%
dplyr::select(wflow_id, .config, .metric, mean, std_err, n,
dplyr::any_of(".eval_time")) %>%
Expand Down

0 comments on commit 02b3fff

Please sign in to comment.