Skip to content

Commit

Permalink
Merge pull request #248 from tidymodels/fix-make-splits-docs
Browse files Browse the repository at this point in the history
Fix docs for `make_splits()`
  • Loading branch information
juliasilge authored Jun 29, 2021
2 parents a20b0b3 + 715bd97 commit d239343
Show file tree
Hide file tree
Showing 2 changed files with 4 additions and 3 deletions.
4 changes: 2 additions & 2 deletions R/misc.R
Original file line number Diff line number Diff line change
Expand Up @@ -4,13 +4,14 @@ make_splits <- function(x, ...)
UseMethod("make_splits")

#' @rdname make_splits
#' @param x A list of integers with names "analysis" and "assessment", or a
#' data frame of analysis or training data.
#' @export
make_splits.default <- function(x, ...) {
rlang::abort("There is no method available to make an rsplit from `x`.")
}

#' @rdname make_splits
#' @param x A list of integers with names "analysis" and "assessment".
#' @param data A data frame.
#' @param class An optional class to give the object.
#' @param ... Further arguments passed to or from other methods (not currently
Expand All @@ -26,7 +27,6 @@ make_splits.list <- function(x, data, class = NULL, ...) {
}

#' @rdname make_splits
#' @param x A data frame of analysis or training data.
#' @param assessment A data frame of assessment or testing data, which can be empty.
#' @export
make_splits.data.frame <- function(x, assessment, ...) {
Expand Down
3 changes: 2 additions & 1 deletion man/make_splits.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit d239343

Please sign in to comment.