diff --git a/R/aaa_multi_predict.R b/R/aaa_multi_predict.R index e5b55f99a..6808de21f 100644 --- a/R/aaa_multi_predict.R +++ b/R/aaa_multi_predict.R @@ -5,10 +5,10 @@ #' For some models, predictions can be made on sub-models in the model object. #' @param object A `model_fit` object. #' @param new_data A rectangular data object, such as a data frame. -#' @param type A single character value or `NULL`. Possible values -#' are "numeric", "class", "prob", "conf_int", "pred_int", "quantile", -#' or "raw". When `NULL`, `predict()` will choose an appropriate value -#' based on the model's mode. +#' @param type A single character value or `NULL`. Possible values are +#' `"numeric"`, `"class"`, `"prob"`, `"conf_int"`, `"pred_int"`, `"quantile"`, +#' or `"raw"`. When `NULL`, `predict()` will choose an appropriate value +#' based on the model's mode. #' @param ... Optional arguments to pass to `predict.model_fit(type = "raw")` #' such as `type`. #' @return A tibble with the same number of rows as the data being predicted. @@ -49,7 +49,7 @@ predict.model_spec <- function(object, ...) { #' @param object An object to test. #' @param ... Not currently used. #' @return `has_multi_predict()` returns single logical value while -#' `multi_predict()` returns a character vector of argument names (or `NA` +#' `multi_predict_args()` returns a character vector of argument names (or `NA` #' if none exist). #' @keywords internal #' @examples @@ -135,5 +135,4 @@ multi_predict_args.model_fit <- function(object, ...) { #' @rdname has_multi_predict multi_predict_args.workflow <- function(object, ...) { object <- object$fit$model$model - } diff --git a/man/has_multi_predict.Rd b/man/has_multi_predict.Rd index dbd13e160..e6d613bf6 100644 --- a/man/has_multi_predict.Rd +++ b/man/has_multi_predict.Rd @@ -34,7 +34,7 @@ multi_predict_args(object, ...) } \value{ \code{has_multi_predict()} returns single logical value while -\code{multi_predict()} returns a character vector of argument names (or \code{NA} +\code{multi_predict_args()} returns a character vector of argument names (or \code{NA} if none exist). } \description{ diff --git a/man/multi_predict.Rd b/man/multi_predict.Rd index 80b86e18a..3083d15b7 100644 --- a/man/multi_predict.Rd +++ b/man/multi_predict.Rd @@ -40,9 +40,9 @@ such as \code{type}.} \item{new_data}{A rectangular data object, such as a data frame.} -\item{type}{A single character value or \code{NULL}. Possible values -are "numeric", "class", "prob", "conf_int", "pred_int", "quantile", -or "raw". When \code{NULL}, \code{predict()} will choose an appropriate value +\item{type}{A single character value or \code{NULL}. Possible values are +\code{"numeric"}, \code{"class"}, \code{"prob"}, \code{"conf_int"}, \code{"pred_int"}, \code{"quantile"}, +or \code{"raw"}. When \code{NULL}, \code{predict()} will choose an appropriate value based on the model's mode.} \item{trees}{An integer vector for the number of trees in the ensemble.}