Skip to content

Commit 30c1fa7

Browse files
committed
avoid conflicts with xgboost::slice
1 parent d0cced3 commit 30c1fa7

File tree

2 files changed

+5
-5
lines changed

2 files changed

+5
-5
lines changed

man/predict.model_fit.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.

tests/testthat/test_multinom_reg_glmnet.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -143,8 +143,8 @@ test_that('glmnet probabilities, mulitiple lambda', {
143143

144144
for (i in seq_along(mult_class_res$.pred)) {
145145
expect_equal(
146-
mult_class %>% slice(i) %>% pull(.pred) %>% purrr::pluck(1) %>% dplyr::select(starts_with(".pred")),
147-
mult_class_res %>% slice(i) %>% pull(.pred) %>% purrr::pluck(1) %>% dplyr::select(starts_with(".pred"))
146+
mult_class %>% dplyr::slice(i) %>% pull(.pred) %>% purrr::pluck(1) %>% dplyr::select(starts_with(".pred")),
147+
mult_class_res %>% dplyr::slice(i) %>% pull(.pred) %>% purrr::pluck(1) %>% dplyr::select(starts_with(".pred"))
148148
)
149149
}
150150

0 commit comments

Comments
 (0)