| setops {dplyr} | R Documentation |
Set operations
Description
Perform set operations using the rows of a data frame.
-
intersect(x, y)finds all rows in bothxandy. -
union(x, y)finds all rows in eitherxory, excluding duplicates. -
union_all(x, y)finds all rows in eitherxory, including duplicates. -
setdiff(x, y)finds all rows inxthat aren't iny. -
symdiff(x, y)computes the symmetric difference, i.e. all rows inxthat aren't inyand all rows inythat aren't inx. -
setequal(x, y)returnsTRUEifxandycontain the same rows (ignoring order).
Note that intersect(), union(), setdiff(), and symdiff() remove
duplicates in x and y.
Usage
intersect(x, y, ...)
union(x, y, ...)
union_all(x, y, ...)
setdiff(x, y, ...)
setequal(x, y, ...)
symdiff(x, y, ...)
Arguments
x, y |
Pair of compatible data frames. A pair of data frames is compatible if they have the same column names (possibly in different orders) and compatible types. |
... |
These dots are for future extensions and must be empty. |
Base functions
intersect(), union(), setdiff(), and setequal() override the base
functions of the same name in order to make them generic. The existing
behaviour for vectors is preserved by providing default methods that call
the base functions.
Examples
df1 <- tibble(x = 1:3)
df2 <- tibble(x = 3:5)
intersect(df1, df2)
union(df1, df2)
union_all(df1, df2)
setdiff(df1, df2)
setdiff(df2, df1)
symdiff(df1, df2)
setequal(df1, df2)
setequal(df1, df1[3:1, ])
# Note that the following functions remove pre-existing duplicates:
df1 <- tibble(x = c(1:3, 3, 3))
df2 <- tibble(x = c(3:5, 5))
intersect(df1, df2)
union(df1, df2)
setdiff(df1, df2)
symdiff(df1, df2)