Skip to content

Commit 9d44ff7

Browse files
committed
Merge branch 'master' into 0-1-3-rc
2 parents 94ccde8 + 96be20e commit 9d44ff7

File tree

2 files changed

+7
-4
lines changed

2 files changed

+7
-4
lines changed

R/misc.R

+6-3
Original file line numberDiff line numberDiff line change
@@ -171,7 +171,10 @@ names0 <- function (num, prefix = "x") {
171171
#' @export
172172
#' @keywords internal
173173
#' @rdname add_on_exports
174-
update_dot_check <- function(dots) {
174+
update_dot_check <- function(...) {
175+
176+
dots <- enquos(...)
177+
175178
if (length(dots) > 0)
176179
rlang::abort(
177180
glue::glue(
@@ -194,8 +197,8 @@ new_model_spec <- function(cls, args, eng_args, mode, method, engine) {
194197
glue::glue(
195198
"`mode` should be one of: ",
196199
glue::glue_collapse(glue::glue("'{spec_modes}'"), sep = ", ")
197-
)
198200
)
201+
)
199202

200203
out <- list(args = args, eng_args = eng_args,
201204
mode = mode, method = method, engine = engine)
@@ -297,7 +300,7 @@ update_engine_parameters <- function(eng_args, ...) {
297300

298301
has_extra_dots <- !(names(dots) %in% names(eng_args))
299302
dots <- dots[has_extra_dots]
300-
update_dot_check(dots)
303+
update_dot_check(!!!dots)
301304

302305
ret
303306
}

man/add_on_exports.Rd

+1-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)