Skip to content

Commit 699ef0e

Browse files
Use .ignore_empty = 'all'
1 parent 4c806f8 commit 699ef0e

File tree

1 file changed

+2
-4
lines changed

1 file changed

+2
-4
lines changed

R/aes.r

Lines changed: 2 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -75,10 +75,8 @@ NULL
7575
#' cut3 <- function(x) cut_number(x, 3)
7676
#' scatter_by(mtcars, cut3(disp), drat)
7777
aes <- function(x, y, ...) {
78-
exprs <- rlang::enquos(x = x, y = y, ...)
79-
is_missing <- vapply(exprs, rlang::quo_is_missing, logical(1))
80-
81-
aes <- new_aes(exprs[!is_missing], env = parent.frame())
78+
exprs <- rlang::enquos(x = x, y = y, ..., .ignore_empty = "all")
79+
aes <- new_aes(exprs, env = parent.frame())
8280
rename_aes(aes)
8381
}
8482

0 commit comments

Comments
 (0)