Summary Case Study

This is the pack of case study including the R Markdown code and the analysis results.
The pack can be accessed easily via a HTML link: <?????>.

Load library needed

library(tidyverse)  # A Collection of R packages designed for data science.
library(data.table) # An enhanced version of data.frame that allows for faster data operations
library(janitor)    # Examining and cleaning dirty data
library(lubridate)  # Dealing with dates and times
library(tictoc)     # Measuring execution time
tic()               # Start measuring execution time

Create R Project

knitr::include_graphics(
  "C:\\Users\\bewad\\OneDrive\\Desktop\\case study\\case study - folder structure.png"
  )

A R Project (Rproj) is a specific directory that RStudio recognizes as a project home. There are a lot of advantages to manage a project with “Rproj”.

Work with Raw Data

Load the raw data

# A list of all the files which should be included in the analysis
files <- list.files(
  path = "C:\\Users\\bewad\\OneDrive\\Desktop\\case study\\01_raw_data",
  pattern = "*.csv",
  full.names = TRUE
)

# Merge all the files in one datafram
raw_data <- map_dfr(files, read_csv) |> 
  clean_names()

clean the data

Normally the raw data is dirty and should be cleaned before the analysis. For this case study I am illustrating with 3 examples.

# Remove all the empty rows and columns
raw_data <- raw_data[
  !apply(is.na(raw_data), 1, all), 
  !apply(is.na(raw_data), 2, all)
]

# From the character remove both leading and trailing whitespace
# Also replace all internal whitespace with a single space 
raw_data <- raw_data |> 
  mutate(across(where(is.character), str_squish))

# Remove all the duplicates
raw_data <- distinct(raw_data) 

Explore the data

The data structure should be understood before running the analysis. For this case study I am using “summary” function for illustration purpose.

summary(raw_data)
##  hotel_address      additional_number_of_scoring review_date       
##  Length:700899      Min.   :   1.0               Length:700899     
##  Class :character   1st Qu.: 169.0               Class :character  
##  Mode  :character   Median : 342.0               Mode  :character  
##                     Mean   : 498.4                                 
##                     3rd Qu.: 660.0                                 
##                     Max.   :2682.0                                 
##                     NA's   :185687                                 
##  average_score     hotel_name        reviewer_nationality negative_review   
##  Min.   :5.2      Length:700899      Length:700899        Length:700899     
##  1st Qu.:8.1      Class :character   Class :character     Class :character  
##  Median :8.4      Mode  :character   Mode  :character     Mode  :character  
##  Mean   :8.4                                                                
##  3rd Qu.:8.8                                                                
##  Max.   :9.8                                                                
##  NA's   :185687                                                             
##  review_total_negative_word_counts total_number_of_reviews positive_review   
##  Min.   :  0.00                    Min.   :   43           Length:700899     
##  1st Qu.:  2.00                    1st Qu.: 1161           Class :character  
##  Median :  9.00                    Median : 2134           Mode  :character  
##  Mean   : 18.54                    Mean   : 2745                             
##  3rd Qu.: 23.00                    3rd Qu.: 3633                             
##  Max.   :408.00                    Max.   :16670                             
##  NA's   :185687                    NA's   :185687                            
##  review_total_positive_word_counts total_number_of_reviews_reviewer_has_given
##  Min.   :  0.00                    Min.   :  1.00                            
##  1st Qu.:  5.00                    1st Qu.:  1.00                            
##  Median : 11.00                    Median :  3.00                            
##  Mean   : 17.78                    Mean   :  7.16                            
##  3rd Qu.: 22.00                    3rd Qu.:  8.00                            
##  Max.   :395.00                    Max.   :355.00                            
##  NA's   :185687                    NA's   :185687                            
##  reviewer_score       tags           days_since_review       lat        
##  Min.   : 2.5     Length:700899      Length:700899      Min.   :41.33   
##  1st Qu.: 7.5     Class :character   Class :character   1st Qu.:48.21   
##  Median : 8.8     Mode  :character   Mode  :character   Median :51.50   
##  Mean   : 8.4                                           Mean   :49.44   
##  3rd Qu.: 9.6                                           3rd Qu.:51.52   
##  Max.   :10.0                                           Max.   :52.40   
##  NA's   :185687                                         NA's   :188955  
##       lng           order_id           product          quantity_ordered  
##  Min.   :-0.37    Length:700899      Length:700899      Length:700899     
##  1st Qu.:-0.14    Class :character   Class :character   Class :character  
##  Median : 0.00    Mode  :character   Mode  :character   Mode  :character  
##  Mean   : 2.82                                                            
##  3rd Qu.: 4.83                                                            
##  Max.   :16.43                                                            
##  NA's   :188955                                                           
##   price_each         order_date        purchase_address  
##  Length:700899      Length:700899      Length:700899     
##  Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character  
##                                                          
##                                                          
##                                                          
## 

Reply Questions from Case Study

Q1: Which month is the max sales amount?

Q2: Which city has the max sales amount?

Q3: What is the most sold product?

Q4: Which products are sold togeher at the most?

Q5: Monthly sales amount comparison

# Your list of combinations
# Your list of combinations
#raw_data$product <- tolower(raw_data$product)
raw_data <- raw_data[!is.na(as.numeric(raw_data$order_id)), ]

prod_grp <- raw_data |>
  select(order_id, product) |> 
  mutate(product = tolower(product))

dup_order <- prod_grp[prod_grp$order_id %in% prod_grp$order_id[duplicated(prod_grp$order_id) |                                         duplicated(prod_grp$order_id, fromLast = TRUE)], ]

dup_order <- aggregate(
  product ~ order_id, 
  dup_order, 
  paste, 
  collapse = ", "
)

dup_order <- dup_order |> 
  mutate(product = strsplit(product, ", ")) |> 
  mutate(product = map(product, sort)) |> 
  mutate(product = map_chr(product, paste, collapse = ", "))


# Split each string by comma
prod_grp_comb <- strsplit(dup_order$product, ", ")

# Convert the list to a data frame
df <- do.call(rbind, lapply(prod_grp_comb, `length<-`, max(lengths(prod_grp_comb))))

# Convert the matrix to a data frame
df <- as.data.frame(df, stringsAsFactors = FALSE)

# Name the columns
names(df) <- c("p1", "p2", "p3", "p4", "p5")

plyr::count(df)
##                             p1                         p2
## 1                 20in monitor     27in 4k gaming monitor
## 2                 20in monitor           27in fhd monitor
## 3                 20in monitor     34in ultrawide monitor
## 4                 20in monitor      aa batteries (4-pack)
## 5                 20in monitor     aaa batteries (4-pack)
## 6                 20in monitor   apple airpods headphones
## 7                 20in monitor bose soundsport headphones
## 8                 20in monitor              flatscreen tv
## 9                 20in monitor               google phone
## 10                20in monitor                     iphone
## 11                20in monitor         lg washing machine
## 12                20in monitor   lightning charging cable
## 13                20in monitor         macbook pro laptop
## 14                20in monitor            thinkpad laptop
## 15                20in monitor       usb-c charging cable
## 16                20in monitor           wired headphones
## 17      27in 4k gaming monitor           27in fhd monitor
## 18      27in 4k gaming monitor     34in ultrawide monitor
## 19      27in 4k gaming monitor      aa batteries (4-pack)
## 20      27in 4k gaming monitor     aaa batteries (4-pack)
## 21      27in 4k gaming monitor   apple airpods headphones
## 22      27in 4k gaming monitor bose soundsport headphones
## 23      27in 4k gaming monitor              flatscreen tv
## 24      27in 4k gaming monitor               google phone
## 25      27in 4k gaming monitor                     iphone
## 26      27in 4k gaming monitor                     iphone
## 27      27in 4k gaming monitor                   lg dryer
## 28      27in 4k gaming monitor         lg washing machine
## 29      27in 4k gaming monitor   lightning charging cable
## 30      27in 4k gaming monitor         macbook pro laptop
## 31      27in 4k gaming monitor            thinkpad laptop
## 32      27in 4k gaming monitor       usb-c charging cable
## 33      27in 4k gaming monitor            vareebadd phone
## 34      27in 4k gaming monitor            vareebadd phone
## 35      27in 4k gaming monitor           wired headphones
## 36            27in fhd monitor     34in ultrawide monitor
## 37            27in fhd monitor      aa batteries (4-pack)
## 38            27in fhd monitor     aaa batteries (4-pack)
## 39            27in fhd monitor   apple airpods headphones
## 40            27in fhd monitor bose soundsport headphones
## 41            27in fhd monitor bose soundsport headphones
## 42            27in fhd monitor              flatscreen tv
## 43            27in fhd monitor               google phone
## 44            27in fhd monitor               google phone
## 45            27in fhd monitor               google phone
## 46            27in fhd monitor                     iphone
## 47            27in fhd monitor                   lg dryer
## 48            27in fhd monitor         lg washing machine
## 49            27in fhd monitor   lightning charging cable
## 50            27in fhd monitor         macbook pro laptop
## 51            27in fhd monitor            thinkpad laptop
## 52            27in fhd monitor       usb-c charging cable
## 53            27in fhd monitor            vareebadd phone
## 54            27in fhd monitor           wired headphones
## 55      34in ultrawide monitor      aa batteries (4-pack)
## 56      34in ultrawide monitor     aaa batteries (4-pack)
## 57      34in ultrawide monitor   apple airpods headphones
## 58      34in ultrawide monitor bose soundsport headphones
## 59      34in ultrawide monitor bose soundsport headphones
## 60      34in ultrawide monitor              flatscreen tv
## 61      34in ultrawide monitor               google phone
## 62      34in ultrawide monitor                     iphone
## 63      34in ultrawide monitor                     iphone
## 64      34in ultrawide monitor         lg washing machine
## 65      34in ultrawide monitor   lightning charging cable
## 66      34in ultrawide monitor         macbook pro laptop
## 67      34in ultrawide monitor            thinkpad laptop
## 68      34in ultrawide monitor       usb-c charging cable
## 69      34in ultrawide monitor            vareebadd phone
## 70      34in ultrawide monitor           wired headphones
## 71       aa batteries (4-pack)      aa batteries (4-pack)
## 72       aa batteries (4-pack)     aaa batteries (4-pack)
## 73       aa batteries (4-pack)   apple airpods headphones
## 74       aa batteries (4-pack) bose soundsport headphones
## 75       aa batteries (4-pack)              flatscreen tv
## 76       aa batteries (4-pack)               google phone
## 77       aa batteries (4-pack)               google phone
## 78       aa batteries (4-pack)               google phone
## 79       aa batteries (4-pack)               google phone
## 80       aa batteries (4-pack)                     iphone
## 81       aa batteries (4-pack)                     iphone
## 82       aa batteries (4-pack)                     iphone
## 83       aa batteries (4-pack)                   lg dryer
## 84       aa batteries (4-pack)         lg washing machine
## 85       aa batteries (4-pack)   lightning charging cable
## 86       aa batteries (4-pack)         macbook pro laptop
## 87       aa batteries (4-pack)            thinkpad laptop
## 88       aa batteries (4-pack)       usb-c charging cable
## 89       aa batteries (4-pack)            vareebadd phone
## 90       aa batteries (4-pack)           wired headphones
## 91      aaa batteries (4-pack)     aaa batteries (4-pack)
## 92      aaa batteries (4-pack)   apple airpods headphones
## 93      aaa batteries (4-pack)   apple airpods headphones
## 94      aaa batteries (4-pack) bose soundsport headphones
## 95      aaa batteries (4-pack)              flatscreen tv
## 96      aaa batteries (4-pack)               google phone
## 97      aaa batteries (4-pack)               google phone
## 98      aaa batteries (4-pack)                     iphone
## 99      aaa batteries (4-pack)                     iphone
## 100     aaa batteries (4-pack)                   lg dryer
## 101     aaa batteries (4-pack)         lg washing machine
## 102     aaa batteries (4-pack)   lightning charging cable
## 103     aaa batteries (4-pack)         macbook pro laptop
## 104     aaa batteries (4-pack)            thinkpad laptop
## 105     aaa batteries (4-pack)       usb-c charging cable
## 106     aaa batteries (4-pack)            vareebadd phone
## 107     aaa batteries (4-pack)           wired headphones
## 108   apple airpods headphones bose soundsport headphones
## 109   apple airpods headphones bose soundsport headphones
## 110   apple airpods headphones bose soundsport headphones
## 111   apple airpods headphones              flatscreen tv
## 112   apple airpods headphones               google phone
## 113   apple airpods headphones               google phone
## 114   apple airpods headphones               google phone
## 115   apple airpods headphones               google phone
## 116   apple airpods headphones                     iphone
## 117   apple airpods headphones                     iphone
## 118   apple airpods headphones                     iphone
## 119   apple airpods headphones                     iphone
## 120   apple airpods headphones                   lg dryer
## 121   apple airpods headphones         lg washing machine
## 122   apple airpods headphones   lightning charging cable
## 123   apple airpods headphones         macbook pro laptop
## 124   apple airpods headphones            thinkpad laptop
## 125   apple airpods headphones       usb-c charging cable
## 126   apple airpods headphones       usb-c charging cable
## 127   apple airpods headphones            vareebadd phone
## 128   apple airpods headphones            vareebadd phone
## 129   apple airpods headphones           wired headphones
## 130 bose soundsport headphones              flatscreen tv
## 131 bose soundsport headphones              flatscreen tv
## 132 bose soundsport headphones               google phone
## 133 bose soundsport headphones               google phone
## 134 bose soundsport headphones               google phone
## 135 bose soundsport headphones               google phone
## 136 bose soundsport headphones               google phone
## 137 bose soundsport headphones                     iphone
## 138 bose soundsport headphones         lg washing machine
## 139 bose soundsport headphones   lightning charging cable
## 140 bose soundsport headphones         macbook pro laptop
## 141 bose soundsport headphones            thinkpad laptop
## 142 bose soundsport headphones       usb-c charging cable
## 143 bose soundsport headphones       usb-c charging cable
## 144 bose soundsport headphones       usb-c charging cable
## 145 bose soundsport headphones            vareebadd phone
## 146 bose soundsport headphones            vareebadd phone
## 147 bose soundsport headphones           wired headphones
## 148              flatscreen tv               google phone
## 149              flatscreen tv                     iphone
## 150              flatscreen tv                     iphone
## 151              flatscreen tv                   lg dryer
## 152              flatscreen tv   lightning charging cable
## 153              flatscreen tv         macbook pro laptop
## 154              flatscreen tv            thinkpad laptop
## 155              flatscreen tv       usb-c charging cable
## 156              flatscreen tv            vareebadd phone
## 157              flatscreen tv           wired headphones
## 158               google phone                     iphone
## 159               google phone                     iphone
## 160               google phone                     iphone
## 161               google phone                   lg dryer
## 162               google phone         lg washing machine
## 163               google phone   lightning charging cable
## 164               google phone   lightning charging cable
## 165               google phone         macbook pro laptop
## 166               google phone         macbook pro laptop
## 167               google phone            thinkpad laptop
## 168               google phone       usb-c charging cable
## 169               google phone       usb-c charging cable
## 170               google phone       usb-c charging cable
## 171               google phone            vareebadd phone
## 172               google phone           wired headphones
## 173                     iphone         lg washing machine
## 174                     iphone   lightning charging cable
## 175                     iphone   lightning charging cable
## 176                     iphone   lightning charging cable
## 177                     iphone   lightning charging cable
## 178                     iphone   lightning charging cable
## 179                     iphone         macbook pro laptop
## 180                     iphone            thinkpad laptop
## 181                     iphone       usb-c charging cable
## 182                     iphone       usb-c charging cable
## 183                     iphone            vareebadd phone
## 184                     iphone            vareebadd phone
## 185                     iphone           wired headphones
## 186                   lg dryer   lightning charging cable
## 187                   lg dryer            thinkpad laptop
## 188                   lg dryer       usb-c charging cable
## 189                   lg dryer            vareebadd phone
## 190                   lg dryer           wired headphones
## 191         lg washing machine   lightning charging cable
## 192         lg washing machine         macbook pro laptop
## 193         lg washing machine           wired headphones
## 194   lightning charging cable   lightning charging cable
## 195   lightning charging cable         macbook pro laptop
## 196   lightning charging cable            thinkpad laptop
## 197   lightning charging cable       usb-c charging cable
## 198   lightning charging cable            vareebadd phone
## 199   lightning charging cable           wired headphones
## 200         macbook pro laptop            thinkpad laptop
## 201         macbook pro laptop       usb-c charging cable
## 202         macbook pro laptop           wired headphones
## 203            thinkpad laptop       usb-c charging cable
## 204            thinkpad laptop            vareebadd phone
## 205            thinkpad laptop           wired headphones
## 206       usb-c charging cable       usb-c charging cable
## 207       usb-c charging cable            vareebadd phone
## 208       usb-c charging cable            vareebadd phone
## 209       usb-c charging cable           wired headphones
## 210            vareebadd phone           wired headphones
## 211           wired headphones           wired headphones
##                           p3                       p4               p5 freq
## 1                       <NA>                     <NA>             <NA>    2
## 2                       <NA>                     <NA>             <NA>    5
## 3                       <NA>                     <NA>             <NA>    2
## 4                       <NA>                     <NA>             <NA>   16
## 5                       <NA>                     <NA>             <NA>   11
## 6                       <NA>                     <NA>             <NA>   13
## 7                       <NA>                     <NA>             <NA>   15
## 8                       <NA>                     <NA>             <NA>    2
## 9                       <NA>                     <NA>             <NA>    4
## 10                      <NA>                     <NA>             <NA>    3
## 11                      <NA>                     <NA>             <NA>    2
## 12                      <NA>                     <NA>             <NA>   26
## 13                      <NA>                     <NA>             <NA>    6
## 14                      <NA>                     <NA>             <NA>    2
## 15                      <NA>                     <NA>             <NA>   25
## 16                      <NA>                     <NA>             <NA>   19
## 17                      <NA>                     <NA>             <NA>    8
## 18                      <NA>                     <NA>             <NA>    6
## 19                      <NA>                     <NA>             <NA>   26
## 20                      <NA>                     <NA>             <NA>   30
## 21                      <NA>                     <NA>             <NA>   22
## 22                      <NA>                     <NA>             <NA>   19
## 23                      <NA>                     <NA>             <NA>    5
## 24                      <NA>                     <NA>             <NA>    6
## 25  lightning charging cable                     <NA>             <NA>    1
## 26                      <NA>                     <NA>             <NA>    8
## 27                      <NA>                     <NA>             <NA>    2
## 28                      <NA>                     <NA>             <NA>    1
## 29                      <NA>                     <NA>             <NA>   33
## 30                      <NA>                     <NA>             <NA>   13
## 31                      <NA>                     <NA>             <NA>    5
## 32                      <NA>                     <NA>             <NA>   23
## 33          wired headphones                     <NA>             <NA>    1
## 34                      <NA>                     <NA>             <NA>    2
## 35                      <NA>                     <NA>             <NA>   28
## 36                      <NA>                     <NA>             <NA>   10
## 37                      <NA>                     <NA>             <NA>   26
## 38                      <NA>                     <NA>             <NA>   43
## 39                      <NA>                     <NA>             <NA>   24
## 40              google phone                     <NA>             <NA>    1
## 41                      <NA>                     <NA>             <NA>   25
## 42                      <NA>                     <NA>             <NA>    6
## 43      usb-c charging cable         wired headphones             <NA>    1
## 44      usb-c charging cable                     <NA>             <NA>    1
## 45                      <NA>                     <NA>             <NA>    5
## 46                      <NA>                     <NA>             <NA>    2
## 47                      <NA>                     <NA>             <NA>    3
## 48                      <NA>                     <NA>             <NA>    1
## 49                      <NA>                     <NA>             <NA>   36
## 50                      <NA>                     <NA>             <NA>    9
## 51                      <NA>                     <NA>             <NA>    6
## 52                      <NA>                     <NA>             <NA>   41
## 53                      <NA>                     <NA>             <NA>    2
## 54                      <NA>                     <NA>             <NA>   21
## 55                      <NA>                     <NA>             <NA>   32
## 56                      <NA>                     <NA>             <NA>   25
## 57                      <NA>                     <NA>             <NA>   14
## 58              google phone     usb-c charging cable             <NA>    1
## 59                      <NA>                     <NA>             <NA>   16
## 60                      <NA>                     <NA>             <NA>    8
## 61                      <NA>                     <NA>             <NA>    4
## 62  lightning charging cable                     <NA>             <NA>    1
## 63                      <NA>                     <NA>             <NA>   12
## 64                      <NA>                     <NA>             <NA>    1
## 65                      <NA>                     <NA>             <NA>   32
## 66                      <NA>                     <NA>             <NA>    7
## 67                      <NA>                     <NA>             <NA>    4
## 68                      <NA>                     <NA>             <NA>   25
## 69                      <NA>                     <NA>             <NA>    4
## 70                      <NA>                     <NA>             <NA>   28
## 71                      <NA>                     <NA>             <NA>   16
## 72                      <NA>                     <NA>             <NA>   87
## 73                      <NA>                     <NA>             <NA>   70
## 74                      <NA>                     <NA>             <NA>   55
## 75                      <NA>                     <NA>             <NA>   21
## 76      usb-c charging cable         wired headphones             <NA>    1
## 77      usb-c charging cable                     <NA>             <NA>    2
## 78          wired headphones                     <NA>             <NA>    1
## 79                      <NA>                     <NA>             <NA>   21
## 80  lightning charging cable         wired headphones             <NA>    1
## 81  lightning charging cable                     <NA>             <NA>    2
## 82                      <NA>                     <NA>             <NA>   29
## 83                      <NA>                     <NA>             <NA>    6
## 84                      <NA>                     <NA>             <NA>    1
## 85                      <NA>                     <NA>             <NA>  103
## 86                      <NA>                     <NA>             <NA>   17
## 87                      <NA>                     <NA>             <NA>   17
## 88                      <NA>                     <NA>             <NA>   72
## 89                      <NA>                     <NA>             <NA>   12
## 90                      <NA>                     <NA>             <NA>   80
## 91                      <NA>                     <NA>             <NA>   19
## 92                    iphone                     <NA>             <NA>    3
## 93                      <NA>                     <NA>             <NA>   78
## 94                      <NA>                     <NA>             <NA>   57
## 95                      <NA>                     <NA>             <NA>   21
## 96      usb-c charging cable                     <NA>             <NA>    3
## 97                      <NA>                     <NA>             <NA>   19
## 98  lightning charging cable                     <NA>             <NA>    1
## 99                      <NA>                     <NA>             <NA>   27
## 100                     <NA>                     <NA>             <NA>    2
## 101                     <NA>                     <NA>             <NA>    4
## 102                     <NA>                     <NA>             <NA>   79
## 103                     <NA>                     <NA>             <NA>   18
## 104                     <NA>                     <NA>             <NA>   27
## 105                     <NA>                     <NA>             <NA>   92
## 106                     <NA>                     <NA>             <NA>    6
## 107                     <NA>                     <NA>             <NA>   86
## 108             google phone                     <NA>             <NA>    1
## 109                   iphone                     <NA>             <NA>    1
## 110                     <NA>                     <NA>             <NA>   48
## 111                     <NA>                     <NA>             <NA>   13
## 112                   iphone lightning charging cable wired headphones    1
## 113     usb-c charging cable         wired headphones             <NA>    1
## 114     usb-c charging cable                     <NA>             <NA>    1
## 115                     <NA>                     <NA>             <NA>   17
## 116 lightning charging cable         wired headphones             <NA>    3
## 117 lightning charging cable                     <NA>             <NA>   43
## 118         wired headphones                     <NA>             <NA>   23
## 119                     <NA>                     <NA>             <NA>  299
## 120                     <NA>                     <NA>             <NA>    3
## 121                     <NA>                     <NA>             <NA>    1
## 122                     <NA>                     <NA>             <NA>   69
## 123                     <NA>                     <NA>             <NA>   19
## 124                     <NA>                     <NA>             <NA>   16
## 125          vareebadd phone                     <NA>             <NA>    1
## 126                     <NA>                     <NA>             <NA>   60
## 127         wired headphones                     <NA>             <NA>    1
## 128                     <NA>                     <NA>             <NA>   10
## 129                     <NA>                     <NA>             <NA>   71
## 130          vareebadd phone                     <NA>             <NA>    1
## 131                     <NA>                     <NA>             <NA>   12
## 132 lightning charging cable                     <NA>             <NA>    1
## 133     usb-c charging cable         wired headphones             <NA>    3
## 134     usb-c charging cable                     <NA>             <NA>   31
## 135         wired headphones                     <NA>             <NA>   21
## 136                     <NA>                     <NA>             <NA>  169
## 137                     <NA>                     <NA>             <NA>   11
## 138                     <NA>                     <NA>             <NA>    2
## 139                     <NA>                     <NA>             <NA>   71
## 140                     <NA>                     <NA>             <NA>   15
## 141                     <NA>                     <NA>             <NA>   13
## 142          vareebadd phone         wired headphones             <NA>    2
## 143          vareebadd phone                     <NA>             <NA>   14
## 144                     <NA>                     <NA>             <NA>   51
## 145         wired headphones                     <NA>             <NA>    3
## 146                     <NA>                     <NA>             <NA>   62
## 147                     <NA>                     <NA>             <NA>   45
## 148                     <NA>                     <NA>             <NA>    4
## 149 lightning charging cable                     <NA>             <NA>    1
## 150                     <NA>                     <NA>             <NA>    9
## 151                     <NA>                     <NA>             <NA>    1
## 152                     <NA>                     <NA>             <NA>   21
## 153                     <NA>                     <NA>             <NA>    5
## 154                     <NA>                     <NA>             <NA>    6
## 155                     <NA>                     <NA>             <NA>   17
## 156                     <NA>                     <NA>             <NA>    2
## 157                     <NA>                     <NA>             <NA>   11
## 158 lightning charging cable                     <NA>             <NA>    1
## 159     usb-c charging cable         wired headphones             <NA>    1
## 160                     <NA>                     <NA>             <NA>    6
## 161                     <NA>                     <NA>             <NA>    1
## 162                     <NA>                     <NA>             <NA>    1
## 163     usb-c charging cable                     <NA>             <NA>    1
## 164                     <NA>                     <NA>             <NA>   24
## 165         wired headphones                     <NA>             <NA>    1
## 166                     <NA>                     <NA>             <NA>    6
## 167                     <NA>                     <NA>             <NA>    6
## 168          vareebadd phone                     <NA>             <NA>    1
## 169         wired headphones                     <NA>             <NA>   80
## 170                     <NA>                     <NA>             <NA>  869
## 171                     <NA>                     <NA>             <NA>    4
## 172                     <NA>                     <NA>             <NA>  311
## 173                     <NA>                     <NA>             <NA>    2
## 174     usb-c charging cable         wired headphones             <NA>    1
## 175     usb-c charging cable                     <NA>             <NA>    2
## 176          vareebadd phone                     <NA>             <NA>    1
## 177         wired headphones                     <NA>             <NA>   57
## 178                     <NA>                     <NA>             <NA>  895
## 179                     <NA>                     <NA>             <NA>    6
## 180                     <NA>                     <NA>             <NA>    7
## 181          vareebadd phone                     <NA>             <NA>    1
## 182                     <NA>                     <NA>             <NA>   24
## 183         wired headphones                     <NA>             <NA>    1
## 184                     <NA>                     <NA>             <NA>    4
## 185                     <NA>                     <NA>             <NA>  374
## 186                     <NA>                     <NA>             <NA>    3
## 187                     <NA>                     <NA>             <NA>    1
## 188                     <NA>                     <NA>             <NA>    1
## 189                     <NA>                     <NA>             <NA>    1
## 190                     <NA>                     <NA>             <NA>    1
## 191                     <NA>                     <NA>             <NA>    6
## 192                     <NA>                     <NA>             <NA>    2
## 193                     <NA>                     <NA>             <NA>    4
## 194                     <NA>                     <NA>             <NA>    6
## 195                     <NA>                     <NA>             <NA>   21
## 196                     <NA>                     <NA>             <NA>   20
## 197                     <NA>                     <NA>             <NA>   96
## 198                     <NA>                     <NA>             <NA>    3
## 199                     <NA>                     <NA>             <NA>   66
## 200                     <NA>                     <NA>             <NA>    5
## 201                     <NA>                     <NA>             <NA>   21
## 202                     <NA>                     <NA>             <NA>   19
## 203                     <NA>                     <NA>             <NA>   20
## 204                     <NA>                     <NA>             <NA>    3
## 205                     <NA>                     <NA>             <NA>   14
## 206                     <NA>                     <NA>             <NA>    4
## 207         wired headphones                     <NA>             <NA>   31
## 208                     <NA>                     <NA>             <NA>  318
## 209                     <NA>                     <NA>             <NA>   82
## 210                     <NA>                     <NA>             <NA>  110
## 211                     <NA>                     <NA>             <NA>    2
toc() # End of the execution time
## 20.09 sec elapsed

Thank you

Thank you Lisa and Rob for preparing and organizing the study case. I have thoroughly enjoyed the scripting excercise process.