We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent 4c806f8 commit 699ef0eCopy full SHA for 699ef0e
R/aes.r
@@ -75,10 +75,8 @@ NULL
75
#' cut3 <- function(x) cut_number(x, 3)
76
#' scatter_by(mtcars, cut3(disp), drat)
77
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())
+ exprs <- rlang::enquos(x = x, y = y, ..., .ignore_empty = "all")
+ aes <- new_aes(exprs, env = parent.frame())
82
rename_aes(aes)
83
}
84
0 commit comments