Skip to content

Commit

Permalink
Also ignore test on SQL server
Browse files Browse the repository at this point in the history
  • Loading branch information
hadley committed Dec 19, 2023
1 parent 1e2ffe0 commit 5ca45de
Showing 1 changed file with 6 additions and 3 deletions.
9 changes: 6 additions & 3 deletions tests/testthat/test-verb-set-ops.R
Original file line number Diff line number Diff line change
Expand Up @@ -110,9 +110,12 @@ test_that("SQLite warns if set op attempted when tbl has LIMIT", {
test_that("other backends can combine with a limit", {
df <- tibble(x = 1:2)

# sqlite only allows limit at top level
tbls_full <- test_load(df, ignore = "sqlite")
tbls_head <- lapply(test_load(df, ignore = "sqlite"), head, n = 1)
ignore <- c(
"sqlite", # only allows limit at top level
"mssql" # unusual execution order gives unintuitive result
)
tbls_full <- test_load(df, ignore = ignore)
tbls_head <- lapply(test_load(df, ignore = ignore), head, n = 1)

tbls_full %>%
purrr::map2(tbls_head, union) %>%
Expand Down

0 comments on commit 5ca45de

Please sign in to comment.