Skip to content

Commit ee0c9de

Browse files
committed
stuff before 3.2.0 becomes proper warning
1 parent acf3c1c commit ee0c9de

File tree

4 files changed

+6
-6
lines changed

4 files changed

+6
-6
lines changed

R/aes.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -283,7 +283,7 @@ is_position_aes <- function(vars) {
283283
#'
284284
#' @export
285285
aes_ <- function(x, y, ...) {
286-
deprecate_soft0(
286+
deprecate_warn0(
287287
"3.0.0",
288288
"aes_()",
289289
details = "Please use tidy evaluation idioms with `aes()`"
@@ -310,7 +310,7 @@ aes_ <- function(x, y, ...) {
310310
#' @rdname aes_
311311
#' @export
312312
aes_string <- function(x, y, ...) {
313-
deprecate_soft0(
313+
deprecate_warn0(
314314
"3.0.0",
315315
"aes_string()",
316316
details = c(

R/annotation-custom.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -89,7 +89,7 @@ GeomCustomAnn <- ggproto("GeomCustomAnn", Geom,
8989
editGrob(grob, vp = vp, name = paste(grob$name, annotation_id()))
9090
},
9191

92-
default_aes = aes_(xmin = -Inf, xmax = Inf, ymin = -Inf, ymax = Inf)
92+
default_aes = aes(xmin = -Inf, xmax = Inf, ymin = -Inf, ymax = Inf)
9393
)
9494

9595
annotation_id <- local({

R/fortify-map.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -133,6 +133,6 @@ map_data <- function(map, region = ".", exact = FALSE, ...) {
133133
borders <- function(database = "world", regions = ".", fill = NA,
134134
colour = "grey50", xlim = NULL, ylim = NULL, ...) {
135135
df <- map_data(database, regions, xlim = xlim, ylim = ylim)
136-
geom_polygon(aes_(~long, ~lat, group = ~group), data = df,
136+
geom_polygon(aes(long, lat, group = group), data = df,
137137
fill = fill, colour = colour, ..., inherit.aes = FALSE)
138138
}

R/plot.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -182,13 +182,13 @@ plot_clone <- function(plot) {
182182
#'
183183
#' # Doesn't seem to do anything!
184184
#' for (colour in colours) {
185-
#' ggplot(mpg, aes_(~ displ, ~ hwy, colour = colour)) +
185+
#' ggplot(mpg, aes(displ, hwy, colour = colour)) +
186186
#' geom_point()
187187
#' }
188188
#'
189189
#' # Works when we explicitly print the plots
190190
#' for (colour in colours) {
191-
#' print(ggplot(mpg, aes_(~ displ, ~ hwy, colour = colour)) +
191+
#' print(ggplot(mpg, aes(displ, hwy, colour = colour)) +
192192
#' geom_point())
193193
#' }
194194
print.ggplot <- function(x, newpage = is.null(vp), vp = NULL, ...) {

0 commit comments

Comments
 (0)