File tree Expand file tree Collapse file tree 2 files changed +0
-22
lines changed Expand file tree Collapse file tree 2 files changed +0
-22
lines changed Original file line number Diff line number Diff line change @@ -11,7 +11,6 @@ S3method(extract_parameter_dials,model_spec)
1111S3method(extract_parameter_set_dials,model_spec)
1212S3method(extract_spec_parsnip,model_fit)
1313S3method(fit,model_spec)
14- S3method(fit_xy,decision_tree)
1514S3method(fit_xy,gen_additive_mod)
1615S3method(fit_xy,model_spec)
1716S3method(glance,model_fit)
Original file line number Diff line number Diff line change @@ -135,27 +135,6 @@ check_args.decision_tree <- function(object) {
135135
136136# ------------------------------------------------------------------------------
137137
138- # ' @export
139- fit_xy.decision_tree <- function (object ,
140- x ,
141- y ,
142- case_weights = NULL ,
143- control = parsnip :: control_parsnip(),
144- ... ) {
145-
146- if (object $ mode == " censored regression" && object $ engine == " rpart" ) {
147- # prodlim::EventHistory.frame() expects a call to `Surv()` (or `Hist()`) on
148- # the left-hand side of the formula
149- rlang :: abort(" For the `'rpart'` engine, please use the formula interface via `fit()`." )
150- }
151-
152- # call parsnip::fit_xy.model_spec()
153- res <- NextMethod()
154- res
155- }
156-
157- # ------------------------------------------------------------------------------
158-
159138# ' Decision trees via rpart
160139# '
161140# ' `rpart_train` is a wrapper for `rpart()` tree-based models
You can’t perform that action at this time.
0 commit comments