R/deprecated.R

Defines functions update_ard_fmt_fn alias_as_fmt_fn apply_fmt_fn ard_dichotomous.data.frame ard_complex.data.frame ard_categorical.data.frame ard_continuous.data.frame ard_dichotomous ard_complex ard_categorical ard_continuous

Documented in alias_as_fmt_fn apply_fmt_fn ard_categorical ard_categorical.data.frame ard_complex ard_complex.data.frame ard_continuous ard_continuous.data.frame ard_dichotomous ard_dichotomous.data.frame update_ard_fmt_fn

#' Deprecated functions
#'
#' @description
#' `r lifecycle::badge('deprecated')`\cr
#' Some functions have been deprecated and are no longer being actively
#' supported.
#'
#' **Renamed functions**
#'  - `ard_categorical()` to `ard_tabulate()`
#'  - `ard_continuous()` to `ard_summary()`
#'  - `ard_complex()` to `ard_mvsummary()`
#'  - `apply_fmt_fn()` to `apply_fmt_fun()`
#'  - `alias_as_fmt_fn()` to `alias_as_fmt_fun()`
#'  - `update_ard_fmt_fn()` to `update_ard_fmt_fun()`
#'
#' **Deprecated functions**
#'  - `shuffle_ard()`
#'
#' @name deprecated
NULL

# "soft" deprecation for 6 months: (Sys.Date() - lubridate::dmonths(6)) |> as.Date()
#  v0.6.1 2025-07-03
#  v0.6.0 2025-04-11
#  v0.5.1 2025-03-01

# "warn" deprecation for 12 months: (Sys.Date() - lubridate::dmonths(12)) |> as.Date()
#  v0.5.0 2025-02-17

# "stop" deprecation for 18 months: (Sys.Date() - lubridate::dmonths(18)) |> as.Date()

# v0.7.0 -----------------------------------------------------------------------
# These were dropped from the documentation in v0.7.0. But were not officially deprecated
#' @param data,... `r lifecycle::badge('deprecated')`
#' @rdname deprecated
#' @export
ard_continuous <- function(data, ...) {
  check_not_missing(data)
  UseMethod("ard_continuous")
}

#' @param data,... `r lifecycle::badge('deprecated')`
#' @rdname deprecated
#' @export
ard_categorical <- function(data, ...) {
  check_not_missing(data)
  UseMethod("ard_categorical")
}

#' @param data,... `r lifecycle::badge('deprecated')`
#' @rdname deprecated
#' @export
ard_complex <- function(data, ...) {
  check_not_missing(data)
  UseMethod("ard_complex")
}

#' @param data,... `r lifecycle::badge('deprecated')`
#' @rdname deprecated
#' @export
ard_dichotomous <- function(data, ...) {
  check_not_missing(data)
  UseMethod("ard_dichotomous")
}

#' @param data,... `r lifecycle::badge('deprecated')`
#' @rdname deprecated
#' @export
ard_continuous.data.frame <- function(data, ...) {
  ard_summary(data = data, ...) |>
    dplyr::mutate(context = "continuous")
}

#' @param data,... `r lifecycle::badge('deprecated')`
#' @rdname deprecated
#' @export
ard_categorical.data.frame <- function(data, ...) {
  ard_tabulate(data = data, ...) |>
    dplyr::mutate(context = "categorical")
}

#' @param data,... `r lifecycle::badge('deprecated')`
#' @rdname deprecated
#' @export
ard_complex.data.frame <- function(data, ...) {
  ard_mvsummary(data = data, ...) |>
    dplyr::mutate(context = "complex")
}

#' @param data,... `r lifecycle::badge('deprecated')`
#' @rdname deprecated
#' @export
ard_dichotomous.data.frame <- function(data, ...) {
  ard_tabulate_value(data = data, ...) |>
    dplyr::mutate(context = "dichotomous")
}

# v0.6.1 -----------------------------------------------------------------------
#' @rdname deprecated
#' @export
apply_fmt_fn <- function(...) {
  lifecycle::deprecate_soft(
    when = "0.6.1",
    what = "cards::apply_fmt_fn()",
    with = "apply_fmt_fun()"
  )

  apply_fmt_fun(...)
}

#' @rdname deprecated
#' @export
alias_as_fmt_fn <- function(...) {
  lifecycle::deprecate_soft(
    when = "0.6.1",
    what = "cards::alias_as_fmt_fn()",
    with = "alias_as_fmt_fun()"
  )

  alias_as_fmt_fun(...)
}

#' @rdname deprecated
#' @export
update_ard_fmt_fn <- function(...) {
  lifecycle::deprecate_soft(
    when = "0.6.1",
    what = "cards::update_ard_fmt_fn()",
    with = "update_ard_fmt_fun()"
  )

  alias_as_fmt_fun(...)
}

Try the cards package in your browser

Any scripts or data that you put into this service are public.

cards documentation built on Dec. 2, 2025, 9:07 a.m.