Skip to content

Commit 7d78009

Browse files
authored
Merge pull request #511 from tidymodels/multi_predict-doc
fix function name in docs for `multi_predict()` tools
2 parents 0d0dd4c + f55351f commit 7d78009

File tree

3 files changed

+9
-10
lines changed

3 files changed

+9
-10
lines changed

R/aaa_multi_predict.R

Lines changed: 5 additions & 6 deletions
Original file line numberDiff line numberDiff line change
@@ -5,10 +5,10 @@
55
#' For some models, predictions can be made on sub-models in the model object.
66
#' @param object A `model_fit` object.
77
#' @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.
1212
#' @param ... Optional arguments to pass to `predict.model_fit(type = "raw")`
1313
#' such as `type`.
1414
#' @return A tibble with the same number of rows as the data being predicted.
@@ -49,7 +49,7 @@ predict.model_spec <- function(object, ...) {
4949
#' @param object An object to test.
5050
#' @param ... Not currently used.
5151
#' @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`
5353
#' if none exist).
5454
#' @keywords internal
5555
#' @examples
@@ -135,5 +135,4 @@ multi_predict_args.model_fit <- function(object, ...) {
135135
#' @rdname has_multi_predict
136136
multi_predict_args.workflow <- function(object, ...) {
137137
object <- object$fit$model$model
138-
139138
}

man/has_multi_predict.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.

man/multi_predict.Rd

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

0 commit comments

Comments
 (0)