From 2c95a0c68f530c2687311171ecc4c787b35aad40 Mon Sep 17 00:00:00 2001 From: Hadley Wickham Date: Tue, 10 Dec 2019 17:41:10 -0600 Subject: [PATCH] Remove skipped test Fixes #4617 --- tests/testthat/test-joins.r | 22 ---------------------- 1 file changed, 22 deletions(-) diff --git a/tests/testthat/test-joins.r b/tests/testthat/test-joins.r index 27dda3a1a4..dad8817d4e 100644 --- a/tests/testthat/test-joins.r +++ b/tests/testthat/test-joins.r @@ -904,28 +904,6 @@ test_that("join accepts tz attributes (#2643)", { expect_equal(nrow(result), 1) }) -test_that("join takes LHS with warning if attributes inconsistent", { - skip("we need to talk about this https://github.com/tidyverse/dplyr/issues/4617") - df1 <- tibble(a = 1:2, b = 2:1) - df2 <- tibble( - a = structure(1:2, foo = "bar"), - c = 2:1 - ) - - expect_warning( - out1 <- left_join(df1, df2, by = "a"), - "Column `a` has different attributes on LHS and RHS of join" - ) - expect_warning(out2 <- left_join(df2, df1, by = "a")) - expect_warning( - out3 <- left_join(df1, df2, by = c("b" = "a")), - "Column `b`/`a` has different attributes on LHS and RHS of join" - ) - - expect_equal(attr(out1$a, "foo"), NULL) - expect_equal(attr(out2$a, "foo"), "bar") -}) - test_that("common_by() message", { df <- tibble(!!!set_names(letters, letters))