Skip to content

Commit f745098

Browse files
committed
sprinkle signal_stage("superseded") all over
1 parent cc8a16c commit f745098

File tree

5 files changed

+7
-1
lines changed

5 files changed

+7
-1
lines changed

R/annotation-logticks.R

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -93,6 +93,8 @@ annotation_logticks <- function(base = 10, sides = "bl", outside = FALSE, scaled
9393
if (!is.null(color))
9494
colour <- color
9595

96+
lifecycle::signal_stage("superseded", "annotation_logticks()", "guide_axis_logticks()")
97+
9698
if (lifecycle::is_present(size)) {
9799
deprecate_soft0("3.5.0", I("Using the `size` aesthetic in this geom"), I("`linewidth`"))
98100
linewidth <- linewidth %||% size

R/coord-flip.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -57,6 +57,7 @@
5757
#' geom_area() +
5858
#' coord_flip()
5959
coord_flip <- function(xlim = NULL, ylim = NULL, expand = TRUE, clip = "on") {
60+
lifecycle::signal_stage("superseded", "coord_flip()")
6061
check_coord_limits(xlim)
6162
check_coord_limits(ylim)
6263
ggproto(NULL, CoordFlip,

R/coord-map.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -136,7 +136,7 @@ coord_map <- function(projection="mercator", ..., parameters = NULL, orientation
136136
} else {
137137
params <- parameters
138138
}
139-
139+
lifecycle::signal_stage("superseded", "coord_map()", "coord_sf()")
140140
check_coord_limits(xlim)
141141
check_coord_limits(ylim)
142142

R/coord-polar.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -3,6 +3,7 @@
33
coord_polar <- function(theta = "x", start = 0, direction = 1, clip = "on") {
44
theta <- arg_match0(theta, c("x", "y"))
55
r <- if (theta == "x") "y" else "x"
6+
lifecycle::signal_stage("superseded", "coord_polar()", "coord_radial()")
67

78
ggproto(NULL, CoordPolar,
89
theta = theta,

R/limits.R

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -184,6 +184,8 @@ limits.POSIXlt <- function(lims, var, call = caller_env()) {
184184
expand_limits <- function(...) {
185185
data <- list2(...)
186186

187+
lifecycle::signal_stage("superseded", "expand_limits()")
188+
187189
# unpack data frame columns
188190
data_dfs <- vapply(data, is.data.frame, logical(1))
189191
data <- unlist(c(list(data[!data_dfs]), data[data_dfs]), recursive = FALSE)

0 commit comments

Comments
 (0)