R/survival-censoring-weights.R

Defines functions .censoring_weights_graf.workflow

#' @export
.censoring_weights_graf.workflow <- function(object,
                                             predictions,
                                             cens_predictors = NULL,
                                             trunc = 0.05, eps = 10^-10, ...) {
  if (is.null(object$fit$fit)) {
    rlang::abort("The workflow does not have a model fit object.")
  }
  .censoring_weights_graf(object$fit$fit, predictions, cens_predictors, trunc, eps)
}
tidymodels/workflows documentation built on May 3, 2024, 4:18 a.m.