Skip to content

Commit 9292832

Browse files
lionel-yutannihilation
authored andcommitted
Remove quosure compats (#3035)
And depend on rlang >= 0.3.0 Closes r-lib/rlang#669
1 parent b25e2da commit 9292832

File tree

4 files changed

+4
-44
lines changed

4 files changed

+4
-44
lines changed

DESCRIPTION

Lines changed: 1 addition & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -27,7 +27,7 @@ Imports:
2727
MASS,
2828
mgcv,
2929
reshape2,
30-
rlang (>= 0.2.1),
30+
rlang (>= 0.3.0),
3131
scales (>= 0.5.0),
3232
stats,
3333
tibble,
@@ -89,7 +89,6 @@ Collate:
8989
'backports.R'
9090
'bench.r'
9191
'bin.R'
92-
'compat-quosures.R'
9392
'coord-.r'
9493
'coord-cartesian-.r'
9594
'coord-fixed.r'

NAMESPACE

Lines changed: 0 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -4,7 +4,6 @@ S3method("$",ggproto)
44
S3method("$",ggproto_parent)
55
S3method("$<-",uneval)
66
S3method("+",gg)
7-
S3method("[",quosures)
87
S3method("[",uneval)
98
S3method("[<-",uneval)
109
S3method("[[",ggproto)
@@ -13,7 +12,6 @@ S3method(.DollarNames,ggproto)
1312
S3method(as.list,ggproto)
1413
S3method(autolayer,default)
1514
S3method(autoplot,default)
16-
S3method(c,quosures)
1715
S3method(drawDetails,zeroGrob)
1816
S3method(element_grob,element_blank)
1917
S3method(element_grob,element_line)
@@ -99,7 +97,6 @@ S3method(print,ggplot)
9997
S3method(print,ggplot2_bins)
10098
S3method(print,ggproto)
10199
S3method(print,ggproto_method)
102-
S3method(print,quosures)
103100
S3method(print,rel)
104101
S3method(print,theme)
105102
S3method(print,uneval)

R/compat-quosures.R

Lines changed: 0 additions & 36 deletions
This file was deleted.

R/facet-.r

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -382,12 +382,12 @@ as_facets <- function(x) {
382382
f_as_facets(x)
383383
} else {
384384
vars <- as_quoted(x)
385-
as_quosures(vars, globalenv(), named = TRUE)
385+
rlang::as_quosures(vars, globalenv(), named = TRUE)
386386
}
387387
}
388388
f_as_facets <- function(f) {
389389
if (is.null(f)) {
390-
return(as_quosures(list()))
390+
return(rlang::as_quosures(list()))
391391
}
392392

393393
env <- rlang::f_env(f) %||% globalenv()
@@ -398,7 +398,7 @@ f_as_facets <- function(f) {
398398
# `.` in formulas is ignored
399399
vars <- discard_dots(vars)
400400

401-
as_quosures(vars, env, named = TRUE)
401+
rlang::as_quosures(vars, env, named = TRUE)
402402
}
403403
discard_dots <- function(x) {
404404
x[!vapply(x, identical, logical(1), as.name("."))]

0 commit comments

Comments
 (0)