Skip to content

Commit

Permalink
fix indentation
Browse files Browse the repository at this point in the history
  • Loading branch information
hfrick committed Sep 19, 2024
1 parent 6a5e519 commit 23200c5
Show file tree
Hide file tree
Showing 2 changed files with 9 additions and 9 deletions.
12 changes: 6 additions & 6 deletions tests/testthat/test-bootci.R
Original file line number Diff line number Diff line change
Expand Up @@ -175,12 +175,12 @@ test_that(
skip("until we don't get a message about loading purrr in the snapshot in R CMD check hard")
# unskip this by moving the expectation back into the test_that block above
set.seed(456765)
bt_small <-
bootstraps(dat, times = 10, apparent = TRUE) %>%
dplyr::mutate(
stats = purrr::map(splits, ~ get_stats(.x)),
junk = 1:11
)
bt_small <-
bootstraps(dat, times = 10, apparent = TRUE) %>%
dplyr::mutate(
stats = purrr::map(splits, ~ get_stats(.x)),
junk = 1:11
)

expect_snapshot(int_bca(bt_small, stats, .fn = get_stats))
}
Expand Down
6 changes: 3 additions & 3 deletions tests/testthat/test-reg_intervals.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,9 +3,9 @@ test_that("regression intervals", {
skip_on_cran()

expect_no_error({
set.seed(1)
int_1 <- reg_intervals(mpg ~ disp + wt, data = mtcars)
})
set.seed(1)
int_1 <- reg_intervals(mpg ~ disp + wt, data = mtcars)
})

expect_equal(
names(int_1),
Expand Down

0 comments on commit 23200c5

Please sign in to comment.