Skip to content

Commit 5600c77

Browse files
committed
1 parent c50b726 commit 5600c77

File tree

4 files changed

+13
-5
lines changed

4 files changed

+13
-5
lines changed

DESCRIPTION

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -24,7 +24,7 @@ Imports:
2424
hardhat (>= 1.2.0),
2525
lifecycle (>= 1.0.3),
2626
modelenv (>= 0.1.0),
27-
parsnip (>= 1.0.3),
27+
parsnip (>= 1.1.0.9001),
2828
rlang (>= 1.0.3),
2929
tidyselect (>= 1.2.0),
3030
vctrs (>= 0.4.1)

R/broom.R

Lines changed: 6 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -109,6 +109,10 @@ glance.workflow <- function(x, ...) {
109109
#'
110110
#' @return `new_data` with new prediction specific columns.
111111
#'
112+
#' @param eval_time For censored regression models, a vector of time points at
113+
#' which the survival probability is estimated. See
114+
#' [parsnip::augment.model_fit()] for more details.
115+
#'
112116
#' @export
113117
#' @examples
114118
#' if (rlang::is_installed("broom")) {
@@ -133,13 +137,13 @@ glance.workflow <- function(x, ...) {
133137
#' augment(wf_fit, attrition)
134138
#'
135139
#' }
136-
augment.workflow <- function(x, new_data, ...) {
140+
augment.workflow <- function(x, new_data, eval_time = NULL, ...) {
137141
fit <- extract_fit_parsnip(x)
138142

139143
# `augment.model_fit()` requires the pre-processed `new_data`
140144
predictors <- forge_predictors(new_data, x)
141145
predictors <- prepare_augment_predictors(predictors)
142-
predictors_and_predictions <- augment(fit, predictors, ...)
146+
predictors_and_predictions <- augment(fit, predictors, eval_time = eval_time, ...)
143147

144148
prediction_columns <- setdiff(
145149
names(predictors_and_predictions),

man/augment.workflow.Rd

Lines changed: 5 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/predict-workflow.Rd

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

0 commit comments

Comments
 (0)