Skip to content

Commit ebc0e73

Browse files
committed
address test failures
1 parent 9a44b32 commit ebc0e73

File tree

2 files changed

+6
-0
lines changed

2 files changed

+6
-0
lines changed

tests/testthat/test-linear_reg.R

+5
Original file line numberDiff line numberDiff line change
@@ -313,6 +313,11 @@ test_that('show engine', {
313313
})
314314

315315
test_that('lm can handle rankdeficient predictions', {
316+
skip_if(
317+
paste0(R.Version()[c("major", "minor")], collapse = ".") < "4.3.0",
318+
"R doesn't raise the rank-deficient warning in this R version"
319+
)
320+
316321
data <- data.frame(
317322
y = c(1,2,3,4),
318323
x1 = c(1,1,2,3),

tests/testthat/test-predict_formats.R

+1
Original file line numberDiff line numberDiff line change
@@ -98,6 +98,7 @@ test_that('non-factor classification', {
9898
data = hpc %>% dplyr::mutate(class = ifelse(class == "VF", 1, 0)))
9999
)
100100

101+
skip_if_not_installed("glmnet")
101102
expect_snapshot(
102103
error = TRUE,
103104
multinom_reg() %>%

0 commit comments

Comments
 (0)