Skip to content

Commit 7706503

Browse files
committed
times -> eval_time
1 parent 8082b41 commit 7706503

File tree

1 file changed

+3
-3
lines changed

1 file changed

+3
-3
lines changed

R/grid_helpers.R

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -95,7 +95,7 @@ predict_model <- function(split, workflow, grid, metrics, submodels = NULL,
9595
tibble::as_tibble(res)
9696
}
9797

98-
predict_wrapper <- function(model, new_data, type, times, subgrid = NULL) {
98+
predict_wrapper <- function(model, new_data, type, eval_time, subgrid = NULL) {
9999
if (is.null(subgrid)) {
100100
fn <- "predict.model_fit"
101101
} else {
@@ -112,8 +112,8 @@ predict_wrapper <- function(model, new_data, type, times, subgrid = NULL) {
112112

113113
# Add in censored regression evaluation times (if needed)
114114
has_type <- type %in% c("survival", "hazard")
115-
if (model$spec$mode == "censored regression" & !is.null(times) & has_type) {
116-
cl <- rlang::call_modify(cl, time = times)
115+
if (model$spec$mode == "censored regression" & !is.null(eval_time) & has_type) {
116+
cl <- rlang::call_modify(cl, time = eval_time)
117117
}
118118

119119
# When there are sub-models:

0 commit comments

Comments
 (0)