market1 <- clean_names(market)
freq <- sapply(market1, table)/nrow(market1)*100
# converting it into dataframe
market1_data <- as.data.frame(sapply(market1, table)/nrow(market1)*100)
data_t <- t(market1_data)
# since the cass is matrix, using corresponding function to sort the rows based on column 2
sort_data <- data_t[order(data_t[,2],decreasing=TRUE),]
head(sort_data,10)
## 0 1
## eggs 87.72961 12.270389
## white_bread 88.09699 11.903012
## x2pct_milk 89.05217 10.947832
## potato_chips 90.22777 9.772226
## x98pct_fat_free_hamburger 90.66863 9.331374
## hot_dogs 90.74210 9.257899
## sweet_relish 91.47686 8.523145
## onions 91.99118 8.008817
## toothpaste 92.06466 7.935342
## cola 92.21161 7.788391
rules_egg <- apriori(market1, parameter = list(supp= 0.020, conf= 0.8, maxlen = 3), appearance = list(rhs= c("eggs=1"), default= "lhs"))
## Apriori
##
## Parameter specification:
## confidence minval smax arem aval originalSupport maxtime support minlen
## 0.8 0.1 1 none FALSE TRUE 5 0.02 1
## maxlen target ext
## 3 rules TRUE
##
## Algorithmic control:
## filter tree heap memopt load sort verbose
## 0.1 TRUE TRUE FALSE TRUE 2 TRUE
##
## Absolute minimum support count: 27
##
## set item appearances ...[1 item(s)] done [0.00s].
## set transactions ...[510 item(s), 1361 transaction(s)] done [0.03s].
## sorting and recoding items ... [450 item(s)] done [0.01s].
## creating transaction tree ... done [0.00s].
## checking subsets of size 1 2 3
## Warning in apriori(market1, parameter = list(supp = 0.02, conf = 0.8, maxlen
## = 3), : Mining stopped (maxlen reached). Only patterns up to a length of 3
## returned!
## done [8.36s].
## writing ... [14 rule(s)] done [0.12s].
## creating S4 object ... done [0.02s].
inspect(rules_egg[1:10])
## lhs rhs support confidence
## [1] {x2pct_milk=1, plain_bagels=1} => {eggs=1} 0.02057311 0.8484848
## [2] {salsa_dip=1, x2pct_milk=1} => {eggs=1} 0.02130786 0.8285714
## [3] {salsa_dip=1, white_bread=1} => {eggs=1} 0.02277737 0.8378378
## [4] {sugar_cookies=1, tomatoes=1} => {eggs=1} 0.02351212 0.8421053
## [5] {sugar_cookies=1, toothpaste=1} => {eggs=1} 0.02277737 0.8157895
## [6] {sugar_cookies=1, potato_chips=1} => {eggs=1} 0.02277737 0.8378378
## [7] {sugar_cookies=1, x2pct_milk=1} => {eggs=1} 0.02351212 0.8000000
## [8] {potato_chips=1, orange_juice=1} => {eggs=1} 0.02130786 0.8529412
## [9] {hair_conditioner=1, potato_chips=1} => {eggs=1} 0.02130786 0.8285714
## [10] {potato_chips=1, ramen_noodles=1} => {eggs=1} 0.02204262 0.8108108
## coverage lift count
## [1] 0.02424688 6.914897 28
## [2] 0.02571639 6.752609 29
## [3] 0.02718589 6.828128 31
## [4] 0.02792065 6.862906 32
## [5] 0.02792065 6.648440 31
## [6] 0.02718589 6.828128 31
## [7] 0.02939015 6.519760 32
## [8] 0.02498163 6.951215 29
## [9] 0.02571639 6.752609 29
## [10] 0.02718589 6.607865 30
redundant_eggs <- is.redundant(rules_egg)
sum(redundant_eggs)
## [1] 0
sort_eggs <- sort(rules_egg, by = "lift")
inspect(sort_eggs)
## lhs rhs support
## [1] {potato_chips=1, orange_juice=1} => {eggs=1} 0.02130786
## [2] {x2pct_milk=1, plain_bagels=1} => {eggs=1} 0.02057311
## [3] {sugar_cookies=1, tomatoes=1} => {eggs=1} 0.02351212
## [4] {salsa_dip=1, white_bread=1} => {eggs=1} 0.02277737
## [5] {sugar_cookies=1, potato_chips=1} => {eggs=1} 0.02277737
## [6] {popcorn_salt=1, toothpaste=1} => {eggs=1} 0.02204262
## [7] {salsa_dip=1, x2pct_milk=1} => {eggs=1} 0.02130786
## [8] {hair_conditioner=1, potato_chips=1} => {eggs=1} 0.02130786
## [9] {x2pct_milk=1, popcorn_salt=1} => {eggs=1} 0.02718589
## [10] {sugar_cookies=1, toothpaste=1} => {eggs=1} 0.02277737
## [11] {potato_chips=1, ramen_noodles=1} => {eggs=1} 0.02204262
## [12] {popcorn_salt=1, toilet_paper=1} => {eggs=1} 0.02130786
## [13] {sugar_cookies=1, x2pct_milk=1} => {eggs=1} 0.02351212
## [14] {potato_chips=1, pepperoni_pizza_frozen=1} => {eggs=1} 0.02351212
## confidence coverage lift count
## [1] 0.8529412 0.02498163 6.951215 29
## [2] 0.8484848 0.02424688 6.914897 28
## [3] 0.8421053 0.02792065 6.862906 32
## [4] 0.8378378 0.02718589 6.828128 31
## [5] 0.8378378 0.02718589 6.828128 31
## [6] 0.8333333 0.02645114 6.791417 30
## [7] 0.8285714 0.02571639 6.752609 29
## [8] 0.8285714 0.02571639 6.752609 29
## [9] 0.8222222 0.03306392 6.700865 37
## [10] 0.8157895 0.02792065 6.648440 31
## [11] 0.8108108 0.02718589 6.607865 30
## [12] 0.8055556 0.02645114 6.565037 29
## [13] 0.8000000 0.02939015 6.519760 32
## [14] 0.8000000 0.02939015 6.519760 32
plot(sort_eggs)
## To reduce overplotting, jitter is added! Use jitter = 0 to prevent jitter.
plot(sort_eggs, method = "grouped")
plot(sort_eggs, method = "graph")
rules_white.bread <- apriori(market1, parameter = list(supp= 0.02, conf= 0.8, maxlen = 3), appearance = list(rhs= c("white_bread=1"), default= "lhs"))
## Apriori
##
## Parameter specification:
## confidence minval smax arem aval originalSupport maxtime support minlen
## 0.8 0.1 1 none FALSE TRUE 5 0.02 1
## maxlen target ext
## 3 rules TRUE
##
## Algorithmic control:
## filter tree heap memopt load sort verbose
## 0.1 TRUE TRUE FALSE TRUE 2 TRUE
##
## Absolute minimum support count: 27
##
## set item appearances ...[1 item(s)] done [0.00s].
## set transactions ...[510 item(s), 1361 transaction(s)] done [0.03s].
## sorting and recoding items ... [450 item(s)] done [0.01s].
## creating transaction tree ... done [0.01s].
## checking subsets of size 1 2 3
## Warning in apriori(market1, parameter = list(supp = 0.02, conf = 0.8, maxlen
## = 3), : Mining stopped (maxlen reached). Only patterns up to a length of 3
## returned!
## done [8.30s].
## writing ... [26 rule(s)] done [0.08s].
## creating S4 object ... done [0.02s].
inspect(rules_white.bread)
## lhs rhs support confidence coverage lift count
## [1] {salsa_dip=1,
## x2pct_milk=1} => {white_bread=1} 0.02057311 0.8000000 0.02571639 6.720988 28
## [2] {sugar_cookies=1,
## tomatoes=1} => {white_bread=1} 0.02351212 0.8421053 0.02792065 7.074724 32
## [3] {sugar_cookies=1,
## toothpaste=1} => {white_bread=1} 0.02424688 0.8684211 0.02792065 7.295809 33
## [4] {sugar_cookies=1,
## potato_chips=1} => {white_bread=1} 0.02204262 0.8108108 0.02718589 6.811812 30
## [5] {potato_chips=1,
## orange_juice=1} => {white_bread=1} 0.02057311 0.8235294 0.02498163 6.918664 28
## [6] {pancake_mix=1,
## wheat_bread=1} => {white_bread=1} 0.02057311 0.8484848 0.02424688 7.128320 28
## [7] {potato_chips=1,
## pancake_mix=1} => {white_bread=1} 0.02130786 0.8055556 0.02645114 6.767661 29
## [8] {tomatoes=1,
## garlic=1} => {white_bread=1} 0.02057311 0.8750000 0.02351212 7.351080 28
## [9] {potato_chips=1,
## garlic=1} => {white_bread=1} 0.02204262 0.8333333 0.02645114 7.001029 30
## [10] {toothpaste=1,
## french_fries=1} => {white_bread=1} 0.02057311 0.8235294 0.02498163 6.918664 28
## [11] {hair_conditioner=1,
## potato_chips=1} => {white_bread=1} 0.02130786 0.8285714 0.02571639 6.961023 29
## [12] {bananas=1,
## wheat_bread=1} => {white_bread=1} 0.02057311 0.8000000 0.02571639 6.720988 28
## [13] {bananas=1,
## toothpaste=1} => {white_bread=1} 0.02351212 0.8648649 0.02718589 7.265933 32
## [14] {potato_chips=1,
## bananas=1} => {white_bread=1} 0.02057311 0.8000000 0.02571639 6.720988 28
## [15] {x2pct_milk=1,
## bananas=1} => {white_bread=1} 0.02571639 0.8139535 0.03159442 6.838214 35
## [16] {popcorn_salt=1,
## cola=1} => {white_bread=1} 0.02057311 0.8000000 0.02571639 6.720988 28
## [17] {popcorn_salt=1,
## toothpaste=1} => {white_bread=1} 0.02204262 0.8333333 0.02645114 7.001029 30
## [18] {bologna=1,
## wheat_bread=1} => {white_bread=1} 0.02130786 0.8055556 0.02645114 6.767661 29
## [19] {bologna=1,
## sweet_relish=1} => {white_bread=1} 0.02057311 0.8235294 0.02498163 6.918664 28
## [20] {x98pct_fat_free_hamburger=1,
## bologna=1} => {white_bread=1} 0.02130786 0.8055556 0.02645114 6.767661 29
## [21] {bologna=1,
## x2pct_milk=1} => {white_bread=1} 0.02351212 0.8205128 0.02865540 6.893321 32
## [22] {tomatoes=1,
## toothpaste=1} => {white_bread=1} 0.02571639 0.8333333 0.03085966 7.001029 35
## [23] {toothpaste=1,
## toilet_paper=1} => {white_bread=1} 0.02571639 0.8750000 0.02939015 7.351080 35
## [24] {x98pct_fat_free_hamburger=1,
## wheat_bread=1} => {white_bread=1} 0.02645114 0.9000000 0.02939015 7.561111 36
## [25] {potato_chips=1,
## wheat_bread=1} => {white_bread=1} 0.02718589 0.8043478 0.03379868 6.757515 37
## [26] {potato_chips=1,
## toothpaste=1} => {white_bread=1} 0.03012491 0.8039216 0.03747245 6.753934 41
redundant_whitebread <- is.redundant(rules_white.bread)
which(redundant_whitebread)
## integer(0)
sort_whitebread <- sort(rules_white.bread, by = "lift")
inspect(sort_whitebread)
## lhs rhs support confidence coverage lift count
## [1] {x98pct_fat_free_hamburger=1,
## wheat_bread=1} => {white_bread=1} 0.02645114 0.9000000 0.02939015 7.561111 36
## [2] {tomatoes=1,
## garlic=1} => {white_bread=1} 0.02057311 0.8750000 0.02351212 7.351080 28
## [3] {toothpaste=1,
## toilet_paper=1} => {white_bread=1} 0.02571639 0.8750000 0.02939015 7.351080 35
## [4] {sugar_cookies=1,
## toothpaste=1} => {white_bread=1} 0.02424688 0.8684211 0.02792065 7.295809 33
## [5] {bananas=1,
## toothpaste=1} => {white_bread=1} 0.02351212 0.8648649 0.02718589 7.265933 32
## [6] {pancake_mix=1,
## wheat_bread=1} => {white_bread=1} 0.02057311 0.8484848 0.02424688 7.128320 28
## [7] {sugar_cookies=1,
## tomatoes=1} => {white_bread=1} 0.02351212 0.8421053 0.02792065 7.074724 32
## [8] {potato_chips=1,
## garlic=1} => {white_bread=1} 0.02204262 0.8333333 0.02645114 7.001029 30
## [9] {popcorn_salt=1,
## toothpaste=1} => {white_bread=1} 0.02204262 0.8333333 0.02645114 7.001029 30
## [10] {tomatoes=1,
## toothpaste=1} => {white_bread=1} 0.02571639 0.8333333 0.03085966 7.001029 35
## [11] {hair_conditioner=1,
## potato_chips=1} => {white_bread=1} 0.02130786 0.8285714 0.02571639 6.961023 29
## [12] {potato_chips=1,
## orange_juice=1} => {white_bread=1} 0.02057311 0.8235294 0.02498163 6.918664 28
## [13] {toothpaste=1,
## french_fries=1} => {white_bread=1} 0.02057311 0.8235294 0.02498163 6.918664 28
## [14] {bologna=1,
## sweet_relish=1} => {white_bread=1} 0.02057311 0.8235294 0.02498163 6.918664 28
## [15] {bologna=1,
## x2pct_milk=1} => {white_bread=1} 0.02351212 0.8205128 0.02865540 6.893321 32
## [16] {x2pct_milk=1,
## bananas=1} => {white_bread=1} 0.02571639 0.8139535 0.03159442 6.838214 35
## [17] {sugar_cookies=1,
## potato_chips=1} => {white_bread=1} 0.02204262 0.8108108 0.02718589 6.811812 30
## [18] {potato_chips=1,
## pancake_mix=1} => {white_bread=1} 0.02130786 0.8055556 0.02645114 6.767661 29
## [19] {bologna=1,
## wheat_bread=1} => {white_bread=1} 0.02130786 0.8055556 0.02645114 6.767661 29
## [20] {x98pct_fat_free_hamburger=1,
## bologna=1} => {white_bread=1} 0.02130786 0.8055556 0.02645114 6.767661 29
## [21] {potato_chips=1,
## wheat_bread=1} => {white_bread=1} 0.02718589 0.8043478 0.03379868 6.757515 37
## [22] {potato_chips=1,
## toothpaste=1} => {white_bread=1} 0.03012491 0.8039216 0.03747245 6.753934 41
## [23] {salsa_dip=1,
## x2pct_milk=1} => {white_bread=1} 0.02057311 0.8000000 0.02571639 6.720988 28
## [24] {bananas=1,
## wheat_bread=1} => {white_bread=1} 0.02057311 0.8000000 0.02571639 6.720988 28
## [25] {potato_chips=1,
## bananas=1} => {white_bread=1} 0.02057311 0.8000000 0.02571639 6.720988 28
## [26] {popcorn_salt=1,
## cola=1} => {white_bread=1} 0.02057311 0.8000000 0.02571639 6.720988 28
plot(sort_whitebread)
## To reduce overplotting, jitter is added! Use jitter = 0 to prevent jitter.
plot(sort_whitebread, method = "grouped")
plot(sort_whitebread, method = "graph")
rules_milk <- apriori(market1, parameter = list(supp= 0.02, conf= 0.8, maxlen = 3), appearance = list(rhs= c("x2pct_milk=1"), default= "lhs"))
## Apriori
##
## Parameter specification:
## confidence minval smax arem aval originalSupport maxtime support minlen
## 0.8 0.1 1 none FALSE TRUE 5 0.02 1
## maxlen target ext
## 3 rules TRUE
##
## Algorithmic control:
## filter tree heap memopt load sort verbose
## 0.1 TRUE TRUE FALSE TRUE 2 TRUE
##
## Absolute minimum support count: 27
##
## set item appearances ...[1 item(s)] done [0.00s].
## set transactions ...[510 item(s), 1361 transaction(s)] done [0.03s].
## sorting and recoding items ... [450 item(s)] done [0.01s].
## creating transaction tree ... done [0.00s].
## checking subsets of size 1 2 3
## Warning in apriori(market1, parameter = list(supp = 0.02, conf = 0.8, maxlen
## = 3), : Mining stopped (maxlen reached). Only patterns up to a length of 3
## returned!
## done [8.27s].
## writing ... [14 rule(s)] done [0.08s].
## creating S4 object ... done [0.02s].
inspect(rules_milk)
## lhs rhs support confidence coverage lift count
## [1] {apples=1,
## wheat_bread=1} => {x2pct_milk=1} 0.02057311 0.8484848 0.02424688 7.750254 28
## [2] {potato_chips=1,
## apples=1} => {x2pct_milk=1} 0.02277737 0.8611111 0.02645114 7.865585 31
## [3] {orange_juice=1,
## toothpaste=1} => {x2pct_milk=1} 0.02130786 0.8055556 0.02645114 7.358128 29
## [4] {hair_conditioner=1,
## potato_chips=1} => {x2pct_milk=1} 0.02057311 0.8000000 0.02571639 7.307383 28
## [5] {bananas=1,
## wheat_bread=1} => {x2pct_milk=1} 0.02204262 0.8571429 0.02571639 7.829338 30
## [6] {onions=1,
## bananas=1} => {x2pct_milk=1} 0.02057311 0.8750000 0.02351212 7.992450 28
## [7] {potato_chips=1,
## bananas=1} => {x2pct_milk=1} 0.02057311 0.8000000 0.02571639 7.307383 28
## [8] {ramen_noodles=1,
## wheat_bread=1} => {x2pct_milk=1} 0.02130786 0.8787879 0.02424688 8.027049 29
## [9] {popcorn_salt=1,
## cola=1} => {x2pct_milk=1} 0.02130786 0.8285714 0.02571639 7.568360 29
## [10] {popcorn_salt=1,
## toothpaste=1} => {x2pct_milk=1} 0.02204262 0.8333333 0.02645114 7.611857 30
## [11] {pepperoni_pizza_frozen=1,
## wheat_bread=1} => {x2pct_milk=1} 0.02057311 0.8000000 0.02571639 7.307383 28
## [12] {pepperoni_pizza_frozen=1,
## toothpaste=1} => {x2pct_milk=1} 0.02057311 0.8000000 0.02571639 7.307383 28
## [13] {toothpaste=1,
## wheat_bread=1} => {x2pct_milk=1} 0.02792065 0.8085106 0.03453343 7.385121 38
## [14] {onions=1,
## wheat_bread=1} => {x2pct_milk=1} 0.02865540 0.8297872 0.03453343 7.579466 39
redundant_milk <- is.redundant(rules_milk)
which(redundant_milk)
## integer(0)
sort_milk <-sort(rules_milk, by="lift")
inspect(sort_milk)
## lhs rhs support confidence coverage lift count
## [1] {ramen_noodles=1,
## wheat_bread=1} => {x2pct_milk=1} 0.02130786 0.8787879 0.02424688 8.027049 29
## [2] {onions=1,
## bananas=1} => {x2pct_milk=1} 0.02057311 0.8750000 0.02351212 7.992450 28
## [3] {potato_chips=1,
## apples=1} => {x2pct_milk=1} 0.02277737 0.8611111 0.02645114 7.865585 31
## [4] {bananas=1,
## wheat_bread=1} => {x2pct_milk=1} 0.02204262 0.8571429 0.02571639 7.829338 30
## [5] {apples=1,
## wheat_bread=1} => {x2pct_milk=1} 0.02057311 0.8484848 0.02424688 7.750254 28
## [6] {popcorn_salt=1,
## toothpaste=1} => {x2pct_milk=1} 0.02204262 0.8333333 0.02645114 7.611857 30
## [7] {onions=1,
## wheat_bread=1} => {x2pct_milk=1} 0.02865540 0.8297872 0.03453343 7.579466 39
## [8] {popcorn_salt=1,
## cola=1} => {x2pct_milk=1} 0.02130786 0.8285714 0.02571639 7.568360 29
## [9] {toothpaste=1,
## wheat_bread=1} => {x2pct_milk=1} 0.02792065 0.8085106 0.03453343 7.385121 38
## [10] {orange_juice=1,
## toothpaste=1} => {x2pct_milk=1} 0.02130786 0.8055556 0.02645114 7.358128 29
## [11] {hair_conditioner=1,
## potato_chips=1} => {x2pct_milk=1} 0.02057311 0.8000000 0.02571639 7.307383 28
## [12] {potato_chips=1,
## bananas=1} => {x2pct_milk=1} 0.02057311 0.8000000 0.02571639 7.307383 28
## [13] {pepperoni_pizza_frozen=1,
## wheat_bread=1} => {x2pct_milk=1} 0.02057311 0.8000000 0.02571639 7.307383 28
## [14] {pepperoni_pizza_frozen=1,
## toothpaste=1} => {x2pct_milk=1} 0.02057311 0.8000000 0.02571639 7.307383 28
plot(sort_milk)
## To reduce overplotting, jitter is added! Use jitter = 0 to prevent jitter.
plot(sort_milk, method ="grouped")
plot(sort_milk, method = "graph")
rules_potatochips <- apriori(market1, parameter = list(supp= 0.01, conf= 0.8, maxlen = 3), appearance = list(rhs= c("potato_chips=1"), default= "lhs"))
## Apriori
##
## Parameter specification:
## confidence minval smax arem aval originalSupport maxtime support minlen
## 0.8 0.1 1 none FALSE TRUE 5 0.01 1
## maxlen target ext
## 3 rules TRUE
##
## Algorithmic control:
## filter tree heap memopt load sort verbose
## 0.1 TRUE TRUE FALSE TRUE 2 TRUE
##
## Absolute minimum support count: 13
##
## set item appearances ...[1 item(s)] done [0.00s].
## set transactions ...[510 item(s), 1361 transaction(s)] done [0.03s].
## sorting and recoding items ... [475 item(s)] done [0.01s].
## creating transaction tree ... done [0.00s].
## checking subsets of size 1 2 3
## Warning in apriori(market1, parameter = list(supp = 0.01, conf = 0.8, maxlen
## = 3), : Mining stopped (maxlen reached). Only patterns up to a length of 3
## returned!
## done [8.51s].
## writing ... [158 rule(s)] done [0.12s].
## creating S4 object ... done [0.02s].
inspect(rules_potatochips)
## lhs rhs support confidence coverage lift count
## [1] {frozen_cauliflower=1,
## eggs=1} => {potato_chips=1} 0.01102131 0.8823529 0.01249082 9.029191 15
## [2] {x98pct_fat_free_hamburger=1,
## whole_green_beans=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [3] {whole_green_beans=1,
## eggs=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [4] {hot_dogs=1,
## ground_beef=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [5] {x98pct_fat_free_hamburger=1,
## frozen_carrots=1} => {potato_chips=1} 0.01028655 0.9333333 0.01102131 9.550877 14
## [6] {screw_driver=1,
## wheat_bread=1} => {potato_chips=1} 0.01175606 0.9411765 0.01249082 9.631137 16
## [7] {screw_driver=1,
## sweet_relish=1} => {potato_chips=1} 0.01175606 0.8888889 0.01322557 9.096074 16
## [8] {screw_driver=1,
## hot_dogs=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [9] {screw_driver=1,
## x2pct_milk=1} => {potato_chips=1} 0.01102131 0.9375000 0.01175606 9.593515 15
## [10] {screw_driver=1,
## white_bread=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [11] {screw_driver=1,
## eggs=1} => {potato_chips=1} 0.01249082 0.9444444 0.01322557 9.664578 17
## [12] {x2pct_milk=1,
## corned_beef=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [13] {x98pct_fat_free_hamburger=1,
## ice_cream_sandwich=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [14] {ice_cream_sandwich=1,
## eggs=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [15] {frozen_sausage_pizza=1,
## tomatoes=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [16] {x98pct_fat_free_hamburger=1,
## frozen_sausage_pizza=1} => {potato_chips=1} 0.01102131 0.8823529 0.01249082 9.029191 15
## [17] {frozen_sausage_pizza=1,
## white_bread=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [18] {frozen_sausage_pizza=1,
## eggs=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [19] {glass_cleaner=1,
## domestic_beer=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [20] {glass_cleaner=1,
## pepperoni_pizza_frozen=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [21] {glass_cleaner=1,
## toothpaste=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [22] {glass_cleaner=1,
## x2pct_milk=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [23] {glass_cleaner=1,
## white_bread=1} => {potato_chips=1} 0.01322557 0.8181818 0.01616458 8.372522 18
## [24] {glass_cleaner=1,
## eggs=1} => {potato_chips=1} 0.01249082 0.8500000 0.01469508 8.698120 17
## [25] {x98pct_fat_free_hamburger=1,
## raspberry_fruit_roll=1} => {potato_chips=1} 0.01175606 1.0000000 0.01175606 10.233083 16
## [26] {turkey_tv_dinner=1,
## hot_dogs=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [27] {blueberry_muffins=1,
## eggs=1} => {potato_chips=1} 0.01322557 0.8181818 0.01616458 8.372522 18
## [28] {sour_cream=1,
## rye_bread=1} => {potato_chips=1} 0.01175606 0.9411765 0.01249082 9.631137 16
## [29] {apples=1,
## rye_bread=1} => {potato_chips=1} 0.01102131 0.8823529 0.01249082 9.029191 15
## [30] {canned_tuna=1,
## rye_bread=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [31] {sugar_cookies=1,
## rye_bread=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [32] {bologna=1,
## rye_bread=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [33] {pepperoni_pizza_frozen=1,
## rye_bread=1} => {potato_chips=1} 0.01249082 0.8947368 0.01396032 9.155916 17
## [34] {rye_bread=1,
## toilet_paper=1} => {potato_chips=1} 0.01175606 0.9411765 0.01249082 9.631137 16
## [35] {rye_bread=1,
## wheat_bread=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [36] {toothpaste=1,
## rye_bread=1} => {potato_chips=1} 0.01249082 0.8095238 0.01542983 8.283924 17
## [37] {onions=1,
## rye_bread=1} => {potato_chips=1} 0.01175606 0.8888889 0.01322557 9.096074 16
## [38] {hot_dogs=1,
## rye_bread=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [39] {x98pct_fat_free_hamburger=1,
## rye_bread=1} => {potato_chips=1} 0.01322557 0.9000000 0.01469508 9.209774 18
## [40] {x2pct_milk=1,
## rye_bread=1} => {potato_chips=1} 0.01469508 0.8333333 0.01763409 8.527569 20
## [41] {white_bread=1,
## rye_bread=1} => {potato_chips=1} 0.01542983 0.8076923 0.01910360 8.265182 21
## [42] {eggs=1,
## rye_bread=1} => {potato_chips=1} 0.01322557 0.8181818 0.01616458 8.372522 18
## [43] {chicken_tv_dinner=1,
## donuts=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [44] {apples=1,
## sponge=1} => {potato_chips=1} 0.01102131 0.9375000 0.01175606 9.593515 15
## [45] {x98pct_fat_free_hamburger=1,
## tomato_sauce=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [46] {waffles=1,
## strawberry_preserves=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [47] {orange_juice=1,
## strawberry_preserves=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [48] {strawberry_preserves=1,
## french_fries=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [49] {strawberry_preserves=1,
## popcorn_salt=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [50] {dishwasher_detergent=1,
## toothpaste=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [51] {dishwasher_detergent=1,
## eggs=1} => {potato_chips=1} 0.01322557 0.8571429 0.01542983 8.771214 18
## [52] {toothpaste=1,
## souring_pads=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [53] {x98pct_fat_free_hamburger=1,
## toilet_bowl_cleaner=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [54] {frozen_cheese_pizza=1,
## toothpaste=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [55] {smoked_turkey_sliced=1,
## toothpaste=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [56] {lemons=1,
## apples=1} => {potato_chips=1} 0.01102131 0.8823529 0.01249082 9.029191 15
## [57] {lemons=1,
## canned_tuna=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [58] {lemons=1,
## pancake_mix=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [59] {hair_conditioner=1,
## lemons=1} => {potato_chips=1} 0.01249082 0.8500000 0.01469508 8.698120 17
## [60] {lemons=1,
## popcorn_salt=1} => {potato_chips=1} 0.01102131 0.8823529 0.01249082 9.029191 15
## [61] {lemons=1,
## cola=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [62] {lemons=1,
## hot_dogs=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [63] {lemons=1,
## x98pct_fat_free_hamburger=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [64] {lemons=1,
## x2pct_milk=1} => {potato_chips=1} 0.01396032 0.8636364 0.01616458 8.837662 19
## [65] {lemons=1,
## white_bread=1} => {potato_chips=1} 0.01469508 0.8000000 0.01836885 8.186466 20
## [66] {bologna=1,
## pepper=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [67] {deli_salad=1,
## toilet_paper=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [68] {deli_salad=1,
## toothpaste=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [69] {deli_salad=1,
## hot_dogs=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [70] {x98pct_fat_free_hamburger=1,
## cauliflower=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [71] {eggs=1,
## cauliflower=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [72] {canned_tuna=1,
## cheese_dip=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [73] {popcorn_salt=1,
## diet_cola=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [74] {onions=1,
## diet_cola=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [75] {diet_cola=1,
## sweet_relish=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [76] {hot_dogs=1,
## diet_cola=1} => {potato_chips=1} 0.01249082 0.8500000 0.01469508 8.698120 17
## [77] {x98pct_fat_free_hamburger=1,
## diet_cola=1} => {potato_chips=1} 0.01396032 0.9047619 0.01542983 9.258503 19
## [78] {white_bread=1,
## diet_cola=1} => {potato_chips=1} 0.01542983 0.8400000 0.01836885 8.595789 21
## [79] {sandwich_bags=1,
## mandarin_oranges=1} => {potato_chips=1} 0.01028655 0.9333333 0.01102131 9.550877 14
## [80] {x2pct_milk=1,
## mandarin_oranges=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [81] {waffles=1,
## vegetable_soup=1} => {potato_chips=1} 0.01175606 0.8888889 0.01322557 9.096074 16
## [82] {trash_bags=1,
## apples=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [83] {beef_soup=1,
## x2pct_milk=1} => {potato_chips=1} 0.01322557 0.8181818 0.01616458 8.372522 18
## [84] {waffles=1,
## x75_watt_lightbulb=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [85] {canned_tuna=1,
## donuts=1} => {potato_chips=1} 0.01249082 0.8947368 0.01396032 9.155916 17
## [86] {french_fries=1,
## donuts=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [87] {raisins=1,
## donuts=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [88] {bologna=1,
## donuts=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [89] {donuts=1,
## wheat_bread=1} => {potato_chips=1} 0.01322557 0.9000000 0.01469508 9.209774 18
## [90] {onions=1,
## donuts=1} => {potato_chips=1} 0.01175606 0.8888889 0.01322557 9.096074 16
## [91] {donuts=1,
## sweet_relish=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [92] {x98pct_fat_free_hamburger=1,
## donuts=1} => {potato_chips=1} 0.01175606 0.8888889 0.01322557 9.096074 16
## [93] {x2pct_milk=1,
## donuts=1} => {potato_chips=1} 0.01616458 0.8148148 0.01983835 8.338067 22
## [94] {chardonnay_wine=1,
## toothpaste=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [95] {corn_oil=1,
## apples=1} => {potato_chips=1} 0.01249082 0.8500000 0.01469508 8.698120 17
## [96] {corn_oil=1,
## canned_tuna=1} => {potato_chips=1} 0.01102131 0.8823529 0.01249082 9.029191 15
## [97] {corn_oil=1,
## popcorn_salt=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [98] {corn_oil=1,
## wheat_bread=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [99] {corn_oil=1,
## cola=1} => {potato_chips=1} 0.01322557 0.8181818 0.01616458 8.372522 18
## [100] {onions=1,
## corn_oil=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [101] {corn_oil=1,
## sweet_relish=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [102] {corn_oil=1,
## hot_dogs=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [103] {x98pct_fat_free_hamburger=1,
## corn_oil=1} => {potato_chips=1} 0.01542983 0.8750000 0.01763409 8.953947 21
## [104] {corn_oil=1,
## x2pct_milk=1} => {potato_chips=1} 0.01396032 0.8636364 0.01616458 8.837662 19
## [105] {tomatoes=1,
## sharp_cheddar_cheese=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [106] {pepperoni_pizza_frozen=1,
## black_eyed_peas=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [107] {sugar=1,
## pepperoni_pizza_frozen=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [108] {onions=1,
## sugar=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [109] {chicken_soup=1,
## oranges=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [110] {hot_dogs=1,
## plastic_forks=1} => {potato_chips=1} 0.01396032 0.8636364 0.01616458 8.837662 19
## [111] {flavored_fruit_bars=1,
## plain_bagels=1} => {potato_chips=1} 0.01249082 0.9444444 0.01322557 9.664578 17
## [112] {flavored_fruit_bars=1,
## apples=1} => {potato_chips=1} 0.01249082 0.8500000 0.01469508 8.698120 17
## [113] {flavored_fruit_bars=1,
## canned_tuna=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [114] {flavored_fruit_bars=1,
## french_fries=1} => {potato_chips=1} 0.01249082 0.8500000 0.01469508 8.698120 17
## [115] {flavored_fruit_bars=1,
## raisins=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [116] {flavored_fruit_bars=1,
## popcorn_salt=1} => {potato_chips=1} 0.01396032 0.8260870 0.01689934 8.453416 19
## [117] {flavored_fruit_bars=1,
## bologna=1} => {potato_chips=1} 0.01322557 0.8181818 0.01616458 8.372522 18
## [118] {flavored_fruit_bars=1,
## tomatoes=1} => {potato_chips=1} 0.01175606 0.8888889 0.01322557 9.096074 16
## [119] {flavored_fruit_bars=1,
## wheat_bread=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [120] {flavored_fruit_bars=1,
## cola=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [121] {flavored_fruit_bars=1,
## toothpaste=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [122] {flavored_fruit_bars=1,
## hot_dogs=1} => {potato_chips=1} 0.01469508 0.8000000 0.01836885 8.186466 20
## [123] {flavored_fruit_bars=1,
## white_bread=1} => {potato_chips=1} 0.01763409 0.8275862 0.02130786 8.468758 24
## [124] {shampoo=1,
## apples=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [125] {canned_tuna=1,
## cole_slaw=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [126] {x98pct_fat_free_hamburger=1,
## cole_slaw=1} => {potato_chips=1} 0.01322557 0.9473684 0.01396032 9.694499 18
## [127] {x98pct_fat_free_hamburger=1,
## chicken_noodle_soup=1} => {potato_chips=1} 0.01322557 0.8181818 0.01616458 8.372522 18
## [128] {mushrooms=1,
## licorice=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [129] {canned_tuna=1,
## licorice=1} => {potato_chips=1} 0.01249082 0.8947368 0.01396032 9.155916 17
## [130] {plums=1,
## licorice=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [131] {popcorn_salt=1,
## licorice=1} => {potato_chips=1} 0.01542983 0.8750000 0.01763409 8.953947 21
## [132] {licorice=1,
## toilet_paper=1} => {potato_chips=1} 0.01322557 0.9000000 0.01469508 9.209774 18
## [133] {hot_dogs=1,
## licorice=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [134] {x98pct_fat_free_hamburger=1,
## licorice=1} => {potato_chips=1} 0.01322557 0.9000000 0.01469508 9.209774 18
## [135] {eggs=1,
## licorice=1} => {potato_chips=1} 0.01542983 0.8400000 0.01836885 8.595789 21
## [136] {toothpaste=1,
## pretzels=1} => {potato_chips=1} 0.01249082 0.8500000 0.01469508 8.698120 17
## [137] {orange_juice=1,
## plain_bagels=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [138] {pancake_mix=1,
## plain_bagels=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [139] {hair_conditioner=1,
## plain_bagels=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [140] {bologna=1,
## plain_bagels=1} => {potato_chips=1} 0.01249082 0.8947368 0.01396032 9.155916 17
## [141] {white_bread=1,
## plain_bagels=1} => {potato_chips=1} 0.01983835 0.8181818 0.02424688 8.372522 27
## [142] {sour_cream=1,
## canned_tuna=1} => {potato_chips=1} 0.01249082 0.8095238 0.01542983 8.283924 17
## [143] {waffles=1,
## french_fries=1} => {potato_chips=1} 0.01469508 0.9090909 0.01616458 9.302802 20
## [144] {waffles=1,
## raisins=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [145] {waffles=1,
## popcorn_salt=1} => {potato_chips=1} 0.01322557 0.8571429 0.01542983 8.771214 18
## [146] {waffles=1,
## tomatoes=1} => {potato_chips=1} 0.01689934 0.8214286 0.02057311 8.405747 23
## [147] {apples=1,
## canned_tuna=1} => {potato_chips=1} 0.01616458 0.8800000 0.01836885 9.005113 22
## [148] {apples=1,
## garlic=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [149] {sandwich_bags=1,
## oranges=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [150] {plums=1,
## sandwich_bags=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [151] {sandwich_bags=1,
## french_fries=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [152] {bananas=1,
## canned_tuna=1} => {potato_chips=1} 0.01322557 0.8571429 0.01542983 8.771214 18
## [153] {plums=1,
## bananas=1} => {potato_chips=1} 0.01249082 0.8095238 0.01542983 8.283924 17
## [154] {plums=1,
## popcorn_salt=1} => {potato_chips=1} 0.01542983 0.8076923 0.01910360 8.265182 21
## [155] {hair_conditioner=1,
## pancake_mix=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [156] {x98pct_fat_free_hamburger=1,
## garlic=1} => {potato_chips=1} 0.01910360 0.8387097 0.02277737 8.582585 26
## [157] {hair_conditioner=1,
## popcorn_salt=1} => {potato_chips=1} 0.01249082 0.8095238 0.01542983 8.283924 17
## [158] {popcorn_salt=1,
## bananas=1} => {potato_chips=1} 0.01249082 0.8500000 0.01469508 8.698120 17
redundant_potato <- is.redundant(rules_potatochips)
which(redundant_potato)
## integer(0)
sort_potato <- sort(rules_potatochips, by= "lift")
inspect(sort_potato)
## lhs rhs support confidence coverage lift count
## [1] {x98pct_fat_free_hamburger=1,
## raspberry_fruit_roll=1} => {potato_chips=1} 0.01175606 1.0000000 0.01175606 10.233083 16
## [2] {x98pct_fat_free_hamburger=1,
## cole_slaw=1} => {potato_chips=1} 0.01322557 0.9473684 0.01396032 9.694499 18
## [3] {screw_driver=1,
## eggs=1} => {potato_chips=1} 0.01249082 0.9444444 0.01322557 9.664578 17
## [4] {flavored_fruit_bars=1,
## plain_bagels=1} => {potato_chips=1} 0.01249082 0.9444444 0.01322557 9.664578 17
## [5] {screw_driver=1,
## wheat_bread=1} => {potato_chips=1} 0.01175606 0.9411765 0.01249082 9.631137 16
## [6] {sour_cream=1,
## rye_bread=1} => {potato_chips=1} 0.01175606 0.9411765 0.01249082 9.631137 16
## [7] {rye_bread=1,
## toilet_paper=1} => {potato_chips=1} 0.01175606 0.9411765 0.01249082 9.631137 16
## [8] {screw_driver=1,
## x2pct_milk=1} => {potato_chips=1} 0.01102131 0.9375000 0.01175606 9.593515 15
## [9] {apples=1,
## sponge=1} => {potato_chips=1} 0.01102131 0.9375000 0.01175606 9.593515 15
## [10] {x98pct_fat_free_hamburger=1,
## frozen_carrots=1} => {potato_chips=1} 0.01028655 0.9333333 0.01102131 9.550877 14
## [11] {sandwich_bags=1,
## mandarin_oranges=1} => {potato_chips=1} 0.01028655 0.9333333 0.01102131 9.550877 14
## [12] {waffles=1,
## french_fries=1} => {potato_chips=1} 0.01469508 0.9090909 0.01616458 9.302802 20
## [13] {x98pct_fat_free_hamburger=1,
## diet_cola=1} => {potato_chips=1} 0.01396032 0.9047619 0.01542983 9.258503 19
## [14] {x98pct_fat_free_hamburger=1,
## rye_bread=1} => {potato_chips=1} 0.01322557 0.9000000 0.01469508 9.209774 18
## [15] {donuts=1,
## wheat_bread=1} => {potato_chips=1} 0.01322557 0.9000000 0.01469508 9.209774 18
## [16] {licorice=1,
## toilet_paper=1} => {potato_chips=1} 0.01322557 0.9000000 0.01469508 9.209774 18
## [17] {x98pct_fat_free_hamburger=1,
## licorice=1} => {potato_chips=1} 0.01322557 0.9000000 0.01469508 9.209774 18
## [18] {pepperoni_pizza_frozen=1,
## rye_bread=1} => {potato_chips=1} 0.01249082 0.8947368 0.01396032 9.155916 17
## [19] {canned_tuna=1,
## donuts=1} => {potato_chips=1} 0.01249082 0.8947368 0.01396032 9.155916 17
## [20] {canned_tuna=1,
## licorice=1} => {potato_chips=1} 0.01249082 0.8947368 0.01396032 9.155916 17
## [21] {bologna=1,
## plain_bagels=1} => {potato_chips=1} 0.01249082 0.8947368 0.01396032 9.155916 17
## [22] {screw_driver=1,
## sweet_relish=1} => {potato_chips=1} 0.01175606 0.8888889 0.01322557 9.096074 16
## [23] {onions=1,
## rye_bread=1} => {potato_chips=1} 0.01175606 0.8888889 0.01322557 9.096074 16
## [24] {waffles=1,
## vegetable_soup=1} => {potato_chips=1} 0.01175606 0.8888889 0.01322557 9.096074 16
## [25] {onions=1,
## donuts=1} => {potato_chips=1} 0.01175606 0.8888889 0.01322557 9.096074 16
## [26] {x98pct_fat_free_hamburger=1,
## donuts=1} => {potato_chips=1} 0.01175606 0.8888889 0.01322557 9.096074 16
## [27] {flavored_fruit_bars=1,
## tomatoes=1} => {potato_chips=1} 0.01175606 0.8888889 0.01322557 9.096074 16
## [28] {frozen_cauliflower=1,
## eggs=1} => {potato_chips=1} 0.01102131 0.8823529 0.01249082 9.029191 15
## [29] {x98pct_fat_free_hamburger=1,
## frozen_sausage_pizza=1} => {potato_chips=1} 0.01102131 0.8823529 0.01249082 9.029191 15
## [30] {apples=1,
## rye_bread=1} => {potato_chips=1} 0.01102131 0.8823529 0.01249082 9.029191 15
## [31] {lemons=1,
## apples=1} => {potato_chips=1} 0.01102131 0.8823529 0.01249082 9.029191 15
## [32] {lemons=1,
## popcorn_salt=1} => {potato_chips=1} 0.01102131 0.8823529 0.01249082 9.029191 15
## [33] {corn_oil=1,
## canned_tuna=1} => {potato_chips=1} 0.01102131 0.8823529 0.01249082 9.029191 15
## [34] {apples=1,
## canned_tuna=1} => {potato_chips=1} 0.01616458 0.8800000 0.01836885 9.005113 22
## [35] {hot_dogs=1,
## ground_beef=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [36] {ice_cream_sandwich=1,
## eggs=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [37] {frozen_sausage_pizza=1,
## tomatoes=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [38] {glass_cleaner=1,
## pepperoni_pizza_frozen=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [39] {turkey_tv_dinner=1,
## hot_dogs=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [40] {canned_tuna=1,
## rye_bread=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [41] {sugar_cookies=1,
## rye_bread=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [42] {chicken_tv_dinner=1,
## donuts=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [43] {waffles=1,
## strawberry_preserves=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [44] {lemons=1,
## x98pct_fat_free_hamburger=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [45] {deli_salad=1,
## toilet_paper=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [46] {waffles=1,
## x75_watt_lightbulb=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [47] {x98pct_fat_free_hamburger=1,
## corn_oil=1} => {potato_chips=1} 0.01542983 0.8750000 0.01763409 8.953947 21
## [48] {sugar=1,
## pepperoni_pizza_frozen=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [49] {flavored_fruit_bars=1,
## canned_tuna=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [50] {mushrooms=1,
## licorice=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [51] {popcorn_salt=1,
## licorice=1} => {potato_chips=1} 0.01542983 0.8750000 0.01763409 8.953947 21
## [52] {hair_conditioner=1,
## plain_bagels=1} => {potato_chips=1} 0.01028655 0.8750000 0.01175606 8.953947 14
## [53] {lemons=1,
## x2pct_milk=1} => {potato_chips=1} 0.01396032 0.8636364 0.01616458 8.837662 19
## [54] {corn_oil=1,
## x2pct_milk=1} => {potato_chips=1} 0.01396032 0.8636364 0.01616458 8.837662 19
## [55] {hot_dogs=1,
## plastic_forks=1} => {potato_chips=1} 0.01396032 0.8636364 0.01616458 8.837662 19
## [56] {dishwasher_detergent=1,
## eggs=1} => {potato_chips=1} 0.01322557 0.8571429 0.01542983 8.771214 18
## [57] {waffles=1,
## popcorn_salt=1} => {potato_chips=1} 0.01322557 0.8571429 0.01542983 8.771214 18
## [58] {bananas=1,
## canned_tuna=1} => {potato_chips=1} 0.01322557 0.8571429 0.01542983 8.771214 18
## [59] {glass_cleaner=1,
## eggs=1} => {potato_chips=1} 0.01249082 0.8500000 0.01469508 8.698120 17
## [60] {hair_conditioner=1,
## lemons=1} => {potato_chips=1} 0.01249082 0.8500000 0.01469508 8.698120 17
## [61] {hot_dogs=1,
## diet_cola=1} => {potato_chips=1} 0.01249082 0.8500000 0.01469508 8.698120 17
## [62] {corn_oil=1,
## apples=1} => {potato_chips=1} 0.01249082 0.8500000 0.01469508 8.698120 17
## [63] {flavored_fruit_bars=1,
## apples=1} => {potato_chips=1} 0.01249082 0.8500000 0.01469508 8.698120 17
## [64] {flavored_fruit_bars=1,
## french_fries=1} => {potato_chips=1} 0.01249082 0.8500000 0.01469508 8.698120 17
## [65] {toothpaste=1,
## pretzels=1} => {potato_chips=1} 0.01249082 0.8500000 0.01469508 8.698120 17
## [66] {popcorn_salt=1,
## bananas=1} => {potato_chips=1} 0.01249082 0.8500000 0.01469508 8.698120 17
## [67] {screw_driver=1,
## white_bread=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [68] {frozen_sausage_pizza=1,
## white_bread=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [69] {glass_cleaner=1,
## x2pct_milk=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [70] {bologna=1,
## rye_bread=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [71] {hot_dogs=1,
## rye_bread=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [72] {x98pct_fat_free_hamburger=1,
## tomato_sauce=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [73] {toothpaste=1,
## souring_pads=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [74] {lemons=1,
## cola=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [75] {eggs=1,
## cauliflower=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [76] {popcorn_salt=1,
## diet_cola=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [77] {raisins=1,
## donuts=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [78] {plums=1,
## licorice=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [79] {hot_dogs=1,
## licorice=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [80] {waffles=1,
## raisins=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [81] {sandwich_bags=1,
## french_fries=1} => {potato_chips=1} 0.01175606 0.8421053 0.01396032 8.617333 16
## [82] {white_bread=1,
## diet_cola=1} => {potato_chips=1} 0.01542983 0.8400000 0.01836885 8.595789 21
## [83] {eggs=1,
## licorice=1} => {potato_chips=1} 0.01542983 0.8400000 0.01836885 8.595789 21
## [84] {x98pct_fat_free_hamburger=1,
## garlic=1} => {potato_chips=1} 0.01910360 0.8387097 0.02277737 8.582585 26
## [85] {frozen_sausage_pizza=1,
## eggs=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [86] {x2pct_milk=1,
## rye_bread=1} => {potato_chips=1} 0.01469508 0.8333333 0.01763409 8.527569 20
## [87] {strawberry_preserves=1,
## french_fries=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [88] {frozen_cheese_pizza=1,
## toothpaste=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [89] {bologna=1,
## pepper=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [90] {onions=1,
## diet_cola=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [91] {diet_cola=1,
## sweet_relish=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [92] {x2pct_milk=1,
## mandarin_oranges=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [93] {trash_bags=1,
## apples=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [94] {french_fries=1,
## donuts=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [95] {bologna=1,
## donuts=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [96] {donuts=1,
## sweet_relish=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [97] {corn_oil=1,
## popcorn_salt=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [98] {corn_oil=1,
## wheat_bread=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [99] {onions=1,
## sugar=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [100] {flavored_fruit_bars=1,
## raisins=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [101] {plums=1,
## sandwich_bags=1} => {potato_chips=1} 0.01102131 0.8333333 0.01322557 8.527569 15
## [102] {flavored_fruit_bars=1,
## white_bread=1} => {potato_chips=1} 0.01763409 0.8275862 0.02130786 8.468758 24
## [103] {flavored_fruit_bars=1,
## popcorn_salt=1} => {potato_chips=1} 0.01396032 0.8260870 0.01689934 8.453416 19
## [104] {x98pct_fat_free_hamburger=1,
## whole_green_beans=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [105] {whole_green_beans=1,
## eggs=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [106] {screw_driver=1,
## hot_dogs=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [107] {x2pct_milk=1,
## corned_beef=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [108] {x98pct_fat_free_hamburger=1,
## ice_cream_sandwich=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [109] {glass_cleaner=1,
## domestic_beer=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [110] {glass_cleaner=1,
## toothpaste=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [111] {rye_bread=1,
## wheat_bread=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [112] {orange_juice=1,
## strawberry_preserves=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [113] {strawberry_preserves=1,
## popcorn_salt=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [114] {dishwasher_detergent=1,
## toothpaste=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [115] {smoked_turkey_sliced=1,
## toothpaste=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [116] {lemons=1,
## canned_tuna=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [117] {lemons=1,
## pancake_mix=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [118] {deli_salad=1,
## toothpaste=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [119] {deli_salad=1,
## hot_dogs=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [120] {x98pct_fat_free_hamburger=1,
## cauliflower=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [121] {corn_oil=1,
## sweet_relish=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [122] {tomatoes=1,
## sharp_cheddar_cheese=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [123] {pepperoni_pizza_frozen=1,
## black_eyed_peas=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [124] {shampoo=1,
## apples=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [125] {canned_tuna=1,
## cole_slaw=1} => {potato_chips=1} 0.01028655 0.8235294 0.01249082 8.427245 14
## [126] {waffles=1,
## tomatoes=1} => {potato_chips=1} 0.01689934 0.8214286 0.02057311 8.405747 23
## [127] {glass_cleaner=1,
## white_bread=1} => {potato_chips=1} 0.01322557 0.8181818 0.01616458 8.372522 18
## [128] {blueberry_muffins=1,
## eggs=1} => {potato_chips=1} 0.01322557 0.8181818 0.01616458 8.372522 18
## [129] {eggs=1,
## rye_bread=1} => {potato_chips=1} 0.01322557 0.8181818 0.01616458 8.372522 18
## [130] {beef_soup=1,
## x2pct_milk=1} => {potato_chips=1} 0.01322557 0.8181818 0.01616458 8.372522 18
## [131] {corn_oil=1,
## cola=1} => {potato_chips=1} 0.01322557 0.8181818 0.01616458 8.372522 18
## [132] {flavored_fruit_bars=1,
## bologna=1} => {potato_chips=1} 0.01322557 0.8181818 0.01616458 8.372522 18
## [133] {x98pct_fat_free_hamburger=1,
## chicken_noodle_soup=1} => {potato_chips=1} 0.01322557 0.8181818 0.01616458 8.372522 18
## [134] {white_bread=1,
## plain_bagels=1} => {potato_chips=1} 0.01983835 0.8181818 0.02424688 8.372522 27
## [135] {x2pct_milk=1,
## donuts=1} => {potato_chips=1} 0.01616458 0.8148148 0.01983835 8.338067 22
## [136] {toothpaste=1,
## rye_bread=1} => {potato_chips=1} 0.01249082 0.8095238 0.01542983 8.283924 17
## [137] {sour_cream=1,
## canned_tuna=1} => {potato_chips=1} 0.01249082 0.8095238 0.01542983 8.283924 17
## [138] {plums=1,
## bananas=1} => {potato_chips=1} 0.01249082 0.8095238 0.01542983 8.283924 17
## [139] {hair_conditioner=1,
## popcorn_salt=1} => {potato_chips=1} 0.01249082 0.8095238 0.01542983 8.283924 17
## [140] {white_bread=1,
## rye_bread=1} => {potato_chips=1} 0.01542983 0.8076923 0.01910360 8.265182 21
## [141] {plums=1,
## popcorn_salt=1} => {potato_chips=1} 0.01542983 0.8076923 0.01910360 8.265182 21
## [142] {x98pct_fat_free_hamburger=1,
## toilet_bowl_cleaner=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [143] {lemons=1,
## hot_dogs=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [144] {lemons=1,
## white_bread=1} => {potato_chips=1} 0.01469508 0.8000000 0.01836885 8.186466 20
## [145] {canned_tuna=1,
## cheese_dip=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [146] {chardonnay_wine=1,
## toothpaste=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [147] {onions=1,
## corn_oil=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [148] {corn_oil=1,
## hot_dogs=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [149] {chicken_soup=1,
## oranges=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [150] {flavored_fruit_bars=1,
## wheat_bread=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [151] {flavored_fruit_bars=1,
## cola=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [152] {flavored_fruit_bars=1,
## toothpaste=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [153] {flavored_fruit_bars=1,
## hot_dogs=1} => {potato_chips=1} 0.01469508 0.8000000 0.01836885 8.186466 20
## [154] {orange_juice=1,
## plain_bagels=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [155] {pancake_mix=1,
## plain_bagels=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [156] {apples=1,
## garlic=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [157] {sandwich_bags=1,
## oranges=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
## [158] {hair_conditioner=1,
## pancake_mix=1} => {potato_chips=1} 0.01175606 0.8000000 0.01469508 8.186466 16
plot(sort_potato)
## To reduce overplotting, jitter is added! Use jitter = 0 to prevent jitter.
plot(sort_potato[1:10], method = "graph", engine= "interactive")
plot(sort_potato, method = "grouped")