Skip to content

Commit

Permalink
update bit64::as.integer64 use in test
Browse files Browse the repository at this point in the history
  • Loading branch information
edward-burn committed Dec 29, 2024
1 parent 5726930 commit 84ffd2e
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion tests/testthat/test-backend-postgres.R
Original file line number Diff line number Diff line change
Expand Up @@ -335,7 +335,7 @@ test_that("casts `y` column for local df", {

out <- tibble(
id = bit64::as.integer64(1:2),
val = bit64::as.integer64(10L, 20L),
val = bit64::as.integer64(c(10L, 20L)),
arr = structure(c("{1,2}", "{1,2,3}"), class = "pq__int4")
)
expect_equal(
Expand Down

0 comments on commit 84ffd2e

Please sign in to comment.