Skip to content

Commit e80c2a3

Browse files
authored
Merge pull request #841 from tidymodels/remove-fit_xy.rand_forest
Remove `fit_xy.rand_forest()`
2 parents 61d0097 + e9bfe67 commit e80c2a3

File tree

4 files changed

+13
-23
lines changed

4 files changed

+13
-23
lines changed

DESCRIPTION

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
Package: parsnip
22
Title: A Common API to Modeling and Analysis Functions
3-
Version: 1.0.2.9004
3+
Version: 1.0.2.9005
44
Authors@R: c(
55
person("Max", "Kuhn", , "max@rstudio.com", role = c("aut", "cre")),
66
person("Davis", "Vaughan", , "davis@rstudio.com", role = "aut"),

NAMESPACE

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -9,7 +9,6 @@ S3method(fit,model_spec)
99
S3method(fit_xy,decision_tree)
1010
S3method(fit_xy,gen_additive_mod)
1111
S3method(fit_xy,model_spec)
12-
S3method(fit_xy,rand_forest)
1312
S3method(glance,model_fit)
1413
S3method(has_multi_predict,default)
1514
S3method(has_multi_predict,model_fit)

R/rand_forest.R

Lines changed: 0 additions & 21 deletions
Original file line numberDiff line numberDiff line change
@@ -164,24 +164,3 @@ check_args.rand_forest <- function(object) {
164164
invisible(object)
165165
}
166166

167-
# ------------------------------------------------------------------------------
168-
169-
#' @export
170-
fit_xy.rand_forest <- function(object,
171-
x,
172-
y,
173-
case_weights = NULL,
174-
control = parsnip::control_parsnip(),
175-
...) {
176-
177-
if (object$mode == "censored regression" && object$engine == "aorsf") {
178-
# CRAN aorsf::orsf() requires two variables on the left-hand side of the formula,
179-
# either in as `Surv(time, status) ~ .` or as `time + status ~ .`
180-
# see https://github.com/ropensci/aorsf/issues/11
181-
rlang::abort("For the `'aorsf'` engine, please use the formula interface via `fit()`.")
182-
}
183-
184-
# call parsnip::fit_xy.model_spec()
185-
res <- NextMethod()
186-
res
187-
}

man/details_rand_forest_aorsf.Rd

Lines changed: 12 additions & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)