Skip to content

Commit ef9d376

Browse files
authored
transition v0.1.6 and v0.1.8 soft-deprecations to warn (#943)
1 parent eea49dc commit ef9d376

File tree

6 files changed

+11
-28
lines changed

6 files changed

+11
-28
lines changed

NEWS.md

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -26,6 +26,8 @@
2626

2727
* The minimum version for R is now 3.5 (#926).
2828

29+
* Transitioned all soft-deprecations that were at least a year old to warn-deprecations. These changes apply to `fit_control()`, `surv_reg()`, `varying()`, `varying_args()`, and the `"liquidSVM"` engine.
30+
2931
* The `time` argument to `predict_survival()` and `predict_hazard()` is deprecated in favor of the new `eval_time` argument (#936).
3032

3133

R/engines.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -126,7 +126,7 @@ set_engine.model_spec <- function(object, engine, ...) {
126126
}
127127

128128
if (object$engine == "liquidSVM") {
129-
lifecycle::deprecate_soft(
129+
lifecycle::deprecate_warn(
130130
"0.1.6",
131131
"set_engine(engine = 'cannot be liquidSVM')",
132132
details = "The liquidSVM package is no longer available on CRAN.")

R/fit_control.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -27,6 +27,6 @@
2727
#' @export
2828
#' @keywords internal
2929
fit_control <- function(verbosity = 1L, catch = FALSE) {
30-
lifecycle::deprecate_soft("0.1.8", "fit_control()", "control_parsnip()")
30+
lifecycle::deprecate_warn("0.1.8", "fit_control()", "control_parsnip()")
3131
control_parsnip(verbosity = verbosity, catch = catch)
3232
}

R/surv_reg.R

Lines changed: 2 additions & 11 deletions
Original file line numberDiff line numberDiff line change
@@ -3,13 +3,10 @@
33
#' @description
44
#' `r lifecycle::badge("deprecated")`
55
#'
6-
#' This function is soft-deprecated in favor of `survival_reg()` which uses the
6+
#' This function is deprecated in favor of `survival_reg()` which uses the
77
#' `"censored regression"` mode.
88
#'
99
#' `surv_reg()` defines a parametric survival model.
10-
11-
#'
12-
#' \Sexpr[stage=render,results=rd]{parsnip:::make_engine_list("surv_reg")}
1310
#'
1411
#' More information on how \pkg{parsnip} is used for modeling is at
1512
#' \url{https://www.tidymodels.org/}.
@@ -27,17 +24,11 @@
2724
#'
2825
#' @template spec-references
2926
#'
30-
#' @seealso \Sexpr[stage=render,results=rd]{parsnip:::make_seealso_list("surv_reg")}
31-
#'
32-
#' @examples
33-
#' show_engines("surv_reg")
34-
#'
35-
#' surv_reg(mode = "regression", dist = "weibull")
3627
#' @keywords internal
3728
#' @export
3829
surv_reg <- function(mode = "regression", engine = "survival", dist = NULL) {
3930

40-
lifecycle::deprecate_soft("0.1.6", "surv_reg()", "survival_reg()")
31+
lifecycle::deprecate_warn("0.1.6", "surv_reg()", "survival_reg()")
4132

4233
args <- list(
4334
dist = enquo(dist)

R/varying.R

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -7,7 +7,7 @@
77
#' @export
88
#' @keywords internal
99
varying <- function() {
10-
lifecycle::deprecate_soft("0.1.8", "varying()", "hardhat::tune()")
10+
lifecycle::deprecate_warn("0.1.8", "varying()", "hardhat::tune()")
1111
quote(varying())
1212
}
1313

@@ -68,7 +68,7 @@ generics::varying_args
6868
#' @keywords internal
6969
#' @export
7070
varying_args.model_spec <- function(object, full = TRUE, ...) {
71-
lifecycle::deprecate_soft("0.1.8", "varying_args()", "tune_args()")
71+
lifecycle::deprecate_warn("0.1.8", "varying_args()", "tune_args()")
7272

7373
# use the model_spec top level class as the id
7474
id <- class(object)[1]
@@ -104,7 +104,7 @@ varying_args.model_spec <- function(object, full = TRUE, ...) {
104104
#' @export
105105
#' @rdname varying_args
106106
varying_args.recipe <- function(object, full = TRUE, ...) {
107-
lifecycle::deprecate_soft("0.1.8", "varying_args()", "tune_args()")
107+
lifecycle::deprecate_warn("0.1.8", "varying_args()", "tune_args()")
108108

109109
steps <- object$steps
110110

@@ -118,7 +118,7 @@ varying_args.recipe <- function(object, full = TRUE, ...) {
118118
#' @export
119119
#' @rdname varying_args
120120
varying_args.step <- function(object, full = TRUE, ...) {
121-
lifecycle::deprecate_soft("0.1.8", "varying_args()", "tune_args()")
121+
lifecycle::deprecate_warn("0.1.8", "varying_args()", "tune_args()")
122122

123123
# Unique step id
124124
id <- object$id

man/surv_reg.Rd

Lines changed: 1 addition & 11 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)