Skip to content

Commit 5cb124c

Browse files
committed
fix #6513
1 parent 27465ff commit 5cb124c

10 files changed

+11
-11
lines changed

R/coord-radial.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -136,7 +136,7 @@ coord_radial <- function(theta = "x",
136136
}
137137
if (lifecycle::is_present(direction)) {
138138
deprecate_warn0(
139-
"3.5.2", "coord_radial(direction)", "coord_radial(reverse)"
139+
"4.0.0", "coord_radial(direction)", "coord_radial(reverse)"
140140
)
141141
reverse <- switch(reverse, "r" = "thetar", "theta")
142142
}

R/coord-transform.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -113,7 +113,7 @@ coord_transform <- function(x = "identity", y = "identity", xlim = NULL, ylim =
113113
#' @export
114114
coord_trans <- function(...) {
115115
deprecate_soft0(
116-
"3.5.2",
116+
"4.0.0",
117117
"coord_trans()",
118118
"coord_transform()"
119119
)

R/facet-wrap.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -569,7 +569,7 @@ wrap_layout <- function(id, dims, dir) {
569569
# Should only occur when `as.table` was not incorporated into `dir`
570570
dir <- switch(dir, h = "lt", v = "tl")
571571
deprecate_soft0(
572-
"3.5.2",
572+
"4.0.0",
573573
what = I("Internal use of `dir = \"h\"` and `dir = \"v\"` in `facet_wrap()`"),
574574
details = I(c(
575575
"The `dir` argument should incorporate the `as.table` argument.",

R/geom-boxplot.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -241,7 +241,7 @@ GeomBoxplot <- ggproto("GeomBoxplot", Geom,
241241
setup_params = function(data, params) {
242242
if ("fatten" %in% names(params)) {
243243
deprecate_soft0(
244-
"3.6.0", "geom_boxplot(fatten)",
244+
"4.0.0", "geom_boxplot(fatten)",
245245
"geom_boxplot(median.linewidth)"
246246
)
247247
} else {

R/geom-crossbar.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -62,7 +62,7 @@ GeomCrossbar <- ggproto("GeomCrossbar", Geom,
6262
setup_params = function(data, params) {
6363
if (lifecycle::is_present(params$fatten %||% deprecated())) {
6464
deprecate_soft0(
65-
"3.6.0", "geom_crossbar(fatten)",
65+
"4.0.0", "geom_crossbar(fatten)",
6666
"geom_crossbar(middle.linewidth)"
6767
)
6868
} else {

R/geom-errorbar.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -69,7 +69,7 @@ GeomErrorbarh <- ggproto(
6969
"GeomErrorbarh", GeomErrorbar,
7070
setup_params = function(data, params) {
7171
deprecate_soft0(
72-
"3.5.2", "geom_errobarh()", "geom_errorbar(orientation = \"y\")",
72+
"4.0.0", "geom_errobarh()", "geom_errorbar(orientation = \"y\")",
7373
id = "no-more-errorbarh"
7474
)
7575
GeomLinerange$setup_params(data, params)
@@ -87,7 +87,7 @@ geom_errorbar <- make_constructor(GeomErrorbar, orientation = NA)
8787
#' `geom_errorbar(orientation = "y")` instead.
8888
geom_errorbarh <- function(..., orientation = "y") {
8989
deprecate_soft0(
90-
"3.5.2", "geom_errobarh()", "geom_errorbar(orientation = \"y\")",
90+
"4.0.0", "geom_errobarh()", "geom_errorbar(orientation = \"y\")",
9191
id = "no-more-errorbarh"
9292
)
9393
geom_errorbar(..., orientation = orientation)

R/geom-pointrange.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -16,7 +16,7 @@ GeomPointrange <- ggproto("GeomPointrange", Geom,
1616

1717
setup_params = function(data, params) {
1818
if (lifecycle::is_present(params$fatten %||% deprecated())) {
19-
deprecate_soft0("3.6.0", "geom_pointrange(fatten)", I("the `size` aesthetic"))
19+
deprecate_soft0("4.0.0", "geom_pointrange(fatten)", I("the `size` aesthetic"))
2020
} else {
2121
# For backward compatibility reasons
2222
params$fatten <- 4

R/geom-violin.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -111,7 +111,7 @@ geom_violin <- function(mapping = NULL, data = NULL,
111111
extra <- list()
112112
if (lifecycle::is_present(draw_quantiles)) {
113113
deprecate_soft0(
114-
"3.6.0",
114+
"4.0.0",
115115
what = "geom_violin(draw_quantiles)",
116116
with = "geom_violin(quantiles.linetype)"
117117
)

R/stat-summary-2d.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -15,7 +15,7 @@ StatSummary2d <- ggproto(
1515
params$drop <- !identical(params$drop, "none")
1616
}
1717

18-
params <- fix_bin_params(params, fun = snake_class(self), version = "3.5.2")
18+
params <- fix_bin_params(params, fun = snake_class(self), version = "4.0.0")
1919
vars <- c("origin", "binwidth", "breaks", "center", "boundary")
2020
params[vars] <- lapply(params[vars], dual_param, default = NULL)
2121
params$closed <- dual_param(params$closed, list(x = "right", y = "right"))

R/stat-ydensity.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -12,7 +12,7 @@ StatYdensity <- ggproto(
1212

1313
if (!is.null(params$draw_quantiles)) {
1414
deprecate_soft0(
15-
"3.6.0",
15+
"4.0.0",
1616
what = "stat_ydensity(draw_quantiles)",
1717
with = "stat_ydensity(quantiles)"
1818
)

0 commit comments

Comments
 (0)