R/defunct.R

Defines functions facet_plot get_timespan get_interval get_n build_incidence validate_incidence new_incidence

Documented in build_incidence facet_plot get_interval get_n get_timespan new_incidence validate_incidence

#' Functions now defunct in package incidence2
#'
#' These functions are now defunct.
#'
#' @name incidence2-defunct
#' @keywords internal
NULL



# -------------------------------------------------------------------------
#' @rdname incidence2-defunct
#' @export
new_incidence <- function(
    x,
    date,
    groups = NULL,
    counts,
    measurements = NULL,
    validate = TRUE
) {
    .Defunct(
        msg = sprintf(
            "`%s` is defunct and has been removed from incidence2.",
            as.character(sys.call()[1L])
        )
    )
}

# -------------------------------------------------------------------------
#' @rdname incidence2-defunct
#' @export
validate_incidence <- function(x) {
    .Defunct(
        msg = sprintf(
            "`%s` is defunct and has been removed from incidence2.",
            as.character(sys.call()[1L])
        )
    )
}

# -------------------------------------------------------------------------
#' @rdname incidence2-defunct
#' @export
build_incidence <- function(
    x,
    date_index,
    groups = NULL,
    counts = NULL,
    na_as_group = TRUE,
    FUN = identity,
    args = list()
) {
    .Defunct(
        msg = sprintf(
            "`%s` is defunct and has been removed from incidence2.",
            as.character(sys.call()[1L])
        )
    )
}

# -------------------------------------------------------------------------
#' @rdname incidence2-defunct
get_n <- function(x) {
    .Defunct(
        msg = sprintf(
            "`%s` is defunct and has been removed from incidence2.",
            as.character(sys.call()[1L])
        )
    )
}

# -------------------------------------------------------------------------
#' @rdname incidence2-defunct
#' @export
get_interval <- function(x, ...) {
    .Defunct(
        msg = sprintf(
            "`%s` is defunct and has been removed from incidence2.",
            as.character(sys.call()[1L])
        )
    )
}

# -------------------------------------------------------------------------
#' @rdname incidence2-defunct
#' @export
get_timespan <- function(x, ...) {
    .Defunct(
        msg = sprintf(
            "`%s` is defunct and has been removed from incidence2.",
            as.character(sys.call()[1L])
        )
    )
}

# -------------------------------------------------------------------------
#' @rdname incidence2-defunct
#' @export
facet_plot <- function(x, ...) {
    .Defunct(
        msg = sprintf(
            "`%s` is defunct and has been removed from incidence2.",
            as.character(sys.call()[1L])
        )
    )
}

Try the incidence2 package in your browser

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

incidence2 documentation built on July 9, 2023, 5:35 p.m.