diff --git a/tests/testthat/test-tab_options.R b/tests/testthat/test-tab_options.R index 88d80d09bb..df0eb8730b 100644 --- a/tests/testthat/test-tab_options.R +++ b/tests/testthat/test-tab_options.R @@ -650,14 +650,14 @@ test_that("the internal `opts_df` table can be correctly modified", { expect_equal(c("4px", "3px")) # Modify the `row.striping.include_stub` option - tbl_html <- data %>% tab_options(row.striping.include_stub = FALSE) + tbl_html <- data %>% tab_options(row.striping.include_stub = TRUE) # Compare before and after values c(opts_df_1 %>% dplyr::filter(parameter == "row_striping_include_stub") %>% dplyr::pull(value), attr(tbl_html, "opts_df", exact = TRUE) %>% dplyr::filter(parameter == "row_striping_include_stub") %>% dplyr::pull(value)) %>% - expect_equal(c("TRUE", "FALSE")) + expect_equal(c("FALSE", "TRUE")) # Modify the `row.striping.include_table_body` option tbl_html <- data %>% tab_options(row.striping.include_table_body = FALSE) diff --git a/tests/testthat/test-util_functions.R b/tests/testthat/test-util_functions.R index 8905fd7917..8c76231995 100644 --- a/tests/testthat/test-util_functions.R +++ b/tests/testthat/test-util_functions.R @@ -361,7 +361,7 @@ test_that("the `get_css_tbl()` function works correctly", { css_tbl %>% expect_is(c("tbl_df", "tbl", "data.frame")) - css_tbl %>% dim() %>% expect_equal(c(103, 4)) + css_tbl %>% dim() %>% expect_equal(c(102, 4)) css_tbl %>% colnames() %>%