We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
1 parent a1143e1 commit 46478b5Copy full SHA for 46478b5
R/aes-calculated.r
@@ -42,6 +42,8 @@ is_calculated <- function(x) {
42
FALSE
43
} else if (is.symbol(x)) {
44
is_dotted_var(as.character(x))
45
+ } else if (is_quosure(x)) {
46
+ is_calculated(quo_get_expr(x))
47
} else if (is.call(x)) {
48
if (identical(x[[1]], quote(stat))) {
49
TRUE
@@ -66,6 +68,12 @@ strip_dots <- function(expr) {
66
68
} else {
67
69
expr
70
}
71
+ } else if (is_quosure(expr)) {
72
+ # strip dots from quosure and reconstruct the quosure
73
+ expr <- new_quosure(
74
+ strip_dots(quo_get_expr(expr)),
75
+ quo_get_env(expr)
76
+ )
77
} else if (is.call(expr)) {
78
if (identical(expr[[1]], quote(stat))) {
79
strip_dots(expr[[2]])
0 commit comments