Skip to content

Commit 7a99861

Browse files
committed
document additional arguments
1 parent 7c49991 commit 7a99861

File tree

2 files changed

+6
-0
lines changed

2 files changed

+6
-0
lines changed

R/tailor.R

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -147,8 +147,10 @@ print.tailor <- function(x, ...) {
147147
#' on how tidymodels makes that split; when situated in a model workflow,
148148
#' tailors will automatically be trained on the appropriate subset of data.
149149
#'
150+
#' @param object A [tailor()].
150151
#' @param .data,new_data A data frame containing predictions from a model.
151152
#' @inheritParams tailor
153+
#' @param ... Currently ignored.
152154
#'
153155
#' @export
154156
fit.tailor <- function(object, .data, outcome, estimate, probabilities = c(),

man/fit.tailor.Rd

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

0 commit comments

Comments
 (0)