Skip to content

Commit 3126fc0

Browse files
teunbrandthomasp85
authored andcommitted
explicitly ignore empty arguments (#5604)
1 parent 937c049 commit 3126fc0

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

R/utilities.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -320,7 +320,7 @@ find_args <- function(...) {
320320
vals <- mget(args, envir = env)
321321
vals <- vals[!vapply(vals, is_missing_arg, logical(1))]
322322

323-
modify_list(vals, list2(..., `...` = NULL))
323+
modify_list(vals, dots_list(..., `...` = NULL, .ignore_empty = "all"))
324324
}
325325

326326
# Used in annotations to ensure printed even when no

0 commit comments

Comments
 (0)