Skip to content

Commit bc251a8

Browse files
committed
no more silently eating the dots
1 parent 78fab13 commit bc251a8

File tree

1 file changed

+3
-1
lines changed

1 file changed

+3
-1
lines changed

R/parameters.R

Lines changed: 3 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -29,11 +29,13 @@ parameters.param <- function(x, ...) {
2929
#' @export
3030
#' @rdname parameters
3131
parameters.list <- function(x, ...) {
32+
check_dots_empty()
33+
3234
elem_param <- purrr::map_lgl(x, inherits, "param")
3335
if (any(!elem_param)) {
3436
cli::cli_abort("The objects should all be {.cls param} objects.")
3537
}
36-
elem_name <- purrr::map_chr(x, ~ names(.x$label))
38+
elem_name <- purrr::map_chr(x, ~names(.x$label))
3739
elem_id <- names(x)
3840
if (length(elem_id) == 0) {
3941
elem_id <- elem_name

0 commit comments

Comments
 (0)