Skip to content

Commit 6177324

Browse files
Update tests/testthat/test-bind-rows.R
Co-authored-by: Davis Vaughan <[email protected]>
1 parent a9cc8e0 commit 6177324

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

tests/testthat/test-bind-rows.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -145,7 +145,7 @@ test_that("bind_rows() handles named list", {
145145
expect_equal(bind_rows(x), tibble(x = 1, y = 2, z = 3))
146146
})
147147

148-
test_that("bind_rows() handles empty names in a list", {
148+
test_that("bind_rows() handles empty names in a list (#7100)", {
149149
x <- rep(list(data.frame(x = 1)), times = 5)
150150
names(x) <- paste0("id_", 1:5)
151151
names(x)[c(3, 5)] <- NA_character_

0 commit comments

Comments
 (0)