2828# ' and "pred_int". Default value is `FALSE`.
2929# ' \item `quantile`: the quantile(s) for quantile regression
3030# ' (not implemented yet)
31- # ' \item `. time`: the time(s) for hazard and survival probability estimates.
31+ # ' \item `time`: the time(s) for hazard and survival probability estimates.
3232# ' }
3333# ' @details If "type" is not supplied to `predict()`, then a choice
3434# ' is made:
4848# '
4949# ' ## Censored regression predictions
5050# '
51- # ' For censored regression, a numeric vector for `. time` is required when
51+ # ' For censored regression, a numeric vector for `time` is required when
5252# ' survival or hazard probabilities are requested. Also, when
5353# ' `type = "linear_pred"`, censored regression models will be formatted such
5454# ' that the linear predictor _increases_ with time. This may have the opposite
@@ -309,7 +309,7 @@ check_pred_type_dots <- function(type, ...) {
309309
310310 # ----------------------------------------------------------------------------
311311
312- other_args <- c(" level" , " std_error" , " quantile" , " . time" )
312+ other_args <- c(" level" , " std_error" , " quantile" , " time" )
313313 is_pred_arg <- names(the_dots ) %in% other_args
314314 if (any(! is_pred_arg )) {
315315 bad_args <- names(the_dots )[! is_pred_arg ]
@@ -323,21 +323,21 @@ check_pred_type_dots <- function(type, ...) {
323323 }
324324
325325 # ----------------------------------------------------------------------------
326- # places where . time should not be given
327- if (any(nms == " . time" ) & ! type %in% c(" survival" , " hazard" )) {
326+ # places where time should not be given
327+ if (any(nms == " time" ) & ! type %in% c(" survival" , " hazard" )) {
328328 rlang :: abort(
329329 paste(
330- " . time should only be passed to `predict()` when 'type' is one of:" ,
330+ " ' time' should only be passed to `predict()` when 'type' is one of:" ,
331331 paste0(" '" , c(" survival" , " hazard" ), " '" , collapse = " , " )
332332 )
333333 )
334334 }
335- # when . time should be passed
336- if (! any(nms == " . time" ) & type %in% c(" survival" , " hazard" )) {
335+ # when time should be passed
336+ if (! any(nms == " time" ) & type %in% c(" survival" , " hazard" )) {
337337 rlang :: abort(
338338 paste(
339339 " When using 'type' values of 'survival' or 'hazard' are given," ,
340- " a numeric vector '. time' should also be given."
340+ " a numeric vector 'time' should also be given."
341341 )
342342 )
343343 }
0 commit comments