Skip to content

Commit 55c6acc

Browse files
committed
replace soft deprecations
1 parent 1dc2f57 commit 55c6acc

24 files changed

+37
-42
lines changed

R/annotation-borders.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -46,6 +46,6 @@ annotation_borders <- function(database = "world", regions = ".", fill = NA,
4646
#' @rdname annotation_borders
4747
#' @usage borders(...) # Deprecated
4848
borders <- function(...) {
49-
deprecate_soft0("4.0.0", "borders()", "annotation_borders()")
49+
deprecate("4.0.0", "borders()", "annotation_borders()")
5050
annotation_borders(...)
5151
}

R/annotation-logticks.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -96,7 +96,7 @@ annotation_logticks <- function(base = 10, sides = "bl", outside = FALSE, scaled
9696
lifecycle::signal_stage("superseded", "annotation_logticks()", "guide_axis_logticks()")
9797

9898
if (lifecycle::is_present(size)) {
99-
deprecate_soft0("3.5.0", I("Using the `size` aesthetic in this geom"), I("`linewidth`"))
99+
deprecate("3.5.0", I("Using the `size` aesthetic in this geom"), I("`linewidth`"))
100100
linewidth <- linewidth %||% size
101101
}
102102

R/axis-secondary.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -100,7 +100,7 @@ sec_axis <- function(transform = NULL,
100100
name = waiver(), breaks = waiver(), labels = waiver(),
101101
guide = waiver(), trans = deprecated()) {
102102
if (lifecycle::is_present(trans)) {
103-
deprecate_soft0("3.5.0", "sec_axis(trans)", "sec_axis(transform)")
103+
deprecate("3.5.0", "sec_axis(trans)", "sec_axis(transform)")
104104
transform <- trans
105105
}
106106

R/coord-.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -696,7 +696,7 @@ is_coord <- function(x) inherits(x, "Coord")
696696
#' @rdname is_tests
697697
#' @usage is.Coord(x) # Deprecated
698698
is.Coord <- function(x) {
699-
deprecate_soft0("3.5.2", "is.Coord()", "is_coord()")
699+
deprecate("3.5.2", "is.Coord()", "is_coord()")
700700
is_coord(x)
701701
}
702702

R/coord-transform.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -112,7 +112,7 @@ coord_transform <- function(x = "identity", y = "identity", xlim = NULL, ylim =
112112
#' @rdname coord_transform
113113
#' @export
114114
coord_trans <- function(...) {
115-
deprecate_soft0(
115+
deprecate(
116116
"4.0.0",
117117
"coord_trans()",
118118
"coord_transform()"

R/facet-.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -939,7 +939,7 @@ is_facet <- function(x) inherits(x, "Facet")
939939
#' @rdname is_tests
940940
#' @usage is.facet(x) # Deprecated
941941
is.facet <- function(x) {
942-
deprecate_soft0("3.5.2", "is.facet()", "is_facet()")
942+
deprecate("3.5.2", "is.facet()", "is_facet()")
943943
is_facet(x)
944944
}
945945

R/facet-wrap.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -568,7 +568,7 @@ wrap_layout <- function(id, dims, dir) {
568568
if (nchar(dir) != 2) {
569569
# Should only occur when `as.table` was not incorporated into `dir`
570570
dir <- switch(dir, h = "lt", v = "tl")
571-
deprecate_soft0(
571+
deprecate(
572572
"4.0.0",
573573
what = I("Internal use of `dir = \"h\"` and `dir = \"v\"` in `facet_wrap()`"),
574574
details = I(c(

R/geom-boxplot.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -240,7 +240,7 @@ GeomBoxplot <- ggproto("GeomBoxplot", Geom,
240240

241241
setup_params = function(data, params) {
242242
if ("fatten" %in% names(params)) {
243-
deprecate_soft0(
243+
deprecate(
244244
"4.0.0", "geom_boxplot(fatten)",
245245
"geom_boxplot(median.linewidth)"
246246
)

R/geom-crossbar.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -61,7 +61,7 @@ geom_crossbar <- function(mapping = NULL, data = NULL,
6161
GeomCrossbar <- ggproto("GeomCrossbar", Geom,
6262
setup_params = function(data, params) {
6363
if (lifecycle::is_present(params$fatten %||% deprecated())) {
64-
deprecate_soft0(
64+
deprecate(
6565
"4.0.0", "geom_crossbar(fatten)",
6666
"geom_crossbar(middle.linewidth)"
6767
)

R/geom-errorbar.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -77,7 +77,7 @@ GeomErrorbar <- ggproto(
7777
GeomErrorbarh <- ggproto(
7878
"GeomErrorbarh", GeomErrorbar,
7979
setup_params = function(data, params) {
80-
deprecate_soft0(
80+
deprecate(
8181
"4.0.0", "geom_errorbarh()", "geom_errorbar(orientation = \"y\")",
8282
id = "no-more-errorbarh"
8383
)
@@ -95,7 +95,7 @@ geom_errorbar <- make_constructor(GeomErrorbar, orientation = NA)
9595
#' `geom_errorbarh()` is `r lifecycle::badge("deprecated")`. Use
9696
#' `geom_errorbar(orientation = "y")` instead.
9797
geom_errorbarh <- function(..., orientation = "y") {
98-
deprecate_soft0(
98+
deprecate(
9999
"4.0.0", "geom_errorbarh()", "geom_errorbar(orientation = \"y\")",
100100
id = "no-more-errorbarh"
101101
)

0 commit comments

Comments
 (0)