library(dplyr)
##
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
##
## filter, lag
## The following objects are masked from 'package:base':
##
## intersect, setdiff, setequal, union
# Dataset 1: Customers
customers <- tibble(
customer_id = c(1, 2, 3, 4, 5),
name = c("Alice", "Bob", "Charlie", "David", "Eve"),
city = c("New York", "Los Angeles", "Chicago", "Houston", "Phoenix")
)
# Dataset 2: Orders
orders <- tibble(
order_id = c(101, 102, 103, 104, 105, 106),
customer_id = c(1, 2, 3, 2, 6, 7),
product = c("Laptop", "Phone", "Tablet", "Desktop", "Camera", "Printer"),
amount = c(1200, 800, 300, 1500, 600, 150)
)
q1 <- inner_join(customers , orders)
## Joining with `by = join_by(customer_id)`
head(q1)
## # A tibble: 4 × 6
## customer_id name city order_id product amount
## <dbl> <chr> <chr> <dbl> <chr> <dbl>
## 1 1 Alice New York 101 Laptop 1200
## 2 2 Bob Los Angeles 102 Phone 800
## 3 2 Bob Los Angeles 104 Desktop 1500
## 4 3 Charlie Chicago 103 Tablet 300
q2 <- left_join(customers , orders)
## Joining with `by = join_by(customer_id)`
head(q2)
## # A tibble: 6 × 6
## customer_id name city order_id product amount
## <dbl> <chr> <chr> <dbl> <chr> <dbl>
## 1 1 Alice New York 101 Laptop 1200
## 2 2 Bob Los Angeles 102 Phone 800
## 3 2 Bob Los Angeles 104 Desktop 1500
## 4 3 Charlie Chicago 103 Tablet 300
## 5 4 David Houston NA <NA> NA
## 6 5 Eve Phoenix NA <NA> NA
q3 <- right_join(customers , orders)
## Joining with `by = join_by(customer_id)`
a)How many rows are in the result? There are 6 rows. b)Which customer_ids in the result have NULL for customer name and city? Explain why. Customer Id 6 and 7 have NULL for customer name and city because they are recorded in the orders table ,but not the customers table. When they are joined, only customer Ids that are present in the customers table are present in the new table as well. c)Display the result.
head(q3)
## # A tibble: 6 × 6
## customer_id name city order_id product amount
## <dbl> <chr> <chr> <dbl> <chr> <dbl>
## 1 1 Alice New York 101 Laptop 1200
## 2 2 Bob Los Angeles 102 Phone 800
## 3 2 Bob Los Angeles 104 Desktop 1500
## 4 3 Charlie Chicago 103 Tablet 300
## 5 6 <NA> <NA> 105 Camera 600
## 6 7 <NA> <NA> 106 Printer 150
q4 <- full_join(customers , orders)
## Joining with `by = join_by(customer_id)`
a)How many rows are in the result? There are 6 rows. b)Identify any rows where there’s information from only one table. Explain these results. Rows 5,6,7, and 8 include information from one table. Full join returns all rows where there is a match in the left or the right table. b)Display the result.
head(q4)
## # A tibble: 6 × 6
## customer_id name city order_id product amount
## <dbl> <chr> <chr> <dbl> <chr> <dbl>
## 1 1 Alice New York 101 Laptop 1200
## 2 2 Bob Los Angeles 102 Phone 800
## 3 2 Bob Los Angeles 104 Desktop 1500
## 4 3 Charlie Chicago 103 Tablet 300
## 5 4 David Houston NA <NA> NA
## 6 5 Eve Phoenix NA <NA> NA
q5 <- semi_join(customers , orders)
## Joining with `by = join_by(customer_id)`
a)How many rows are in the result? There are 3 rows. b)How does this result differ from the inner join result? Semi join returns all of the rows from the left table when there is a match in the right table. There is one less row in this result because Bobs orders are combined due to the semi join returning the customer Id, name, and city which are all the same for Bob’s two orders. c)Display the result.
head(q5)
## # A tibble: 3 × 3
## customer_id name city
## <dbl> <chr> <chr>
## 1 1 Alice New York
## 2 2 Bob Los Angeles
## 3 3 Charlie Chicago
q6 <- anti_join(customers , orders)
## Joining with `by = join_by(customer_id)`
a)Which customers are in the result? David and Eve are in the result. b)Explain what this result tells you about these customers. Due to anti join returning all variables from the left table where there is no match from the right table, David and Eve have no orders recorded in the order table. c)Display the result.
head(q6)
## # A tibble: 2 × 3
## customer_id name city
## <dbl> <chr> <chr>
## 1 4 David Houston
## 2 5 Eve Phoenix
a)Which join would you use to find all customers, including those who haven’t placed any orders? Why? I would use left join because the customers are all listed in the left table so it will have to return all of the customers regardless of if they have placed an order. b)Which join would you use to find only the customers who have placed orders? Why? I would use right joining because it takes the orders table and combines it only when there is a match form the customers table. The customers that have not placed orders will have N/A in the category for order number showing that they do not have any orders. c)Write the R code for both scenarios.
a7 <- left_join(customers , orders)
## Joining with `by = join_by(customer_id)`
b7 <- right_join(customers , orders)
## Joining with `by = join_by(customer_id)`
d)Display the result.
head(a7)
## # A tibble: 6 × 6
## customer_id name city order_id product amount
## <dbl> <chr> <chr> <dbl> <chr> <dbl>
## 1 1 Alice New York 101 Laptop 1200
## 2 2 Bob Los Angeles 102 Phone 800
## 3 2 Bob Los Angeles 104 Desktop 1500
## 4 3 Charlie Chicago 103 Tablet 300
## 5 4 David Houston NA <NA> NA
## 6 5 Eve Phoenix NA <NA> NA
head(b7)
## # A tibble: 6 × 6
## customer_id name city order_id product amount
## <dbl> <chr> <chr> <dbl> <chr> <dbl>
## 1 1 Alice New York 101 Laptop 1200
## 2 2 Bob Los Angeles 102 Phone 800
## 3 2 Bob Los Angeles 104 Desktop 1500
## 4 3 Charlie Chicago 103 Tablet 300
## 5 6 <NA> <NA> 105 Camera 600
## 6 7 <NA> <NA> 106 Printer 150