Skip to content

Commit d329206

Browse files
committed
update snapshot test
1 parent acf63fd commit d329206

File tree

2 files changed

+8
-16
lines changed

2 files changed

+8
-16
lines changed

tests/testthat/_snaps/backend-mssql.md

Lines changed: 2 additions & 16 deletions
Original file line numberDiff line numberDiff line change
@@ -500,7 +500,7 @@
500500
# count_big
501501

502502
Code
503-
dplyr::count(mf)
503+
count(mf)
504504
Output
505505
<SQL>
506506
SELECT COUNT_BIG(*) AS `n`
@@ -509,26 +509,12 @@
509509
---
510510

511511
Code
512-
dplyr::tally(mf)
512+
tally(mf)
513513
Output
514514
<SQL>
515515
SELECT COUNT_BIG(*) AS `n`
516516
FROM `df`
517517

518-
# can copy_to() and compute() with temporary tables (#438)
519-
520-
Code
521-
db <- copy_to(con, df, name = unique_table_name(), temporary = TRUE)
522-
Message
523-
Created a temporary table named #dbplyr_{tmp}
524-
525-
---
526-
527-
Code
528-
db2 <- db %>% mutate(y = x + 1) %>% compute()
529-
Message
530-
Created a temporary table named #dbplyr_{tmp}
531-
532518
# add prefix to temporary table
533519

534520
Code

tests/testthat/test-backend-mssql.R

Lines changed: 6 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -400,6 +400,12 @@ test_that("row_number() with and without group_by() and arrange(): unordered def
400400
expect_snapshot(mf %>% arrange(y) %>% mutate(rown = row_number()))
401401
})
402402

403+
test_that("count_big", {
404+
mf <- lazy_frame(x = c(1:5), y = c(rep("A", 5)), con = simulate_mssql())
405+
expect_snapshot(count(mf))
406+
expect_snapshot(tally(mf))
407+
})
408+
403409
# Live database -----------------------------------------------------------
404410

405411
test_that("can copy_to() and compute() with temporary tables (#438)", {

0 commit comments

Comments
 (0)