Skip to content

Commit

Permalink
add mising skip_if_not_installed("lme4")
Browse files Browse the repository at this point in the history
  • Loading branch information
EmilHvitfeldt committed Dec 22, 2024
1 parent a0cf39d commit 58f26a4
Showing 1 changed file with 12 additions and 0 deletions.
12 changes: 12 additions & 0 deletions tests/testthat/test-step_lencode_mixed.R
Original file line number Diff line number Diff line change
@@ -1,6 +1,7 @@
test_that("step_lencode_mixed works", {
skip_if_not_installed("recipes")
skip_if_not_installed("embed")
skip_if_not_installed("lme4")

mtcars <- dplyr::as_tibble(mtcars)
mtcars$gear <- as.factor(mtcars$gear)
Expand All @@ -23,6 +24,7 @@ test_that("step_lencode_mixed works", {
test_that("step_lencode_mixed only calculates what is sufficient", {
skip_if_not_installed("recipes")
skip_if_not_installed("embed")
skip_if_not_installed("lme4")

mtcars <- dplyr::as_tibble(mtcars)
mtcars$gear <- as.factor(mtcars$gear)
Expand All @@ -44,6 +46,7 @@ test_that("step_lencode_mixed only calculates what is sufficient", {
test_that("step_lencode_mixed works with empty selections", {
skip_if_not_installed("recipes")
skip_if_not_installed("embed")
skip_if_not_installed("lme4")

mtcars <- dplyr::as_tibble(mtcars)
mtcars$gear <- as.factor(mtcars$gear)
Expand All @@ -65,7 +68,10 @@ test_that("step_lencode_mixed works with empty selections", {

test_that("spark - step_lencode_mixed works", {
skip_if_not_installed("recipes")
skip_if_not_installed("embed")
skip_if_not_installed("lme4")
skip_if_not_installed("sparklyr")

skip_if(is.na(testthat_spark_env_version()))

mtcars_lencode_mixed <- dplyr::as_tibble(mtcars)
Expand All @@ -91,6 +97,8 @@ test_that("spark - step_lencode_mixed works", {

test_that("SQLite - step_lencode_mixed works", {
skip_if_not_installed("recipes")
skip_if_not_installed("embed")
skip_if_not_installed("lme4")
skip_if_not_installed("DBI")
skip_if_not_installed("RSQLite")
skip_on_cran()
Expand Down Expand Up @@ -120,6 +128,8 @@ test_that("SQLite - step_lencode_mixed works", {

test_that("duckdb - step_lencode_mixed works", {
skip_if_not_installed("recipes")
skip_if_not_installed("embed")
skip_if_not_installed("lme4")
skip_if_not_installed("DBI")
skip_if_not_installed("duckdb")

Expand Down Expand Up @@ -148,6 +158,8 @@ test_that("duckdb - step_lencode_mixed works", {

test_that("arrow - step_lencode_mixed works", {
skip_if_not_installed("recipes")
skip_if_not_installed("embed")
skip_if_not_installed("lme4")
skip_if_not_installed("arrow")

mtcars_lencode_mixed <- dplyr::as_tibble(mtcars)
Expand Down

0 comments on commit 58f26a4

Please sign in to comment.