Skip to content

Commit

Permalink
Update lifecycle status "retired" to "superseded" (#310)
Browse files Browse the repository at this point in the history
* Replace the word "retired" with "superseded"

* usethis::use_lifecycle()

* Use `r lifecycle::badge('superseded')`

Part of #308
  • Loading branch information
yutannihilation authored Mar 16, 2022
1 parent 677aee5 commit 7016e81
Show file tree
Hide file tree
Showing 33 changed files with 37 additions and 36 deletions.
1 change: 1 addition & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -166,4 +166,5 @@ importFrom(graphics,plot)
importFrom(graphics,rect)
importFrom(graphics,text)
importFrom(lifecycle,deprecate_soft)
importFrom(lifecycle,deprecated)
importFrom(munsell,mnsl)
6 changes: 3 additions & 3 deletions R/breaks-retired.R
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
#' Regularly spaced dates
#'
#' \Sexpr[results=rd, stage=render]{lifecycle::badge("retired")}
#' `r lifecycle::badge('superseded')`
#' Use `breaks_width()` instead.
#'
#' @param width an interval specification, one of "sec", "min", "hour",
Expand All @@ -15,7 +15,7 @@ date_breaks <- function(width = "1 month") {

#' Pretty breaks on transformed scale
#'
#' \Sexpr[results=rd, stage=render]{lifecycle::badge("retired")}
#' `r lifecycle::badge('superseded')`
#' These often do not produce very attractive breaks.
#'
#' @param trans function of single variable, `x`, that given a numeric
Expand All @@ -42,7 +42,7 @@ trans_breaks <- function(trans, inv, n = 5, ...) {

#' Compute breaks for continuous scale
#'
#' \Sexpr[results=rd, stage=render]{lifecycle::badge("retired")}
#' `r lifecycle::badge('superseded')`
#' This function wraps up the components needed to go from a continuous range
#' to a set of breaks and labels suitable for display on axes or legends.
#'
Expand Down
2 changes: 1 addition & 1 deletion R/breaks.r
Original file line number Diff line number Diff line change
Expand Up @@ -75,7 +75,7 @@ extended_breaks <- breaks_extended
#' primarily useful for date/times, as [extended_breaks()] should do a slightly
#' better job for numeric scales.
#'
#' `pretty_breaks()` is retired; use `breaks_pretty()` instead.
#' `pretty_breaks()` is superseded; use `breaks_pretty()` instead.
#'
#' @inheritParams breaks_extended
#' @param ... other arguments passed on to [pretty()]
Expand Down
2 changes: 1 addition & 1 deletion R/label-date.R
Original file line number Diff line number Diff line change
Expand Up @@ -9,7 +9,7 @@
#' `date_short()` formats changes (e.g. new month, new year) specially.
#'
#' @section Old interface:
#' `date_format()` and `time_format()` are retired; please use `label_date()`
#' `date_format()` and `time_format()` are superseded; please use `label_date()`
#' and `label_time()` instead.
#' @inherit number_format return
#' @param format For `date_format()` and `time_format()` a date/time format
Expand Down
2 changes: 1 addition & 1 deletion R/label-dollar.R
Original file line number Diff line number Diff line change
Expand Up @@ -4,7 +4,7 @@
#' a convenient heuristic.
#'
#' @section Old interface:
#' `dollar()` and `format_dollar()` are retired; please use `label_dollar()`
#' `dollar()` and `format_dollar()` are superseded; please use `label_dollar()`
#' instead.
#'
#' @inherit number_format return params
Expand Down
2 changes: 1 addition & 1 deletion R/label-expression.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
#' with each string.
#'
#' @section Old interface:
#' `parse_format()` and `math_format()` was retired; please use
#' `parse_format()` and `math_format()` was superseded; please use
#' `label_parse()` and `label_math()` instead.
#' @inherit number_format return
#' @seealso [plotmath] for the details of mathematical formatting in R.
Expand Down
2 changes: 1 addition & 1 deletion R/label-number.r
Original file line number Diff line number Diff line change
Expand Up @@ -14,7 +14,7 @@
#' they work similarly for all scales, including those that generate legends
#' rather than axes.
#' @section Old interface:
#' `number_format()`, `comma_format()`, and `comma()` are retired; please use
#' `number_format()`, `comma_format()`, and `comma()` are superseded; please use
#' `label_number()` and `label_comma()` instead.
#' @param x A numeric vector to format.
#' @param accuracy A number to round to. Use (e.g.) `0.01` to show 2 decimal
Expand Down
2 changes: 1 addition & 1 deletion R/label-ordinal.R
Original file line number Diff line number Diff line change
Expand Up @@ -4,7 +4,7 @@
#' 3rd). Built-in rules are provided for English, French, and Spanish.
#'
#' @section Old interface:
#' `ordinal()` and `format_ordinal()` are retired; please use `label_ordinal()`
#' `ordinal()` and `format_ordinal()` are superseded; please use `label_ordinal()`
#' instead.
#' @inherit number_format return params
#' @param prefix,suffix Symbols to display before and after value.
Expand Down
2 changes: 1 addition & 1 deletion R/label-percent.R
Original file line number Diff line number Diff line change
@@ -1,7 +1,7 @@
#' Label percentages (2.5%, 50%, etc)
#'
#' @section Old interface:
#' `percent()` and `percent_format()` are retired; please use `label_percent()`
#' `percent()` and `percent_format()` are superseded; please use `label_percent()`
#' instead.
#' @inherit number_format return params
#' @export
Expand Down
2 changes: 1 addition & 1 deletion R/label-pvalue.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,7 @@
#' Formatter for p-values, using "<" and ">" for p-values close to 0 and 1.
#'
#' @section Old interface:
#' `pvalue()` and `pvalue_dollar()` are retired; please use `label_pvalue()`
#' `pvalue()` and `pvalue_dollar()` are superseded; please use `label_pvalue()`
#' instead.
#' @inherit number_format return params
#' @param prefix A character vector of length 3 giving the prefixes to
Expand Down
2 changes: 1 addition & 1 deletion R/label-scientific.R
Original file line number Diff line number Diff line change
@@ -1,7 +1,7 @@
#' Label numbers with scientific notation (e.g. 1e05, 1.5e-02)
#'
#' @section Old interface:
#' `scientific_format()` and `scientific()` are retired; please use
#' `scientific_format()` and `scientific()` are superseded; please use
#' `label_scientific()`.
#' @inherit number_format return params
#' @param digits Number of digits to show before exponent.
Expand Down
2 changes: 1 addition & 1 deletion R/label-wrap.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,7 @@
#' Uses [strwrap()] to split long labels across multiple lines.
#'
#' @section Old interface:
#' `wrap_format()` is retired; please use `label_format()` instead.
#' `wrap_format()` is superseded; please use `label_format()` instead.
#' @inherit number_format return
#' @param width Number of characters per line.
#' @export
Expand Down
8 changes: 4 additions & 4 deletions R/labels-retired.R
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
#' Older interface to `label_bytes()`
#'
#' \Sexpr[results=rd, stage=render]{lifecycle::badge("retired")}
#' `r lifecycle::badge('superseded')`
#' These functions are kept for backward compatibility, but you should switch
#' to [label_bytes()] for new code.
#'
Expand Down Expand Up @@ -66,7 +66,7 @@ validate_byte_symbol <- function(symbol, symbols, default = "auto") {

#' Format labels after transformation
#'
#' \Sexpr[results=rd, stage=render]{lifecycle::badge("retired")}
#' `r lifecycle::badge('superseded')`
#'
#' @param trans transformation to apply
#' @param format additional formatter to apply after transformation
Expand All @@ -90,7 +90,7 @@ trans_format <- function(trans, format = scientific_format()) {

#' Unit labels
#'
#' \Sexpr[results=rd, stage=render]{lifecycle::badge("retired")}
#' `r lifecycle::badge('superseded')`
#' This function is kept for backward compatiblity; you should either use
#' [label_number()] or [label_number_si()] instead.
#'
Expand Down Expand Up @@ -123,7 +123,7 @@ unit_format <- function(accuracy = NULL, scale = 1, prefix = "",

#' Label using `format()`
#'
#' \Sexpr[results=rd, stage=render]{lifecycle::badge("retired")}
#' `r lifecycle::badge('superseded')`
#' This function is kept for backward compatiblity; you should either use
#' [label_number()] or [label_date()] instead.
#'
Expand Down
1 change: 1 addition & 0 deletions R/scales-package.R
Original file line number Diff line number Diff line change
Expand Up @@ -6,5 +6,6 @@
# roxygen namespace tags. Modify with care!
## usethis namespace: start
#' @importFrom lifecycle deprecate_soft
#' @importFrom lifecycle deprecated
## usethis namespace: end
NULL
2 changes: 1 addition & 1 deletion man/breaks_pretty.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/cbreaks.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/date_breaks.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 0 additions & 1 deletion man/figures/lifecycle-soft-deprecated.svg

This file was deleted.

Loading
Sorry, something went wrong. Reload?
Sorry, we cannot display this file.
Sorry, this file is invalid so it cannot be displayed.
2 changes: 1 addition & 1 deletion man/format_format.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/label_date.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/label_dollar.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/label_number.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/label_ordinal.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/label_parse.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/label_percent.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/label_pvalue.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/label_scientific.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/label_wrap.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/number_bytes_format.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/trans_breaks.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/trans_format.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/unit_format.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 7016e81

Please sign in to comment.