From 6f14130c2e42066201ff3c27f2f8ae927c5bc170 Mon Sep 17 00:00:00 2001 From: simonpcouch Date: Mon, 11 Mar 2024 11:14:15 -0500 Subject: [PATCH 1/2] move ellipses in `collect_*()` functions --- R/collect.R | 10 ++++++---- man/collect_metrics.workflow_set.Rd | 10 +++++----- 2 files changed, 11 insertions(+), 9 deletions(-) diff --git a/R/collect.R b/R/collect.R index ba9f372..7eec336 100644 --- a/R/collect.R +++ b/R/collect.R @@ -4,6 +4,7 @@ #' #' @param x A [`workflow_set`][workflow_set()] object that has been evaluated #' with [workflow_map()]. +#' @param ... Not currently used. #' @param summarize A logical for whether the performance estimates should be #' summarized via the mean (over resamples) or the raw performance values (per #' resample) should be returned along with the resampling identifiers. When @@ -17,7 +18,6 @@ #' are retained. If `TRUE`, the `parameters` argument is ignored. #' @param metric A character string for the metric that is used for #' `select_best`. -#' @param ... Not currently used. #' @return A tibble. #' @details #' @@ -57,7 +57,8 @@ #' #' collect_metrics(two_class_res, summarize = FALSE) #' @export -collect_metrics.workflow_set <- function(x, summarize = TRUE, ...) { +collect_metrics.workflow_set <- function(x, ..., summarize = TRUE) { + rlang::check_dots_empty() check_incompete(x, fail = TRUE) check_bool(summarize) x <- @@ -98,8 +99,9 @@ reorder_cols <- function(x) { #' @export #' @rdname collect_metrics.workflow_set collect_predictions.workflow_set <- - function(x, summarize = TRUE, parameters = NULL, select_best = FALSE, - metric = NULL, ...) { + function(x, ..., summarize = TRUE, parameters = NULL, select_best = FALSE, + metric = NULL) { + rlang::check_dots_empty() check_incompete(x, fail = TRUE) check_bool(summarize) check_bool(select_best) diff --git a/man/collect_metrics.workflow_set.Rd b/man/collect_metrics.workflow_set.Rd index 29fb693..f71d0b0 100644 --- a/man/collect_metrics.workflow_set.Rd +++ b/man/collect_metrics.workflow_set.Rd @@ -6,15 +6,15 @@ \alias{collect_notes.workflow_set} \title{Obtain and format results produced by tuning functions for workflow sets} \usage{ -\method{collect_metrics}{workflow_set}(x, summarize = TRUE, ...) +\method{collect_metrics}{workflow_set}(x, ..., summarize = TRUE) \method{collect_predictions}{workflow_set}( x, + ..., summarize = TRUE, parameters = NULL, select_best = FALSE, - metric = NULL, - ... + metric = NULL ) \method{collect_notes}{workflow_set}(x, ...) @@ -23,14 +23,14 @@ \item{x}{A \code{\link[=workflow_set]{workflow_set}} object that has been evaluated with \code{\link[=workflow_map]{workflow_map()}}.} +\item{...}{Not currently used.} + \item{summarize}{A logical for whether the performance estimates should be summarized via the mean (over resamples) or the raw performance values (per resample) should be returned along with the resampling identifiers. When collecting predictions, these are averaged if multiple assessment sets contain the same row.} -\item{...}{Not currently used.} - \item{parameters}{An optional tibble of tuning parameter values that can be used to filter the predicted values before processing. This tibble should only have columns for each tuning parameter identifier (e.g. \code{"my_param"} From a67b2dd42eb0228086514168427b4a91d12d0847 Mon Sep 17 00:00:00 2001 From: simonpcouch Date: Mon, 11 Mar 2024 11:29:12 -0500 Subject: [PATCH 2/2] add NEWS entry --- NEWS.md | 1 + 1 file changed, 1 insertion(+) diff --git a/NEWS.md b/NEWS.md index 9a862e3..48c149e 100644 --- a/NEWS.md +++ b/NEWS.md @@ -1,5 +1,6 @@ # workflowsets (development version) +* Ellipses (...) are now used consistently in the package to require optional arguments to be named; `collect_metrics()` and `collect_predictions()` are the only functions that received changes (#151, tidymodels/tune#863). * Enabled evaluating censored regression models (#139, #144). The placement of the new `eval_time` argument to `rank_results()` breaks passing-by-position for the `select_best` argument.