You signed in with another tab or window. Reload to refresh your session.You signed out in another tab or window. Reload to refresh your session.You switched accounts on another tab or window. Reload to refresh your session.Dismiss alert
When trying to join by list columns I get the following (incorrect!) error message:
Error in left_join_impl(x, y, by$x, by$y, suffix$x, suffix$y, check_na_matches(na_matches)) :
Can't join on 'X' x 'X' because of incompatible types (list / list)
Below an example:
library(dplyr)
x <- tribble(
~ X,
list(1),
list(1:2),
list(3)
)
y <- tribble(
~ X,
list(1),
list(1:2),
list(5)
)
left_join(x, y, by = "X")
It would be great if it was possible to join by list columns, or at least the error message would inform that this is not possible.
The text was updated successfully, but these errors were encountered:
Hello, you can in fact do this as I just recently discovered, but it's definitely more clunky than anticipated: https://stackoverflow.com/questions/45062277/join-across-within-nested-dataframes
I'm not sure your example makes a lot of sense because if you're joining by the list column, what are you joining? You need another data column.
When trying to join by list columns I get the following (incorrect!) error message:
Below an example:
It would be great if it was possible to join by list columns, or at least the error message would inform that this is not possible.
The text was updated successfully, but these errors were encountered: