Skip to content

Commit 8f13c1c

Browse files
Merge pull request #1038 from tidymodels/move-.censoring_weights_graf.workflow
2 parents 326e15a + 7d4d10c commit 8f13c1c

File tree

4 files changed

+1
-25
lines changed

4 files changed

+1
-25
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.1.1.9006
3+
Version: 1.1.1.9007
44
Authors@R: c(
55
person("Max", "Kuhn", , "max@posit.co", role = c("aut", "cre")),
66
person("Davis", "Vaughan", , "davis@posit.co", role = "aut"),

NAMESPACE

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -2,7 +2,6 @@
22

33
S3method(.censoring_weights_graf,default)
44
S3method(.censoring_weights_graf,model_fit)
5-
S3method(.censoring_weights_graf,workflow)
65
S3method(augment,model_fit)
76
S3method(autoplot,glmnet)
87
S3method(autoplot,model_fit)

R/survival-censoring-weights.R

Lines changed: 0 additions & 13 deletions
Original file line numberDiff line numberDiff line change
@@ -178,19 +178,6 @@ graf_weight_time_vec <- function(surv_obj, eval_time, eps = 10^-10) {
178178
rlang::abort(msg)
179179
}
180180

181-
182-
#' @export
183-
#' @rdname censoring_weights
184-
.censoring_weights_graf.workflow <- function(object,
185-
predictions,
186-
cens_predictors = NULL,
187-
trunc = 0.05, eps = 10^-10, ...) {
188-
if (is.null(object$fit$fit)) {
189-
rlang::abort("The workflow does not have a model fit object.")
190-
}
191-
.censoring_weights_graf(object$fit$fit, predictions, cens_predictors, trunc, eps)
192-
}
193-
194181
#' @export
195182
#' @rdname censoring_weights
196183
.censoring_weights_graf.model_fit <- function(object,

man/censoring_weights.Rd

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

0 commit comments

Comments
 (0)