Skip to content

Commit

Permalink
update arg names and accept new tests
Browse files Browse the repository at this point in the history
  • Loading branch information
JamesHWade committed Aug 15, 2024
1 parent 635ff72 commit 0093a28
Show file tree
Hide file tree
Showing 3 changed files with 2 additions and 32 deletions.
2 changes: 1 addition & 1 deletion R/rsplit.R
Original file line number Diff line number Diff line change
Expand Up @@ -105,7 +105,7 @@ as.data.frame.rsplit <-
rsplit_class <- class(x)[[1]]
cli_abort(
"There is no assessment data set for an {.arg rsplit} object
with class {rsplit_class}."
with class {.cls {rsplit_class}}."
)
}
ind <- as.integer(x, data = data, ...)
Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/_snaps/permutations.md
Original file line number Diff line number Diff line change
Expand Up @@ -4,7 +4,7 @@
assessment(xx$splits[[1]])
Condition
Error in `as.data.frame()`:
! There is no assessment data set for an `rsplit` object with class `perm_split`.
! There is no assessment data set for an `rsplit` object with class <perm_split>.

# printing

Expand Down
30 changes: 0 additions & 30 deletions tests/testthat/_snaps/permutations.new.md

This file was deleted.

0 comments on commit 0093a28

Please sign in to comment.