|
5 | 5 | #' For some models, predictions can be made on sub-models in the model object. |
6 | 6 | #' @param object A `model_fit` object. |
7 | 7 | #' @param new_data A rectangular data object, such as a data frame. |
8 | | -#' @param type A single character value or `NULL`. Possible values |
9 | | -#' are "numeric", "class", "prob", "conf_int", "pred_int", "quantile", |
10 | | -#' or "raw". When `NULL`, `predict()` will choose an appropriate value |
11 | | -#' based on the model's mode. |
| 8 | +#' @param type A single character value or `NULL`. Possible values are |
| 9 | +#' `"numeric"`, `"class"`, `"prob"`, `"conf_int"`, `"pred_int"`, `"quantile"`, |
| 10 | +#' or `"raw"`. When `NULL`, `predict()` will choose an appropriate value |
| 11 | +#' based on the model's mode. |
12 | 12 | #' @param ... Optional arguments to pass to `predict.model_fit(type = "raw")` |
13 | 13 | #' such as `type`. |
14 | 14 | #' @return A tibble with the same number of rows as the data being predicted. |
@@ -49,7 +49,7 @@ predict.model_spec <- function(object, ...) { |
49 | 49 | #' @param object An object to test. |
50 | 50 | #' @param ... Not currently used. |
51 | 51 | #' @return `has_multi_predict()` returns single logical value while |
52 | | -#' `multi_predict()` returns a character vector of argument names (or `NA` |
| 52 | +#' `multi_predict_args()` returns a character vector of argument names (or `NA` |
53 | 53 | #' if none exist). |
54 | 54 | #' @keywords internal |
55 | 55 | #' @examples |
@@ -135,5 +135,4 @@ multi_predict_args.model_fit <- function(object, ...) { |
135 | 135 | #' @rdname has_multi_predict |
136 | 136 | multi_predict_args.workflow <- function(object, ...) { |
137 | 137 | object <- object$fit$model$model |
138 | | - |
139 | 138 | } |
0 commit comments