Imagine 10000 receipts sitting on your table. Each receipt represents a transaction with items that were purchased. The receipt is a representation of stuff that went into a customer’s basket - and therefore ‘Market Basket Analysis’.
That is exactly what the Groceries Data Set contains: a collection of receipts with each line representing 1 receipt and the items purchased. Each line is called a transaction and each column in a row represents an item. The data set is attached.
Your assignment is to use R to mine the data for association rules. You should report support, confidence and lift and your top 10 rules by lift.
Extra credit: do a simple cluster analysis on the data as well. Use whichever packages you like.
# Load required libraries
library(dplyr)
## Warning: package 'dplyr' was built under R version 4.4.3
##
## 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
library(arules)
## Warning: package 'arules' was built under R version 4.4.3
## Loading required package: Matrix
## Warning: package 'Matrix' was built under R version 4.4.3
##
## Attaching package: 'arules'
## The following object is masked from 'package:dplyr':
##
## recode
## The following objects are masked from 'package:base':
##
## abbreviate, write
# Read raw data (adjust path if needed)
raw_data <- readLines("C:/Users/Dell/Downloads/GroceryDataSet.csv")
# Split transactions by tabs and clean whitespace
transactions <- lapply(raw_data, function(row) {
items <- strsplit(row, "\t")[[1]] # Split by tabs
items <- trimws(items) # Remove leading/trailing whitespace
items <- items[items != ""] # Remove empty strings
return(items)
})
# Remove empty transactions (if any)
transactions <- transactions[sapply(transactions, length) > 0]
# 2) Standardize item names
# Clean item names: lowercase, replace spaces with underscores, remove duplicates
transactions_clean <- lapply(transactions, function(transaction) {
cleaned <- tolower(transaction) %>%
gsub(" ", "_", .) %>% # Replace spaces with underscores
gsub("-", "_", .) # Replace hyphens (optional)
unique(cleaned) # Remove duplicates within a transaction
})
# Example cleaned output (first 3 transactions)
cat("Tidied Transactions (First 3 Rows):\n")
## Tidied Transactions (First 3 Rows):
for (i in 1:3) {
cat(paste0("Transaction ", i, ": ", paste(transactions_clean[[i]], collapse = ", "), "\n"))
}
## Transaction 1: citrus_fruit,semi_finished_bread,margarine,ready_soups,,,,,,,,,,,,,,,,,,,,,,,,,,,,
## Transaction 2: tropical_fruit,yogurt,coffee,,,,,,,,,,,,,,,,,,,,,,,,,,,,,
## Transaction 3: whole_milk,,,,,,,,,,,,,,,,,,,,,,,,,,,,,,,
# 3) Save clean dataset
# Save as a CSV in "basket" format
writeLines(
sapply(transactions_clean, function(x) paste(x, collapse = ",")),
"cleaned_grocery_data.csv"
)
# 4) # Read cleaned data as transactions
grocery_trans <- read.transactions(
"cleaned_grocery_data.csv",
format = "basket",
sep = ","
)
# Run Apriori with adjusted parameters
rules <- apriori(
grocery_trans,
parameter = list(
support = 0.001, # Lowered from 0.5 to capture sparse patterns
confidence = 0.2, # Lower confidence threshold
minlen = 2 # Rules with at least 2 items
)
)
## Apriori
##
## Parameter specification:
## confidence minval smax arem aval originalSupport maxtime support minlen
## 0.2 0.1 1 none FALSE TRUE 5 0.001 2
## maxlen target ext
## 10 rules TRUE
##
## Algorithmic control:
## filter tree heap memopt load sort verbose
## 0.1 TRUE TRUE FALSE TRUE 2 TRUE
##
## Absolute minimum support count: 9
##
## set item appearances ...[0 item(s)] done [0.00s].
## set transactions ...[169 item(s), 9835 transaction(s)] done [0.00s].
## sorting and recoding items ... [157 item(s)] done [0.00s].
## creating transaction tree ... done [0.00s].
## checking subsets of size 1 2 3 4 5 6 done [0.01s].
## writing ... [21633 rule(s)] done [0.00s].
## creating S4 object ... done [0.01s].
# Inspect rules (if any are found)
inspect(rules)
## lhs rhs support confidence coverage lift count
## [1] {honey} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [2] {soap} => {whole_milk} 0.001118454 0.4230769 0.002643620 1.6557746 11
## [3] {tidbits} => {soda} 0.001016777 0.4347826 0.002338587 2.4933452 10
## [4] {tidbits} => {rolls/buns} 0.001220132 0.5217391 0.002338587 2.8365419 12
## [5] {cocoa_drinks} => {whole_milk} 0.001321810 0.5909091 0.002236909 2.3126108 13
## [6] {snack_products} => {soda} 0.001118454 0.3666667 0.003050330 2.1027211 11
## [7] {snack_products} => {rolls/buns} 0.001118454 0.3666667 0.003050330 1.9934586 11
## [8] {pudding_powder} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [9] {cooking_chocolate} => {whole_milk} 0.001321810 0.5200000 0.002541942 2.0350975 13
## [10] {bathroom_cleaner} => {soda} 0.001016777 0.3703704 0.002745297 2.1239607 10
## [11] {bathroom_cleaner} => {other_vegetables} 0.001016777 0.3703704 0.002745297 1.9141317 10
## [12] {nuts/prunes} => {rolls/buns} 0.001016777 0.3030303 0.003355363 1.6474865 10
## [13] {nuts/prunes} => {whole_milk} 0.001220132 0.3636364 0.003355363 1.4231451 12
## [14] {brandy} => {shopping_bags} 0.001321810 0.3170732 0.004168785 3.2181782 13
## [15] {brandy} => {rolls/buns} 0.001118454 0.2682927 0.004168785 1.4586283 11
## [16] {nut_snack} => {soda} 0.001016777 0.3225806 0.003152008 1.8499013 10
## [17] {potato_products} => {pastry} 0.001016777 0.3571429 0.002846975 4.0142857 10
## [18] {potato_products} => {whole_milk} 0.001220132 0.4285714 0.002846975 1.6772782 12
## [19] {artif._sweetener} => {yogurt} 0.001118454 0.3437500 0.003253686 2.4641263 11
## [20] {artif._sweetener} => {other_vegetables} 0.001016777 0.3125000 0.003253686 1.6150486 10
## [21] {artif._sweetener} => {whole_milk} 0.001118454 0.3437500 0.003253686 1.3453169 11
## [22] {male_cosmetics} => {bottled_water} 0.001321810 0.2888889 0.004575496 2.6138199 13
## [23] {male_cosmetics} => {yogurt} 0.001016777 0.2222222 0.004575496 1.5929705 10
## [24] {light_bulbs} => {yogurt} 0.001220132 0.2926829 0.004168785 2.0980587 12
## [25] {light_bulbs} => {other_vegetables} 0.001321810 0.3170732 0.004168785 1.6386835 13
## [26] {syrup} => {other_vegetables} 0.001118454 0.3437500 0.003253686 1.7765535 11
## [27] {canned_fruit} => {citrus_fruit} 0.001118454 0.3437500 0.003253686 4.1532939 11
## [28] {canned_fruit} => {other_vegetables} 0.001118454 0.3437500 0.003253686 1.7765535 11
## [29] {canned_fruit} => {whole_milk} 0.001321810 0.4062500 0.003253686 1.5899199 13
## [30] {rum} => {other_vegetables} 0.001525165 0.3409091 0.004473818 1.7618712 15
## [31] {rum} => {whole_milk} 0.001728521 0.3863636 0.004473818 1.5120917 17
## [32] {meat_spreads} => {cream_cheese_} 0.001118454 0.2619048 0.004270463 6.6047009 11
## [33] {meat_spreads} => {soda} 0.001423488 0.3333333 0.004270463 1.9115646 14
## [34] {meat_spreads} => {yogurt} 0.001830198 0.4285714 0.004270463 3.0721574 18
## [35] {meat_spreads} => {rolls/buns} 0.001321810 0.3095238 0.004270463 1.6827898 13
## [36] {meat_spreads} => {whole_milk} 0.001321810 0.3095238 0.004270463 1.2113676 13
## [37] {skin_care} => {yogurt} 0.001016777 0.2857143 0.003558719 2.0481050 10
## [38] {skin_care} => {rolls/buns} 0.001423488 0.4000000 0.003558719 2.1746821 14
## [39] {skin_care} => {other_vegetables} 0.001220132 0.3428571 0.003558719 1.7719390 12
## [40] {skin_care} => {whole_milk} 0.001626843 0.4571429 0.003558719 1.7890967 16
## [41] {specialty_fat} => {margarine} 0.001220132 0.3333333 0.003660397 5.6915509 12
## [42] {specialty_fat} => {other_vegetables} 0.001118454 0.3055556 0.003660397 1.5791586 11
## [43] {specialty_fat} => {whole_milk} 0.001220132 0.3333333 0.003660397 1.3045497 12
## [44] {sparkling_wine} => {other_vegetables} 0.001525165 0.2727273 0.005592272 1.4094970 15
## [45] {tea} => {bottled_beer} 0.001118454 0.2894737 0.003863752 3.5946637 11
## [46] {tea} => {tropical_fruit} 0.001321810 0.3421053 0.003863752 3.2602764 13
## [47] {tea} => {rolls/buns} 0.001118454 0.2894737 0.003863752 1.5737831 11
## [48] {tea} => {other_vegetables} 0.001525165 0.3947368 0.003863752 2.0400614 15
## [49] {tea} => {whole_milk} 0.001626843 0.4210526 0.003863752 1.6478522 16
## [50] {abrasive_cleaner} => {sausage} 0.001016777 0.2857143 0.003558719 3.0411255 10
## [51] {abrasive_cleaner} => {root_vegetables} 0.001321810 0.3714286 0.003558719 3.4076493 13
## [52] {abrasive_cleaner} => {yogurt} 0.001016777 0.2857143 0.003558719 2.0481050 10
## [53] {abrasive_cleaner} => {other_vegetables} 0.001626843 0.4571429 0.003558719 2.3625854 16
## [54] {abrasive_cleaner} => {whole_milk} 0.001626843 0.4571429 0.003558719 1.7890967 16
## [55] {photo/film} => {whole_milk} 0.002338587 0.2527473 0.009252669 0.9891640 23
## [56] {liver_loaf} => {frozen_vegetables} 0.001016777 0.2000000 0.005083884 4.1585624 10
## [57] {liver_loaf} => {sausage} 0.001016777 0.2000000 0.005083884 2.1287879 10
## [58] {liver_loaf} => {root_vegetables} 0.001423488 0.2800000 0.005083884 2.5688433 14
## [59] {liver_loaf} => {soda} 0.001118454 0.2200000 0.005083884 1.2616327 11
## [60] {liver_loaf} => {yogurt} 0.001525165 0.3000000 0.005083884 2.1505102 15
## [61] {liver_loaf} => {rolls/buns} 0.001525165 0.3000000 0.005083884 1.6310116 15
## [62] {liver_loaf} => {other_vegetables} 0.001525165 0.3000000 0.005083884 1.5504467 15
## [63] {liver_loaf} => {whole_milk} 0.002135231 0.4200000 0.005083884 1.6437326 21
## [64] {curd_cheese} => {tropical_fruit} 0.001525165 0.3000000 0.005083884 2.8590116 15
## [65] {curd_cheese} => {root_vegetables} 0.001016777 0.2000000 0.005083884 1.8348881 10
## [66] {curd_cheese} => {yogurt} 0.001321810 0.2600000 0.005083884 1.8637755 13
## [67] {curd_cheese} => {rolls/buns} 0.001626843 0.3200000 0.005083884 1.7397457 16
## [68] {curd_cheese} => {other_vegetables} 0.002135231 0.4200000 0.005083884 2.1706253 21
## [69] {curd_cheese} => {whole_milk} 0.002338587 0.4600000 0.005083884 1.8002786 23
## [70] {ketchup} => {domestic_eggs} 0.001321810 0.3095238 0.004270463 4.8784722 13
## [71] {ketchup} => {soda} 0.001321810 0.3095238 0.004270463 1.7750243 13
## [72] {ketchup} => {yogurt} 0.001118454 0.2619048 0.004270463 1.8774295 11
## [73] {ketchup} => {other_vegetables} 0.001525165 0.3571429 0.004270463 1.8457698 15
## [74] {ketchup} => {whole_milk} 0.001525165 0.3571429 0.004270463 1.3977318 15
## [75] {spices} => {pip_fruit} 0.001118454 0.2156863 0.005185562 2.8511754 11
## [76] {spices} => {sausage} 0.001321810 0.2549020 0.005185562 2.7131610 13
## [77] {spices} => {tropical_fruit} 0.001118454 0.2156863 0.005185562 2.0554986 11
## [78] {spices} => {yogurt} 0.001220132 0.2352941 0.005185562 1.6866747 12
## [79] {spices} => {rolls/buns} 0.001118454 0.2156863 0.005185562 1.1726227 11
## [80] {spices} => {other_vegetables} 0.001931876 0.3725490 0.005185562 1.9253913 19
## [81] {spices} => {whole_milk} 0.001423488 0.2745098 0.005185562 1.0743350 14
## [82] {cleaner} => {soda} 0.001118454 0.2200000 0.005083884 1.2616327 11
## [83] {cleaner} => {yogurt} 0.001626843 0.3200000 0.005083884 2.2938776 16
## [84] {cleaner} => {other_vegetables} 0.001626843 0.3200000 0.005083884 1.6538098 16
## [85] {cleaner} => {whole_milk} 0.002338587 0.4600000 0.005083884 1.8002786 23
## [86] {softener} => {detergent} 0.001118454 0.2037037 0.005490595 10.6001372 11
## [87] {softener} => {pip_fruit} 0.001118454 0.2037037 0.005490595 2.6927768 11
## [88] {softener} => {shopping_bags} 0.001118454 0.2037037 0.005490595 2.0675190 11
## [89] {softener} => {soda} 0.001118454 0.2037037 0.005490595 1.1681784 11
## [90] {softener} => {yogurt} 0.001220132 0.2222222 0.005490595 1.5929705 12
## [91] {softener} => {other_vegetables} 0.001626843 0.2962963 0.005490595 1.5313053 16
## [92] {softener} => {whole_milk} 0.002135231 0.3888889 0.005490595 1.5219746 21
## [93] {sauces} => {hamburger_meat} 0.001220132 0.2222222 0.005490595 6.6836561 12
## [94] {sauces} => {brown_bread} 0.001220132 0.2222222 0.005490595 3.4256357 12
## [95] {sauces} => {tropical_fruit} 0.001220132 0.2222222 0.005490595 2.1177864 12
## [96] {sauces} => {other_vegetables} 0.001525165 0.2777778 0.005490595 1.4355988 15
## [97] {sauces} => {whole_milk} 0.002135231 0.3888889 0.005490595 1.5219746 21
## [98] {zwieback} => {tropical_fruit} 0.001423488 0.2058824 0.006914082 1.9620668 14
## [99] {zwieback} => {yogurt} 0.001423488 0.2058824 0.006914082 1.4758403 14
## [100] {zwieback} => {rolls/buns} 0.001423488 0.2058824 0.006914082 1.1193217 14
## [101] {zwieback} => {other_vegetables} 0.001728521 0.2500000 0.006914082 1.2920389 17
## [102] {zwieback} => {whole_milk} 0.001728521 0.2500000 0.006914082 0.9784123 17
## [103] {finished_products} => {pastry} 0.001423488 0.2187500 0.006507372 2.4587500 14
## [104] {finished_products} => {shopping_bags} 0.001423488 0.2187500 0.006507372 2.2202335 14
## [105] {finished_products} => {soda} 0.001728521 0.2656250 0.006507372 1.5232781 17
## [106] {finished_products} => {other_vegetables} 0.002033554 0.3125000 0.006507372 1.6150486 20
## [107] {finished_products} => {whole_milk} 0.001423488 0.2187500 0.006507372 0.8561107 14
## [108] {liquor_(appetizer)} => {canned_beer} 0.001728521 0.2179487 0.007930859 2.8056618 17
## [109] {liquor_(appetizer)} => {bottled_beer} 0.001830198 0.2307692 0.007930859 2.8656760 18
## [110] {liquor_(appetizer)} => {newspapers} 0.001626843 0.2051282 0.007930859 2.5699820 16
## [111] {liquor_(appetizer)} => {soda} 0.002440264 0.3076923 0.007930859 1.7645212 24
## [112] {liquor_(appetizer)} => {whole_milk} 0.001626843 0.2051282 0.007930859 0.8027998 16
## [113] {female_sanitary_products} => {citrus_fruit} 0.001321810 0.2166667 0.006100661 2.6178337 13
## [114] {female_sanitary_products} => {soda} 0.001423488 0.2333333 0.006100661 1.3380952 14
## [115] {female_sanitary_products} => {yogurt} 0.001626843 0.2666667 0.006100661 1.9115646 16
## [116] {female_sanitary_products} => {rolls/buns} 0.001626843 0.2666667 0.006100661 1.4497881 16
## [117] {female_sanitary_products} => {other_vegetables} 0.001423488 0.2333333 0.006100661 1.2059030 14
## [118] {female_sanitary_products} => {whole_milk} 0.002033554 0.3333333 0.006100661 1.3045497 20
## [119] {liquor} => {bottled_beer} 0.004677173 0.4220183 0.011082867 5.2405940 46
## [120] {liquor} => {shopping_bags} 0.002541942 0.2293578 0.011082867 2.3278988 25
## [121] {cereals} => {root_vegetables} 0.001321810 0.2321429 0.005693950 2.1297808 13
## [122] {cereals} => {yogurt} 0.002135231 0.3750000 0.005693950 2.6881378 21
## [123] {cereals} => {other_vegetables} 0.002033554 0.3571429 0.005693950 1.8457698 20
## [124] {cereals} => {whole_milk} 0.003660397 0.6428571 0.005693950 2.5159172 36
## [125] {jam} => {beef} 0.001220132 0.2264151 0.005388917 4.3154892 12
## [126] {jam} => {butter} 0.001220132 0.2264151 0.005388917 4.0858577 12
## [127] {jam} => {bottled_water} 0.001220132 0.2264151 0.005388917 2.0485671 12
## [128] {jam} => {tropical_fruit} 0.001118454 0.2075472 0.005388917 1.9779326 11
## [129] {jam} => {root_vegetables} 0.001931876 0.3584906 0.005388917 3.2889503 19
## [130] {jam} => {soda} 0.001321810 0.2452830 0.005388917 1.4066230 13
## [131] {jam} => {yogurt} 0.001220132 0.2264151 0.005388917 1.6230266 12
## [132] {jam} => {rolls/buns} 0.001321810 0.2452830 0.005388917 1.3335315 13
## [133] {jam} => {other_vegetables} 0.001830198 0.3396226 0.005388917 1.7552226 18
## [134] {jam} => {whole_milk} 0.002948653 0.5471698 0.005388917 2.1414306 29
## [135] {dental_care} => {newspapers} 0.001321810 0.2280702 0.005795628 2.8574142 13
## [136] {dental_care} => {rolls/buns} 0.001423488 0.2456140 0.005795628 1.3353311 14
## [137] {dental_care} => {other_vegetables} 0.002033554 0.3508772 0.005795628 1.8133879 20
## [138] {dental_care} => {whole_milk} 0.001830198 0.3157895 0.005795628 1.2358892 18
## [139] {kitchen_towels} => {coffee} 0.001220132 0.2033898 0.005998983 3.5032206 12
## [140] {kitchen_towels} => {tropical_fruit} 0.001321810 0.2203390 0.005998983 2.0998390 13
## [141] {kitchen_towels} => {root_vegetables} 0.001321810 0.2203390 0.005998983 2.0214868 13
## [142] {kitchen_towels} => {soda} 0.001220132 0.2033898 0.005998983 1.1663784 12
## [143] {kitchen_towels} => {yogurt} 0.001220132 0.2033898 0.005998983 1.4579730 12
## [144] {kitchen_towels} => {rolls/buns} 0.001220132 0.2033898 0.005998983 1.1057706 12
## [145] {kitchen_towels} => {other_vegetables} 0.002236909 0.3728814 0.005998983 1.9271088 22
## [146] {kitchen_towels} => {whole_milk} 0.002745297 0.4576271 0.005998983 1.7909919 27
## [147] {instant_coffee} => {soda} 0.002440264 0.3287671 0.007422471 1.8853788 24
## [148] {instant_coffee} => {yogurt} 0.002135231 0.2876712 0.007422471 2.0621331 21
## [149] {instant_coffee} => {rolls/buns} 0.001830198 0.2465753 0.007422471 1.3405575 18
## [150] {instant_coffee} => {other_vegetables} 0.001931876 0.2602740 0.007422471 1.3451364 19
## [151] {instant_coffee} => {whole_milk} 0.002236909 0.3013699 0.007422471 1.1794559 22
## [152] {vinegar} => {root_vegetables} 0.001626843 0.2500000 0.006507372 2.2936101 16
## [153] {vinegar} => {yogurt} 0.001830198 0.2812500 0.006507372 2.0161033 18
## [154] {vinegar} => {rolls/buns} 0.001626843 0.2500000 0.006507372 1.3591763 16
## [155] {vinegar} => {other_vegetables} 0.002440264 0.3750000 0.006507372 1.9380583 24
## [156] {vinegar} => {whole_milk} 0.002643620 0.4062500 0.006507372 1.5899199 26
## [157] {popcorn} => {salty_snack} 0.002236909 0.3098592 0.007219115 8.1921096 22
## [158] {popcorn} => {root_vegetables} 0.001626843 0.2253521 0.007219115 2.0674795 16
## [159] {popcorn} => {soda} 0.001931876 0.2676056 0.007219115 1.5346364 19
## [160] {popcorn} => {other_vegetables} 0.001626843 0.2253521 0.007219115 1.1646548 16
## [161] {popcorn} => {whole_milk} 0.002643620 0.3661972 0.007219115 1.4331672 26
## [162] {pet_care} => {soda} 0.002135231 0.2258065 0.009456024 1.2949309 21
## [163] {pet_care} => {other_vegetables} 0.001931876 0.2043011 0.009456024 1.0558597 19
## [164] {pet_care} => {whole_milk} 0.002643620 0.2795699 0.009456024 1.0941384 26
## [165] {candles} => {margarine} 0.002135231 0.2386364 0.008947636 4.0746330 21
## [166] {candles} => {pastry} 0.001931876 0.2159091 0.008947636 2.4268182 19
## [167] {candles} => {other_vegetables} 0.002338587 0.2613636 0.008947636 1.3507679 23
## [168] {candles} => {whole_milk} 0.003050330 0.3409091 0.008947636 1.3341985 30
## [169] {soups} => {whipped/sour_cream} 0.001525165 0.2238806 0.006812405 3.1232137 15
## [170] {soups} => {pip_fruit} 0.001423488 0.2089552 0.006812405 2.7621971 14
## [171] {soups} => {citrus_fruit} 0.001626843 0.2388060 0.006812405 2.8853277 16
## [172] {soups} => {root_vegetables} 0.001728521 0.2537313 0.006812405 2.3278431 17
## [173] {soups} => {other_vegetables} 0.003152008 0.4626866 0.006812405 2.3912361 31
## [174] {soups} => {whole_milk} 0.002948653 0.4328358 0.006812405 1.6939675 29
## [175] {dog_food} => {shopping_bags} 0.001830198 0.2142857 0.008540925 2.1749226 18
## [176] {dog_food} => {soda} 0.001830198 0.2142857 0.008540925 1.2288630 18
## [177] {dog_food} => {yogurt} 0.001931876 0.2261905 0.008540925 1.6214164 19
## [178] {dog_food} => {other_vegetables} 0.002236909 0.2619048 0.008540925 1.3535645 22
## [179] {dog_food} => {whole_milk} 0.002948653 0.3452381 0.008540925 1.3511407 29
## [180] {instant_food_products} => {hamburger_meat} 0.003050330 0.3797468 0.008032537 11.4214377 30
## [181] {instant_food_products} => {root_vegetables} 0.001931876 0.2405063 0.008032537 2.2065110 19
## [182] {instant_food_products} => {soda} 0.001931876 0.2405063 0.008032537 1.3792302 19
## [183] {instant_food_products} => {rolls/buns} 0.002338587 0.2911392 0.008032537 1.5828383 23
## [184] {instant_food_products} => {other_vegetables} 0.002745297 0.3417722 0.008032537 1.7663316 27
## [185] {instant_food_products} => {whole_milk} 0.003050330 0.3797468 0.008032537 1.4861958 30
## [186] {condensed_milk} => {coffee} 0.002541942 0.2475248 0.010269446 4.2634080 25
## [187] {condensed_milk} => {soda} 0.002135231 0.2079208 0.010269446 1.1923621 21
## [188] {condensed_milk} => {rolls/buns} 0.002236909 0.2178218 0.010269446 1.1842329 22
## [189] {condensed_milk} => {other_vegetables} 0.002541942 0.2475248 0.010269446 1.2792464 25
## [190] {condensed_milk} => {whole_milk} 0.002440264 0.2376238 0.010269446 0.9299760 24
## [191] {specialty_cheese} => {bottled_water} 0.001728521 0.2023810 0.008540925 1.8311101 17
## [192] {specialty_cheese} => {root_vegetables} 0.002135231 0.2500000 0.008540925 2.2936101 21
## [193] {specialty_cheese} => {yogurt} 0.002846975 0.3333333 0.008540925 2.3894558 28
## [194] {specialty_cheese} => {other_vegetables} 0.004270463 0.5000000 0.008540925 2.5840778 42
## [195] {specialty_cheese} => {whole_milk} 0.003762074 0.4404762 0.008540925 1.7238692 37
## [196] {chocolate_marshmallow} => {domestic_eggs} 0.001830198 0.2022472 0.009049314 3.1876621 18
## [197] {chocolate_marshmallow} => {tropical_fruit} 0.001830198 0.2022472 0.009049314 1.9274236 18
## [198] {chocolate_marshmallow} => {soda} 0.002440264 0.2696629 0.009049314 1.5464343 24
## [199] {chocolate_marshmallow} => {rolls/buns} 0.002236909 0.2471910 0.009049314 1.3439047 22
## [200] {chocolate_marshmallow} => {other_vegetables} 0.002033554 0.2247191 0.009049314 1.1613833 20
## [201] {chocolate_marshmallow} => {whole_milk} 0.003152008 0.3483146 0.009049314 1.3631811 31
## [202] {flower_(seeds)} => {other_vegetables} 0.003762074 0.3627451 0.010371124 1.8747231 37
## [203] {flower_(seeds)} => {whole_milk} 0.003965430 0.3823529 0.010371124 1.4963952 39
## [204] {frozen_potato_products} => {soda} 0.002745297 0.3253012 0.008439248 1.8655028 27
## [205] {frozen_potato_products} => {yogurt} 0.002236909 0.2650602 0.008439248 1.9000492 22
## [206] {frozen_potato_products} => {rolls/buns} 0.002033554 0.2409639 0.008439248 1.3100495 20
## [207] {frozen_potato_products} => {other_vegetables} 0.002643620 0.3132530 0.008439248 1.6189403 26
## [208] {frozen_potato_products} => {whole_milk} 0.003457041 0.4096386 0.008439248 1.6031815 34
## [209] {house_keeping_products} => {root_vegetables} 0.001728521 0.2073171 0.008337570 1.9020181 17
## [210] {house_keeping_products} => {soda} 0.001728521 0.2073171 0.008337570 1.1889000 17
## [211] {house_keeping_products} => {yogurt} 0.001830198 0.2195122 0.008337570 1.5735441 18
## [212] {house_keeping_products} => {rolls/buns} 0.001728521 0.2073171 0.008337570 1.1271218 17
## [213] {house_keeping_products} => {other_vegetables} 0.002745297 0.3292683 0.008337570 1.7017098 27
## [214] {house_keeping_products} => {whole_milk} 0.003863752 0.4634146 0.008337570 1.8136422 38
## [215] {sweet_spreads} => {shopping_bags} 0.001931876 0.2134831 0.009049314 2.1667768 19
## [216] {sweet_spreads} => {root_vegetables} 0.002033554 0.2247191 0.009049314 2.0616720 20
## [217] {sweet_spreads} => {soda} 0.002541942 0.2808989 0.009049314 1.6108691 25
## [218] {sweet_spreads} => {yogurt} 0.002236909 0.2471910 0.009049314 1.7719560 22
## [219] {sweet_spreads} => {other_vegetables} 0.002440264 0.2696629 0.009049314 1.3936599 24
## [220] {sweet_spreads} => {whole_milk} 0.003558719 0.3932584 0.009049314 1.5390755 35
## [221] {turkey} => {pip_fruit} 0.001626843 0.2000000 0.008134215 2.6438172 16
## [222] {turkey} => {pastry} 0.001931876 0.2375000 0.008134215 2.6695000 19
## [223] {turkey} => {citrus_fruit} 0.001728521 0.2125000 0.008134215 2.5674908 17
## [224] {turkey} => {bottled_water} 0.001626843 0.2000000 0.008134215 1.8095676 16
## [225] {turkey} => {tropical_fruit} 0.002643620 0.3250000 0.008134215 3.0972626 26
## [226] {turkey} => {root_vegetables} 0.002541942 0.3125000 0.008134215 2.8670126 25
## [227] {turkey} => {yogurt} 0.002338587 0.2875000 0.008134215 2.0609056 23
## [228] {turkey} => {rolls/buns} 0.001931876 0.2375000 0.008134215 1.2912175 19
## [229] {turkey} => {other_vegetables} 0.003965430 0.4875000 0.008134215 2.5194758 39
## [230] {turkey} => {whole_milk} 0.003660397 0.4500000 0.008134215 1.7611421 36
## [231] {rice} => {butter} 0.001830198 0.2400000 0.007625826 4.3310092 18
## [232] {rice} => {fruit/vegetable_juice} 0.001931876 0.2533333 0.007625826 3.5042663 19
## [233] {rice} => {citrus_fruit} 0.001830198 0.2400000 0.007625826 2.8997543 18
## [234] {rice} => {tropical_fruit} 0.001931876 0.2533333 0.007625826 2.4142765 19
## [235] {rice} => {root_vegetables} 0.003152008 0.4133333 0.007625826 3.7921020 31
## [236] {rice} => {yogurt} 0.002338587 0.3066667 0.007625826 2.1982993 23
## [237] {rice} => {rolls/buns} 0.001525165 0.2000000 0.007625826 1.0873411 15
## [238] {rice} => {other_vegetables} 0.003965430 0.5200000 0.007625826 2.6874409 39
## [239] {rice} => {whole_milk} 0.004677173 0.6133333 0.007625826 2.4003714 46
## [240] {spread_cheese} => {sausage} 0.002440264 0.2181818 0.011184545 2.3223140 24
## [241] {spread_cheese} => {bottled_water} 0.002236909 0.2000000 0.011184545 1.8095676 22
## [242] {spread_cheese} => {soda} 0.003152008 0.2818182 0.011184545 1.6161410 31
## [243] {spread_cheese} => {yogurt} 0.003558719 0.3181818 0.011184545 2.2808442 35
## [244] {spread_cheese} => {rolls/buns} 0.004168785 0.3727273 0.011184545 2.0264084 41
## [245] {spread_cheese} => {other_vegetables} 0.003050330 0.2727273 0.011184545 1.4094970 30
## [246] {spread_cheese} => {whole_milk} 0.003152008 0.2818182 0.011184545 1.1029375 31
## [247] {dish_cleaner} => {soda} 0.002440264 0.2330097 0.010472801 1.3362394 24
## [248] {dish_cleaner} => {yogurt} 0.002440264 0.2330097 0.010472801 1.6702992 24
## [249] {dish_cleaner} => {rolls/buns} 0.002236909 0.2135922 0.010472801 1.1612380 22
## [250] {dish_cleaner} => {other_vegetables} 0.002338587 0.2233010 0.010472801 1.1540542 23
## [251] {dish_cleaner} => {whole_milk} 0.002948653 0.2815534 0.010472801 1.1019012 29
## [252] {cling_film/bags} => {soda} 0.002338587 0.2053571 0.011387900 1.1776603 23
## [253] {cling_film/bags} => {yogurt} 0.002541942 0.2232143 0.011387900 1.6000820 25
## [254] {cling_film/bags} => {other_vegetables} 0.003253686 0.2857143 0.011387900 1.4766159 32
## [255] {cling_film/bags} => {whole_milk} 0.003660397 0.3214286 0.011387900 1.2579586 36
## [256] {salt} => {root_vegetables} 0.002745297 0.2547170 0.010777834 2.3368857 27
## [257] {salt} => {yogurt} 0.002236909 0.2075472 0.010777834 1.4877744 22
## [258] {salt} => {other_vegetables} 0.003660397 0.3396226 0.010777834 1.7552226 36
## [259] {salt} => {whole_milk} 0.003863752 0.3584906 0.010777834 1.4030063 38
## [260] {mayonnaise} => {sausage} 0.002135231 0.2333333 0.009150991 2.4835859 21
## [261] {mayonnaise} => {root_vegetables} 0.002541942 0.2777778 0.009150991 2.5484556 25
## [262] {mayonnaise} => {soda} 0.002440264 0.2666667 0.009150991 1.5292517 24
## [263] {mayonnaise} => {yogurt} 0.002745297 0.3000000 0.009150991 2.1505102 27
## [264] {mayonnaise} => {rolls/buns} 0.002745297 0.3000000 0.009150991 1.6310116 27
## [265] {mayonnaise} => {other_vegetables} 0.003558719 0.3888889 0.009150991 2.0098383 35
## [266] {mayonnaise} => {whole_milk} 0.003355363 0.3666667 0.009150991 1.4350046 33
## [267] {frozen_dessert} => {tropical_fruit} 0.002643620 0.2452830 0.010777834 2.3375567 26
## [268] {frozen_dessert} => {root_vegetables} 0.002440264 0.2264151 0.010777834 2.0772318 24
## [269] {frozen_dessert} => {soda} 0.002541942 0.2358491 0.010777834 1.3525221 25
## [270] {frozen_dessert} => {rolls/buns} 0.002948653 0.2735849 0.010777834 1.4874005 29
## [271] {frozen_dessert} => {other_vegetables} 0.003660397 0.3396226 0.010777834 1.7552226 36
## [272] {frozen_dessert} => {whole_milk} 0.003965430 0.3679245 0.010777834 1.4399275 39
## [273] {white_wine} => {bottled_water} 0.003965430 0.2085561 0.019013726 1.8869823 39
## [274] {packaged_fruit/vegetables} => {bottled_water} 0.002643620 0.2031250 0.013014743 1.8378421 26
## [275] {packaged_fruit/vegetables} => {root_vegetables} 0.003457041 0.2656250 0.013014743 2.4369607 34
## [276] {packaged_fruit/vegetables} => {rolls/buns} 0.002643620 0.2031250 0.013014743 1.1043308 26
## [277] {packaged_fruit/vegetables} => {other_vegetables} 0.003152008 0.2421875 0.013014743 1.2516627 31
## [278] {packaged_fruit/vegetables} => {whole_milk} 0.003965430 0.3046875 0.013014743 1.1924399 39
## [279] {canned_vegetables} => {tropical_fruit} 0.002745297 0.2547170 0.010777834 2.4274627 27
## [280] {canned_vegetables} => {root_vegetables} 0.002643620 0.2452830 0.010777834 2.2503344 26
## [281] {canned_vegetables} => {soda} 0.003050330 0.2830189 0.010777834 1.6230266 30
## [282] {canned_vegetables} => {yogurt} 0.003050330 0.2830189 0.010777834 2.0287832 30
## [283] {canned_vegetables} => {other_vegetables} 0.004677173 0.4339623 0.010777834 2.2427845 46
## [284] {canned_vegetables} => {whole_milk} 0.003863752 0.3584906 0.010777834 1.4030063 38
## [285] {roll_products_} => {root_vegetables} 0.003152008 0.3069307 0.010269446 2.8159173 31
## [286] {roll_products_} => {yogurt} 0.002236909 0.2178218 0.010269446 1.5614266 22
## [287] {roll_products_} => {rolls/buns} 0.002135231 0.2079208 0.010269446 1.1304041 21
## [288] {roll_products_} => {other_vegetables} 0.004778851 0.4653465 0.010269446 2.4049833 47
## [289] {roll_products_} => {whole_milk} 0.004677173 0.4554455 0.010269446 1.7824540 46
## [290] {frozen_fish} => {tropical_fruit} 0.002541942 0.2173913 0.011692933 2.0717476 25
## [291] {frozen_fish} => {root_vegetables} 0.002643620 0.2260870 0.011692933 2.0742213 26
## [292] {frozen_fish} => {yogurt} 0.003253686 0.2782609 0.011692933 1.9946761 32
## [293] {frozen_fish} => {rolls/buns} 0.002440264 0.2086957 0.011692933 1.1346168 24
## [294] {frozen_fish} => {other_vegetables} 0.004677173 0.4000000 0.011692933 2.0672622 46
## [295] {frozen_fish} => {whole_milk} 0.004982206 0.4260870 0.011692933 1.6675548 49
## [296] {cake_bar} => {shopping_bags} 0.002948653 0.2230769 0.013218099 2.2641502 29
## [297] {cake_bar} => {soda} 0.004473818 0.3384615 0.013218099 1.9409733 44
## [298] {cake_bar} => {rolls/buns} 0.003152008 0.2384615 0.013218099 1.2964451 31
## [299] {cake_bar} => {other_vegetables} 0.003762074 0.2846154 0.013218099 1.4709366 37
## [300] {cake_bar} => {whole_milk} 0.005592272 0.4230769 0.013218099 1.6557746 55
## [301] {seasonal_products} => {yogurt} 0.003253686 0.2285714 0.014234875 1.6384840 32
## [302] {seasonal_products} => {other_vegetables} 0.003660397 0.2571429 0.014234875 1.3289543 36
## [303] {seasonal_products} => {whole_milk} 0.003762074 0.2642857 0.014234875 1.0343215 37
## [304] {dishes} => {yogurt} 0.003762074 0.2138728 0.017590239 1.5331190 37
## [305] {dishes} => {other_vegetables} 0.005998983 0.3410405 0.017590239 1.7625502 59
## [306] {dishes} => {whole_milk} 0.005287239 0.3005780 0.017590239 1.1763569 52
## [307] {mustard} => {frankfurter} 0.002541942 0.2118644 0.011997966 3.5925628 25
## [308] {mustard} => {tropical_fruit} 0.002643620 0.2203390 0.011997966 2.0998390 26
## [309] {mustard} => {root_vegetables} 0.003355363 0.2796610 0.011997966 2.5657333 33
## [310] {mustard} => {rolls/buns} 0.004270463 0.3559322 0.011997966 1.9350985 42
## [311] {mustard} => {other_vegetables} 0.003253686 0.2711864 0.011997966 1.4015337 32
## [312] {mustard} => {whole_milk} 0.005185562 0.4322034 0.011997966 1.6914924 51
## [313] {red/blush_wine} => {bottled_beer} 0.004880529 0.2539683 0.019217082 3.1537598 48
## [314] {red/blush_wine} => {soda} 0.004575496 0.2380952 0.019217082 1.3654033 45
## [315] {red/blush_wine} => {rolls/buns} 0.003965430 0.2063492 0.019217082 1.1218598 39
## [316] {red/blush_wine} => {other_vegetables} 0.004982206 0.2592593 0.019217082 1.3398922 49
## [317] {red/blush_wine} => {whole_milk} 0.003965430 0.2063492 0.019217082 0.8075784 39
## [318] {pot_plants} => {yogurt} 0.003863752 0.2235294 0.017285206 1.6023409 38
## [319] {pot_plants} => {other_vegetables} 0.004372140 0.2529412 0.017285206 1.3072393 43
## [320] {pot_plants} => {whole_milk} 0.006914082 0.4000000 0.017285206 1.5654596 68
## [321] {chewing_gum} => {soda} 0.005388917 0.2560386 0.021047280 1.4683033 53
## [322] {chewing_gum} => {other_vegetables} 0.004575496 0.2173913 0.021047280 1.1235121 45
## [323] {chewing_gum} => {whole_milk} 0.005083884 0.2415459 0.021047280 0.9453259 50
## [324] {canned_fish} => {yogurt} 0.003253686 0.2162162 0.015048297 1.5499173 32
## [325] {canned_fish} => {rolls/buns} 0.004067107 0.2702703 0.015048297 1.4693798 40
## [326] {canned_fish} => {other_vegetables} 0.005083884 0.3378378 0.015048297 1.7459985 50
## [327] {canned_fish} => {whole_milk} 0.004778851 0.3175676 0.015048297 1.2428480 47
## [328] {pasta} => {root_vegetables} 0.003863752 0.2567568 0.015048297 2.3555995 38
## [329] {pasta} => {soda} 0.004067107 0.2702703 0.015048297 1.5499173 40
## [330] {pasta} => {yogurt} 0.003152008 0.2094595 0.015048297 1.5014823 31
## [331] {pasta} => {other_vegetables} 0.004270463 0.2837838 0.015048297 1.4666387 42
## [332] {pasta} => {whole_milk} 0.006100661 0.4054054 0.015048297 1.5866145 60
## [333] {herbs} => {root_vegetables} 0.007015760 0.4312500 0.016268429 3.9564774 69
## [334] {herbs} => {yogurt} 0.003558719 0.2187500 0.016268429 1.5680804 35
## [335] {herbs} => {other_vegetables} 0.007727504 0.4750000 0.016268429 2.4548739 76
## [336] {herbs} => {whole_milk} 0.007727504 0.4750000 0.016268429 1.8589833 76
## [337] {processed_cheese} => {white_bread} 0.004168785 0.2515337 0.016573462 5.9754453 41
## [338] {processed_cheese} => {sausage} 0.003355363 0.2024540 0.016573462 2.1549080 33
## [339] {processed_cheese} => {tropical_fruit} 0.004270463 0.2576687 0.016573462 2.4555928 42
## [340] {processed_cheese} => {soda} 0.005287239 0.3190184 0.016573462 1.8294729 52
## [341] {processed_cheese} => {rolls/buns} 0.004677173 0.2822086 0.016573462 1.5342849 46
## [342] {processed_cheese} => {other_vegetables} 0.005490595 0.3312883 0.016573462 1.7121497 54
## [343] {processed_cheese} => {whole_milk} 0.007015760 0.4233129 0.016573462 1.6566981 69
## [344] {semi_finished_bread} => {tropical_fruit} 0.004270463 0.2413793 0.017691917 2.3003542 42
## [345] {semi_finished_bread} => {soda} 0.004067107 0.2298851 0.017691917 1.3183204 40
## [346] {semi_finished_bread} => {yogurt} 0.003558719 0.2011494 0.017691917 1.4419130 35
## [347] {semi_finished_bread} => {other_vegetables} 0.005185562 0.2931034 0.017691917 1.5148042 51
## [348] {semi_finished_bread} => {whole_milk} 0.007117438 0.4022989 0.017691917 1.5744565 70
## [349] {beverages} => {yogurt} 0.005490595 0.2109375 0.026029487 1.5120775 54
## [350] {beverages} => {rolls/buns} 0.005388917 0.2070312 0.026029487 1.1255679 53
## [351] {beverages} => {whole_milk} 0.006812405 0.2617188 0.026029487 1.0242753 67
## [352] {ice_cream} => {soda} 0.006100661 0.2439024 0.025012710 1.3987058 60
## [353] {ice_cream} => {other_vegetables} 0.005083884 0.2032520 0.025012710 1.0504381 50
## [354] {ice_cream} => {whole_milk} 0.005897306 0.2357724 0.025012710 0.9227303 58
## [355] {detergent} => {root_vegetables} 0.004372140 0.2275132 0.019217082 2.0873065 43
## [356] {detergent} => {yogurt} 0.003965430 0.2063492 0.019217082 1.4791869 39
## [357] {detergent} => {other_vegetables} 0.006405694 0.3333333 0.019217082 1.7227185 63
## [358] {detergent} => {whole_milk} 0.008947636 0.4656085 0.019217082 1.8222281 88
## [359] {pickled_vegetables} => {tropical_fruit} 0.003762074 0.2102273 0.017895272 2.0034741 37
## [360] {pickled_vegetables} => {root_vegetables} 0.004067107 0.2272727 0.017895272 2.0851001 40
## [361] {pickled_vegetables} => {soda} 0.004067107 0.2272727 0.017895272 1.3033395 40
## [362] {pickled_vegetables} => {yogurt} 0.003762074 0.2102273 0.017895272 1.5069863 37
## [363] {pickled_vegetables} => {rolls/buns} 0.004270463 0.2386364 0.017895272 1.2973956 42
## [364] {pickled_vegetables} => {other_vegetables} 0.006405694 0.3579545 0.017895272 1.8499648 63
## [365] {pickled_vegetables} => {whole_milk} 0.007117438 0.3977273 0.017895272 1.5565650 70
## [366] {baking_powder} => {whipped/sour_cream} 0.004575496 0.2586207 0.017691917 3.6078503 45
## [367] {baking_powder} => {tropical_fruit} 0.003762074 0.2126437 0.017691917 2.0265025 37
## [368] {baking_powder} => {root_vegetables} 0.003558719 0.2011494 0.017691917 1.8454334 35
## [369] {baking_powder} => {yogurt} 0.004575496 0.2586207 0.017691917 1.8538881 45
## [370] {baking_powder} => {rolls/buns} 0.003558719 0.2011494 0.017691917 1.0935902 35
## [371] {baking_powder} => {other_vegetables} 0.007320793 0.4137931 0.017691917 2.1385471 72
## [372] {baking_powder} => {whole_milk} 0.009252669 0.5229885 0.017691917 2.0467935 91
## [373] {flour} => {sugar} 0.004982206 0.2865497 0.017386884 8.4631122 49
## [374] {flour} => {margarine} 0.003762074 0.2163743 0.017386884 3.6945155 37
## [375] {flour} => {whipped/sour_cream} 0.004067107 0.2339181 0.017386884 3.2632408 40
## [376] {flour} => {root_vegetables} 0.004677173 0.2690058 0.017386884 2.4679781 46
## [377] {flour} => {yogurt} 0.004880529 0.2807018 0.017386884 2.0121733 48
## [378] {flour} => {rolls/buns} 0.003762074 0.2163743 0.017386884 1.1763631 37
## [379] {flour} => {other_vegetables} 0.006304016 0.3625731 0.017386884 1.8738342 62
## [380] {flour} => {whole_milk} 0.008439248 0.4853801 0.017386884 1.8996074 83
## [381] {soft_cheese} => {sausage} 0.003457041 0.2023810 0.017081851 2.1541306 34
## [382] {soft_cheese} => {yogurt} 0.005998983 0.3511905 0.017081851 2.5174623 59
## [383] {soft_cheese} => {rolls/buns} 0.005388917 0.3154762 0.017081851 1.7151511 53
## [384] {soft_cheese} => {other_vegetables} 0.007117438 0.4166667 0.017081851 2.1533981 70
## [385] {soft_cheese} => {whole_milk} 0.007524148 0.4404762 0.017081851 1.7238692 74
## [386] {specialty_bar} => {soda} 0.007219115 0.2639405 0.027351296 1.5136181 71
## [387] {specialty_bar} => {rolls/buns} 0.005592272 0.2044610 0.027351296 1.1115940 55
## [388] {specialty_bar} => {other_vegetables} 0.005592272 0.2044610 0.027351296 1.0566861 55
## [389] {specialty_bar} => {whole_milk} 0.006507372 0.2379182 0.027351296 0.9311284 64
## [390] {misc._beverages} => {soda} 0.007320793 0.2580645 0.028368073 1.4799210 72
## [391] {misc._beverages} => {whole_milk} 0.007015760 0.2473118 0.028368073 0.9678917 69
## [392] {grapes} => {tropical_fruit} 0.006100661 0.2727273 0.022369090 2.5991015 60
## [393] {grapes} => {root_vegetables} 0.004473818 0.2000000 0.022369090 1.8348881 44
## [394] {grapes} => {yogurt} 0.004677173 0.2090909 0.022369090 1.4988404 46
## [395] {grapes} => {rolls/buns} 0.004778851 0.2136364 0.022369090 1.1614780 47
## [396] {grapes} => {other_vegetables} 0.009049314 0.4045455 0.022369090 2.0907538 89
## [397] {grapes} => {whole_milk} 0.007320793 0.3272727 0.022369090 1.2808306 72
## [398] {cat_food} => {tropical_fruit} 0.004778851 0.2052402 0.023284189 1.9559468 47
## [399] {cat_food} => {root_vegetables} 0.004677173 0.2008734 0.023284189 1.8429007 46
## [400] {cat_food} => {yogurt} 0.006202339 0.2663755 0.023284189 1.9094778 61
## [401] {cat_food} => {other_vegetables} 0.006507372 0.2794760 0.023284189 1.4443753 64
## [402] {cat_food} => {whole_milk} 0.008845958 0.3799127 0.023284189 1.4868448 87
## [403] {specialty_chocolate} => {soda} 0.006304016 0.2073579 0.030401627 1.1891338 62
## [404] {specialty_chocolate} => {other_vegetables} 0.006100661 0.2006689 0.030401627 1.0370881 60
## [405] {specialty_chocolate} => {whole_milk} 0.008032537 0.2642140 0.030401627 1.0340410 79
## [406] {meat} => {sausage} 0.005287239 0.2047244 0.025826131 2.1790742 52
## [407] {meat} => {soda} 0.005490595 0.2125984 0.025826131 1.2191869 54
## [408] {meat} => {yogurt} 0.005287239 0.2047244 0.025826131 1.4675398 52
## [409] {meat} => {rolls/buns} 0.006914082 0.2677165 0.025826131 1.4554959 68
## [410] {meat} => {other_vegetables} 0.009964413 0.3858268 0.025826131 1.9940128 98
## [411] {meat} => {whole_milk} 0.009964413 0.3858268 0.025826131 1.5099906 98
## [412] {frozen_meals} => {soda} 0.006202339 0.2186380 0.028368073 1.2538220 61
## [413] {frozen_meals} => {yogurt} 0.006202339 0.2186380 0.028368073 1.5672774 61
## [414] {frozen_meals} => {other_vegetables} 0.007524148 0.2652330 0.028368073 1.3707653 74
## [415] {frozen_meals} => {whole_milk} 0.009862735 0.3476703 0.028368073 1.3606593 97
## [416] {hard_cheese} => {sausage} 0.005185562 0.2116183 0.024504321 2.2524519 51
## [417] {hard_cheese} => {root_vegetables} 0.005592272 0.2282158 0.024504321 2.0937519 55
## [418] {hard_cheese} => {yogurt} 0.006405694 0.2614108 0.024504321 1.8738886 63
## [419] {hard_cheese} => {rolls/buns} 0.005897306 0.2406639 0.024504321 1.3084187 58
## [420] {hard_cheese} => {other_vegetables} 0.009456024 0.3858921 0.024504321 1.9943505 93
## [421] {hard_cheese} => {whole_milk} 0.010066090 0.4107884 0.024504321 1.6076815 99
## [422] {butter_milk} => {yogurt} 0.008540925 0.3054545 0.027961362 2.1896104 84
## [423] {butter_milk} => {rolls/buns} 0.007625826 0.2727273 0.027961362 1.4827378 75
## [424] {butter_milk} => {other_vegetables} 0.010371124 0.3709091 0.027961362 1.9169159 102
## [425] {butter_milk} => {whole_milk} 0.011591256 0.4145455 0.027961362 1.6223854 114
## [426] {candy} => {soda} 0.008642603 0.2891156 0.029893238 1.6579897 85
## [427] {candy} => {rolls/buns} 0.007117438 0.2380952 0.029893238 1.2944537 70
## [428] {candy} => {other_vegetables} 0.006914082 0.2312925 0.029893238 1.1953557 68
## [429] {candy} => {whole_milk} 0.008235892 0.2755102 0.029893238 1.0782502 81
## [430] {ham} => {tropical_fruit} 0.005388917 0.2070312 0.026029487 1.9730158 53
## [431] {ham} => {yogurt} 0.006710727 0.2578125 0.026029487 1.8480947 66
## [432] {ham} => {rolls/buns} 0.006914082 0.2656250 0.026029487 1.4441249 68
## [433] {ham} => {other_vegetables} 0.009150991 0.3515625 0.026029487 1.8169297 90
## [434] {ham} => {whole_milk} 0.011489578 0.4414062 0.026029487 1.7275091 113
## [435] {sliced_cheese} => {sausage} 0.007015760 0.2863071 0.024504321 3.0474349 69
## [436] {sliced_cheese} => {tropical_fruit} 0.005287239 0.2157676 0.024504321 2.0562739 52
## [437] {sliced_cheese} => {root_vegetables} 0.005592272 0.2282158 0.024504321 2.0937519 55
## [438] {sliced_cheese} => {soda} 0.005083884 0.2074689 0.024504321 1.1897705 50
## [439] {sliced_cheese} => {yogurt} 0.008032537 0.3278008 0.024504321 2.3497968 79
## [440] {sliced_cheese} => {rolls/buns} 0.007625826 0.3112033 0.024504321 1.6919208 75
## [441] {sliced_cheese} => {other_vegetables} 0.009049314 0.3692946 0.024504321 1.9085720 89
## [442] {sliced_cheese} => {whole_milk} 0.010777834 0.4398340 0.024504321 1.7213560 106
## [443] {uht_milk} => {bottled_water} 0.007320793 0.2188450 0.033451957 1.9800740 72
## [444] {uht_milk} => {soda} 0.007625826 0.2279635 0.033451957 1.3073010 75
## [445] {uht_milk} => {yogurt} 0.007422471 0.2218845 0.033451957 1.5905496 73
## [446] {uht_milk} => {other_vegetables} 0.008134215 0.2431611 0.033451957 1.2566944 80
## [447] {oil} => {root_vegetables} 0.007015760 0.2500000 0.028063040 2.2936101 69
## [448] {oil} => {other_vegetables} 0.009964413 0.3550725 0.028063040 1.8350697 98
## [449] {oil} => {whole_milk} 0.011286223 0.4021739 0.028063040 1.5739675 111
## [450] {onions} => {root_vegetables} 0.009456024 0.3049180 0.031011693 2.7974523 93
## [451] {onions} => {yogurt} 0.007219115 0.2327869 0.031011693 1.6687019 71
## [452] {onions} => {rolls/buns} 0.006812405 0.2196721 0.031011693 1.1942927 67
## [453] {onions} => {other_vegetables} 0.014234875 0.4590164 0.031011693 2.3722681 140
## [454] {onions} => {whole_milk} 0.012099644 0.3901639 0.031011693 1.5269647 119
## [455] {berries} => {whipped/sour_cream} 0.009049314 0.2721713 0.033248602 3.7968855 89
## [456] {berries} => {tropical_fruit} 0.006710727 0.2018349 0.033248602 1.9234941 66
## [457] {berries} => {soda} 0.007320793 0.2201835 0.033248602 1.2626849 72
## [458] {berries} => {yogurt} 0.010574479 0.3180428 0.033248602 2.2798477 104
## [459] {berries} => {other_vegetables} 0.010269446 0.3088685 0.033248602 1.5962805 101
## [460] {berries} => {whole_milk} 0.011794611 0.3547401 0.033248602 1.3883281 116
## [461] {hamburger_meat} => {rolls/buns} 0.008642603 0.2599388 0.033248602 1.4132109 85
## [462] {hamburger_meat} => {other_vegetables} 0.013828165 0.4159021 0.033248602 2.1494470 136
## [463] {hamburger_meat} => {whole_milk} 0.014743264 0.4434251 0.033248602 1.7354101 145
## [464] {hygiene_articles} => {tropical_fruit} 0.006710727 0.2037037 0.032943569 1.9413042 66
## [465] {hygiene_articles} => {soda} 0.007015760 0.2129630 0.032943569 1.2212774 69
## [466] {hygiene_articles} => {yogurt} 0.007320793 0.2222222 0.032943569 1.5929705 72
## [467] {hygiene_articles} => {other_vegetables} 0.009557702 0.2901235 0.032943569 1.4994032 94
## [468] {hygiene_articles} => {whole_milk} 0.012811388 0.3888889 0.032943569 1.5219746 126
## [469] {salty_snack} => {soda} 0.009354347 0.2473118 0.037824098 1.4182576 92
## [470] {salty_snack} => {other_vegetables} 0.010777834 0.2849462 0.037824098 1.4726465 106
## [471] {salty_snack} => {whole_milk} 0.011184545 0.2956989 0.037824098 1.1572618 110
## [472] {sugar} => {soda} 0.007320793 0.2162162 0.033858668 1.2399338 72
## [473] {sugar} => {yogurt} 0.006914082 0.2042042 0.033858668 1.4638107 68
## [474] {sugar} => {rolls/buns} 0.007015760 0.2072072 0.033858668 1.1265245 69
## [475] {sugar} => {other_vegetables} 0.010777834 0.3183183 0.033858668 1.6451186 106
## [476] {sugar} => {whole_milk} 0.015048297 0.4444444 0.033858668 1.7393996 148
## [477] {waffles} => {soda} 0.009557702 0.2486772 0.038434164 1.4260879 94
## [478] {waffles} => {rolls/buns} 0.009150991 0.2380952 0.038434164 1.2944537 90
## [479] {waffles} => {other_vegetables} 0.010066090 0.2619048 0.038434164 1.3535645 99
## [480] {waffles} => {whole_milk} 0.012709710 0.3306878 0.038434164 1.2941961 125
## [481] {long_life_bakery_product} => {soda} 0.007625826 0.2038043 0.037417387 1.1687555 75
## [482] {long_life_bakery_product} => {yogurt} 0.008744281 0.2336957 0.037417387 1.6752163 86
## [483] {long_life_bakery_product} => {rolls/buns} 0.007930859 0.2119565 0.037417387 1.1523452 78
## [484] {long_life_bakery_product} => {other_vegetables} 0.010676157 0.2853261 0.037417387 1.4746096 105
## [485] {long_life_bakery_product} => {whole_milk} 0.013523132 0.3614130 0.037417387 1.4144438 133
## [486] {dessert} => {soda} 0.009862735 0.2657534 0.037112354 1.5240145 97
## [487] {dessert} => {yogurt} 0.009862735 0.2657534 0.037112354 1.9050182 97
## [488] {dessert} => {other_vegetables} 0.011591256 0.3123288 0.037112354 1.6141636 114
## [489] {dessert} => {whole_milk} 0.013726487 0.3698630 0.037112354 1.4475140 135
## [490] {cream_cheese_} => {yogurt} 0.012404677 0.3128205 0.039654296 2.2424123 122
## [491] {cream_cheese_} => {rolls/buns} 0.009964413 0.2512821 0.039654296 1.3661465 98
## [492] {cream_cheese_} => {other_vegetables} 0.013726487 0.3461538 0.039654296 1.7889769 135
## [493] {cream_cheese_} => {whole_milk} 0.016471784 0.4153846 0.039654296 1.6256696 162
## [494] {chicken} => {root_vegetables} 0.010879512 0.2535545 0.042907982 2.3262206 107
## [495] {chicken} => {rolls/buns} 0.009659380 0.2251185 0.042907982 1.2239029 95
## [496] {chicken} => {other_vegetables} 0.017895272 0.4170616 0.042907982 2.1554393 176
## [497] {chicken} => {whole_milk} 0.017590239 0.4099526 0.042907982 1.6044106 173
## [498] {white_bread} => {tropical_fruit} 0.008744281 0.2077295 0.042094560 1.9796699 86
## [499] {white_bread} => {soda} 0.010269446 0.2439614 0.042094560 1.3990437 101
## [500] {white_bread} => {yogurt} 0.009049314 0.2149758 0.042094560 1.5410258 89
## [501] {white_bread} => {other_vegetables} 0.013726487 0.3260870 0.042094560 1.6852681 135
## [502] {white_bread} => {whole_milk} 0.017081851 0.4057971 0.042094560 1.5881474 168
## [503] {chocolate} => {soda} 0.013523132 0.2725410 0.049618709 1.5629391 133
## [504] {chocolate} => {rolls/buns} 0.011794611 0.2377049 0.049618709 1.2923316 116
## [505] {chocolate} => {other_vegetables} 0.012709710 0.2561475 0.049618709 1.3238103 125
## [506] {chocolate} => {whole_milk} 0.016675140 0.3360656 0.049618709 1.3152427 164
## [507] {coffee} => {other_vegetables} 0.013421454 0.2311734 0.058057956 1.1947400 132
## [508] {coffee} => {whole_milk} 0.018708693 0.3222417 0.058057956 1.2611408 184
## [509] {frozen_vegetables} => {root_vegetables} 0.011591256 0.2410148 0.048093543 2.2111759 114
## [510] {frozen_vegetables} => {yogurt} 0.012404677 0.2579281 0.048093543 1.8489235 122
## [511] {frozen_vegetables} => {rolls/buns} 0.010167768 0.2114165 0.048093543 1.1494092 100
## [512] {frozen_vegetables} => {other_vegetables} 0.017793594 0.3699789 0.048093543 1.9121083 175
## [513] {frozen_vegetables} => {whole_milk} 0.020437214 0.4249471 0.048093543 1.6630940 201
## [514] {beef} => {root_vegetables} 0.017386884 0.3313953 0.052465684 3.0403668 171
## [515] {beef} => {yogurt} 0.011692933 0.2228682 0.052465684 1.5976012 115
## [516] {beef} => {rolls/buns} 0.013624809 0.2596899 0.052465684 1.4118576 134
## [517] {beef} => {other_vegetables} 0.019725470 0.3759690 0.052465684 1.9430662 194
## [518] {beef} => {whole_milk} 0.021250635 0.4050388 0.052465684 1.5851795 209
## [519] {curd} => {root_vegetables} 0.010879512 0.2041985 0.053279105 1.8734067 107
## [520] {curd} => {yogurt} 0.017285206 0.3244275 0.053279105 2.3256154 170
## [521] {curd} => {other_vegetables} 0.017183528 0.3225191 0.053279105 1.6668288 169
## [522] {curd} => {whole_milk} 0.026131164 0.4904580 0.053279105 1.9194805 257
## [523] {napkins} => {soda} 0.011997966 0.2291262 0.052364006 1.3139687 118
## [524] {napkins} => {yogurt} 0.012302999 0.2349515 0.052364006 1.6842183 121
## [525] {napkins} => {rolls/buns} 0.011692933 0.2233010 0.052364006 1.2140216 115
## [526] {napkins} => {other_vegetables} 0.014438231 0.2757282 0.052364006 1.4250060 142
## [527] {napkins} => {whole_milk} 0.019725470 0.3766990 0.052364006 1.4742678 194
## [528] {pork} => {root_vegetables} 0.013624809 0.2363316 0.057651246 2.1682099 134
## [529] {pork} => {soda} 0.011896289 0.2063492 0.057651246 1.1833495 117
## [530] {pork} => {other_vegetables} 0.021657346 0.3756614 0.057651246 1.9414764 213
## [531] {pork} => {whole_milk} 0.022165735 0.3844797 0.057651246 1.5047187 218
## [532] {frankfurter} => {rolls/buns} 0.019217082 0.3258621 0.058973055 1.7716161 189
## [533] {frankfurter} => {other_vegetables} 0.016471784 0.2793103 0.058973055 1.4435193 162
## [534] {frankfurter} => {whole_milk} 0.020538892 0.3482759 0.058973055 1.3630295 202
## [535] {bottled_beer} => {soda} 0.016980173 0.2108586 0.080528724 1.2092094 167
## [536] {bottled_beer} => {other_vegetables} 0.016166751 0.2007576 0.080528724 1.0375464 159
## [537] {bottled_beer} => {whole_milk} 0.020437214 0.2537879 0.080528724 0.9932367 201
## [538] {brown_bread} => {yogurt} 0.014539908 0.2241379 0.064870361 1.6067030 143
## [539] {brown_bread} => {other_vegetables} 0.018708693 0.2884013 0.064870361 1.4905025 184
## [540] {brown_bread} => {whole_milk} 0.025216065 0.3887147 0.064870361 1.5212930 248
## [541] {margarine} => {yogurt} 0.014234875 0.2430556 0.058566345 1.7423115 140
## [542] {margarine} => {rolls/buns} 0.014743264 0.2517361 0.058566345 1.3686151 145
## [543] {margarine} => {other_vegetables} 0.019725470 0.3368056 0.058566345 1.7406635 194
## [544] {margarine} => {whole_milk} 0.024199288 0.4131944 0.058566345 1.6170980 238
## [545] {butter} => {root_vegetables} 0.012913066 0.2330275 0.055414337 2.1378971 127
## [546] {butter} => {yogurt} 0.014641586 0.2642202 0.055414337 1.8940273 144
## [547] {butter} => {rolls/buns} 0.013421454 0.2422018 0.055414337 1.3167800 132
## [548] {butter} => {other_vegetables} 0.020030503 0.3614679 0.055414337 1.8681223 197
## [549] {butter} => {whole_milk} 0.027554652 0.4972477 0.055414337 1.9460530 271
## [550] {newspapers} => {rolls/buns} 0.019725470 0.2471338 0.079816980 1.3435934 194
## [551] {newspapers} => {other_vegetables} 0.019318760 0.2420382 0.079816980 1.2508912 190
## [552] {newspapers} => {whole_milk} 0.027351296 0.3426752 0.079816980 1.3411103 269
## [553] {domestic_eggs} => {root_vegetables} 0.014336553 0.2259615 0.063446873 2.0730706 141
## [554] {domestic_eggs} => {yogurt} 0.014336553 0.2259615 0.063446873 1.6197753 141
## [555] {domestic_eggs} => {rolls/buns} 0.015658363 0.2467949 0.063446873 1.3417510 154
## [556] {domestic_eggs} => {other_vegetables} 0.022267412 0.3509615 0.063446873 1.8138238 219
## [557] {domestic_eggs} => {whole_milk} 0.029994916 0.4727564 0.063446873 1.8502027 295
## [558] {fruit/vegetable_juice} => {soda} 0.018403660 0.2545710 0.072292832 1.4598869 181
## [559] {fruit/vegetable_juice} => {yogurt} 0.018708693 0.2587904 0.072292832 1.8551049 184
## [560] {fruit/vegetable_juice} => {rolls/buns} 0.014539908 0.2011252 0.072292832 1.0934583 143
## [561] {fruit/vegetable_juice} => {other_vegetables} 0.021047280 0.2911392 0.072292832 1.5046529 207
## [562] {fruit/vegetable_juice} => {whole_milk} 0.026639553 0.3684951 0.072292832 1.4421604 262
## [563] {whipped/sour_cream} => {root_vegetables} 0.017081851 0.2382979 0.071682766 2.1862496 168
## [564] {whipped/sour_cream} => {yogurt} 0.020742247 0.2893617 0.071682766 2.0742510 204
## [565] {whipped/sour_cream} => {rolls/buns} 0.014641586 0.2042553 0.071682766 1.1104760 144
## [566] {whipped/sour_cream} => {other_vegetables} 0.028876462 0.4028369 0.071682766 2.0819237 284
## [567] {whipped/sour_cream} => {whole_milk} 0.032231825 0.4496454 0.071682766 1.7597542 317
## [568] {pip_fruit} => {tropical_fruit} 0.020437214 0.2701613 0.075648195 2.5746476 201
## [569] {pip_fruit} => {root_vegetables} 0.015556685 0.2056452 0.075648195 1.8866793 153
## [570] {pip_fruit} => {yogurt} 0.017996950 0.2379032 0.075648195 1.7053777 177
## [571] {pip_fruit} => {other_vegetables} 0.026131164 0.3454301 0.075648195 1.7852365 257
## [572] {pip_fruit} => {whole_milk} 0.030096594 0.3978495 0.075648195 1.5570432 296
## [573] {pastry} => {soda} 0.021047280 0.2365714 0.088967972 1.3566647 207
## [574] {pastry} => {rolls/buns} 0.020945602 0.2354286 0.088967972 1.2799558 206
## [575] {pastry} => {other_vegetables} 0.022572445 0.2537143 0.088967972 1.3112349 222
## [576] {pastry} => {whole_milk} 0.033248602 0.3737143 0.088967972 1.4625865 327
## [577] {citrus_fruit} => {tropical_fruit} 0.019928826 0.2407862 0.082765633 2.2947022 196
## [578] {citrus_fruit} => {root_vegetables} 0.017691917 0.2137592 0.082765633 1.9611211 174
## [579] {citrus_fruit} => {yogurt} 0.021657346 0.2616708 0.082765633 1.8757521 213
## [580] {citrus_fruit} => {rolls/buns} 0.016776817 0.2027027 0.082765633 1.1020349 165
## [581] {citrus_fruit} => {other_vegetables} 0.028876462 0.3488943 0.082765633 1.8031403 284
## [582] {citrus_fruit} => {whole_milk} 0.030503305 0.3685504 0.082765633 1.4423768 300
## [583] {shopping_bags} => {soda} 0.024605999 0.2497420 0.098525674 1.4321939 242
## [584] {shopping_bags} => {other_vegetables} 0.023182511 0.2352941 0.098525674 1.2160366 228
## [585] {shopping_bags} => {whole_milk} 0.024504321 0.2487100 0.098525674 0.9733637 241
## [586] {sausage} => {soda} 0.024300966 0.2586580 0.093950178 1.4833245 239
## [587] {sausage} => {yogurt} 0.019623793 0.2088745 0.093950178 1.4972889 193
## [588] {sausage} => {rolls/buns} 0.030604982 0.3257576 0.093950178 1.7710480 301
## [589] {sausage} => {other_vegetables} 0.026944586 0.2867965 0.093950178 1.4822091 265
## [590] {sausage} => {whole_milk} 0.029893238 0.3181818 0.093950178 1.2452520 294
## [591] {bottled_water} => {soda} 0.028978139 0.2621895 0.110523640 1.5035766 285
## [592] {bottled_water} => {yogurt} 0.022979156 0.2079117 0.110523640 1.4903873 226
## [593] {bottled_water} => {rolls/buns} 0.024199288 0.2189512 0.110523640 1.1903734 238
## [594] {bottled_water} => {other_vegetables} 0.024809354 0.2244710 0.110523640 1.1601012 244
## [595] {bottled_water} => {whole_milk} 0.034367056 0.3109476 0.110523640 1.2169396 338
## [596] {tropical_fruit} => {root_vegetables} 0.021047280 0.2005814 0.104931368 1.8402220 207
## [597] {tropical_fruit} => {yogurt} 0.029283172 0.2790698 0.104931368 2.0004746 288
## [598] {yogurt} => {tropical_fruit} 0.029283172 0.2099125 0.139501779 2.0004746 288
## [599] {tropical_fruit} => {rolls/buns} 0.024605999 0.2344961 0.104931368 1.2748863 242
## [600] {tropical_fruit} => {other_vegetables} 0.035892222 0.3420543 0.104931368 1.7677896 353
## [601] {tropical_fruit} => {whole_milk} 0.042297916 0.4031008 0.104931368 1.5775950 416
## [602] {root_vegetables} => {yogurt} 0.025826131 0.2369403 0.108998475 1.6984751 254
## [603] {root_vegetables} => {rolls/buns} 0.024300966 0.2229478 0.108998475 1.2121013 239
## [604] {root_vegetables} => {other_vegetables} 0.047381800 0.4347015 0.108998475 2.2466049 466
## [605] {other_vegetables} => {root_vegetables} 0.047381800 0.2448765 0.193492628 2.2466049 466
## [606] {root_vegetables} => {whole_milk} 0.048906965 0.4486940 0.108998475 1.7560310 481
## [607] {soda} => {rolls/buns} 0.038332486 0.2198251 0.174377224 1.1951242 377
## [608] {rolls/buns} => {soda} 0.038332486 0.2084024 0.183934926 1.1951242 377
## [609] {soda} => {whole_milk} 0.040061007 0.2297376 0.174377224 0.8991124 394
## [610] {yogurt} => {rolls/buns} 0.034367056 0.2463557 0.139501779 1.3393633 338
## [611] {yogurt} => {other_vegetables} 0.043416370 0.3112245 0.139501779 1.6084566 427
## [612] {other_vegetables} => {yogurt} 0.043416370 0.2243826 0.193492628 1.6084566 427
## [613] {yogurt} => {whole_milk} 0.056024403 0.4016035 0.139501779 1.5717351 551
## [614] {whole_milk} => {yogurt} 0.056024403 0.2192598 0.255516014 1.5717351 551
## [615] {rolls/buns} => {other_vegetables} 0.042602949 0.2316197 0.183934926 1.1970465 419
## [616] {other_vegetables} => {rolls/buns} 0.042602949 0.2201787 0.193492628 1.1970465 419
## [617] {rolls/buns} => {whole_milk} 0.056634469 0.3079049 0.183934926 1.2050318 557
## [618] {whole_milk} => {rolls/buns} 0.056634469 0.2216474 0.255516014 1.2050318 557
## [619] {other_vegetables} => {whole_milk} 0.074834774 0.3867578 0.193492628 1.5136341 736
## [620] {whole_milk} => {other_vegetables} 0.074834774 0.2928770 0.255516014 1.5136341 736
## [621] {liver_loaf,
## yogurt} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [622] {liver_loaf,
## whole_milk} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [623] {curd_cheese,
## tropical_fruit} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [624] {curd_cheese,
## other_vegetables} => {tropical_fruit} 0.001016777 0.4761905 0.002135231 4.5381137 10
## [625] {curd_cheese,
## rolls/buns} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [626] {curd_cheese,
## whole_milk} => {rolls/buns} 0.001016777 0.4347826 0.002338587 2.3637849 10
## [627] {curd_cheese,
## other_vegetables} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [628] {curd_cheese,
## whole_milk} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [629] {cleaner,
## other_vegetables} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [630] {cleaner,
## whole_milk} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [631] {liquor,
## red/blush_wine} => {bottled_beer} 0.001931876 0.9047619 0.002135231 11.2352694 19
## [632] {bottled_beer,
## liquor} => {red/blush_wine} 0.001931876 0.4130435 0.004677173 21.4935588 19
## [633] {bottled_beer,
## red/blush_wine} => {liquor} 0.001931876 0.3958333 0.004880529 35.7157875 19
## [634] {bottled_beer,
## liquor} => {soda} 0.001220132 0.2608696 0.004677173 1.4960071 12
## [635] {liquor,
## soda} => {bottled_beer} 0.001220132 0.5714286 0.002135231 7.0959596 12
## [636] {cereals,
## curd} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [637] {cereals,
## whole_milk} => {curd} 0.001016777 0.2777778 0.003660397 5.2136344 10
## [638] {cereals,
## root_vegetables} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [639] {cereals,
## whole_milk} => {root_vegetables} 0.001016777 0.2777778 0.003660397 2.5484556 10
## [640] {cereals,
## yogurt} => {whole_milk} 0.001728521 0.8095238 0.002135231 3.1681921 17
## [641] {cereals,
## whole_milk} => {yogurt} 0.001728521 0.4722222 0.003660397 3.3850624 17
## [642] {cereals,
## other_vegetables} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [643] {cereals,
## whole_milk} => {other_vegetables} 0.001321810 0.3611111 0.003660397 1.8662784 13
## [644] {butter,
## jam} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [645] {jam,
## whole_milk} => {butter} 0.001016777 0.3448276 0.002948653 6.2227143 10
## [646] {jam,
## root_vegetables} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [647] {jam,
## other_vegetables} => {root_vegetables} 0.001016777 0.5555556 0.001830198 5.0969113 10
## [648] {jam,
## root_vegetables} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [649] {jam,
## whole_milk} => {root_vegetables} 0.001321810 0.4482759 0.002948653 4.1126801 13
## [650] {jam,
## other_vegetables} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [651] {jam,
## whole_milk} => {other_vegetables} 0.001321810 0.4482759 0.002948653 2.3167594 13
## [652] {kitchen_towels,
## other_vegetables} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [653] {kitchen_towels,
## whole_milk} => {other_vegetables} 0.001016777 0.3703704 0.002745297 1.9141317 10
## [654] {instant_coffee,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [655] {instant_coffee,
## other_vegetables} => {whipped/sour_cream} 0.001016777 0.5263158 0.001931876 7.3422919 10
## [656] {instant_coffee,
## soda} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [657] {instant_coffee,
## other_vegetables} => {soda} 0.001016777 0.5263158 0.001931876 3.0182599 10
## [658] {instant_coffee,
## other_vegetables} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [659] {instant_coffee,
## whole_milk} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [660] {vinegar,
## yogurt} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [661] {other_vegetables,
## vinegar} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [662] {other_vegetables,
## vinegar} => {whole_milk} 0.001321810 0.5416667 0.002440264 2.1198932 13
## [663] {vinegar,
## whole_milk} => {other_vegetables} 0.001321810 0.5000000 0.002643620 2.5840778 13
## [664] {popcorn,
## salty_snack} => {soda} 0.001220132 0.5454545 0.002236909 3.1280148 12
## [665] {popcorn,
## soda} => {salty_snack} 0.001220132 0.6315789 0.001931876 16.6977929 12
## [666] {candles,
## margarine} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [667] {candles,
## whole_milk} => {margarine} 0.001016777 0.3333333 0.003050330 5.6915509 10
## [668] {candles,
## tropical_fruit} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [669] {candles,
## whole_milk} => {tropical_fruit} 0.001016777 0.3333333 0.003050330 3.1766796 10
## [670] {candles,
## root_vegetables} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [671] {candles,
## other_vegetables} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [672] {bottled_beer,
## soups} => {whole_milk} 0.001118454 0.9166667 0.001220132 3.5875116 11
## [673] {soups,
## whole_milk} => {bottled_beer} 0.001118454 0.3793103 0.002948653 4.7102490 11
## [674] {soups,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [675] {other_vegetables,
## soups} => {whipped/sour_cream} 0.001016777 0.3225806 0.003152008 4.5001144 10
## [676] {pip_fruit,
## soups} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [677] {other_vegetables,
## soups} => {pip_fruit} 0.001016777 0.3225806 0.003152008 4.2642213 10
## [678] {root_vegetables,
## soups} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [679] {other_vegetables,
## soups} => {root_vegetables} 0.001220132 0.3870968 0.003152008 3.5513962 12
## [680] {root_vegetables,
## soups} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [681] {soups,
## whole_milk} => {root_vegetables} 0.001118454 0.3793103 0.002948653 3.4799601 11
## [682] {other_vegetables,
## soups} => {whole_milk} 0.001830198 0.5806452 0.003152008 2.2724414 18
## [683] {soups,
## whole_milk} => {other_vegetables} 0.001830198 0.6206897 0.002948653 3.2078207 18
## [684] {dog_food,
## tropical_fruit} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [685] {dog_food,
## yogurt} => {tropical_fruit} 0.001016777 0.5263158 0.001931876 5.0158099 10
## [686] {dog_food,
## tropical_fruit} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [687] {dog_food,
## whole_milk} => {tropical_fruit} 0.001016777 0.3448276 0.002948653 3.2862203 10
## [688] {dog_food,
## root_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [689] {dog_food,
## whole_milk} => {root_vegetables} 0.001016777 0.3448276 0.002948653 3.1636001 10
## [690] {dog_food,
## yogurt} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [691] {dog_food,
## whole_milk} => {yogurt} 0.001220132 0.4137931 0.002948653 2.9662210 12
## [692] {dog_food,
## other_vegetables} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [693] {dog_food,
## whole_milk} => {other_vegetables} 0.001118454 0.3793103 0.002948653 1.9603349 11
## [694] {hamburger_meat,
## instant_food_products} => {soda} 0.001220132 0.4000000 0.003050330 2.2938776 12
## [695] {instant_food_products,
## soda} => {hamburger_meat} 0.001220132 0.6315789 0.001931876 18.9956543 12
## [696] {hamburger_meat,
## soda} => {instant_food_products} 0.001220132 0.2105263 0.005795628 26.2091939 12
## [697] {hamburger_meat,
## instant_food_products} => {rolls/buns} 0.001016777 0.3333333 0.003050330 1.8122351 10
## [698] {instant_food_products,
## rolls/buns} => {hamburger_meat} 0.001016777 0.4347826 0.002338587 13.0767185 10
## [699] {hamburger_meat,
## instant_food_products} => {whole_milk} 0.001525165 0.5000000 0.003050330 1.9568245 15
## [700] {instant_food_products,
## whole_milk} => {hamburger_meat} 0.001525165 0.5000000 0.003050330 15.0382263 15
## [701] {instant_food_products,
## root_vegetables} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [702] {instant_food_products,
## other_vegetables} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [703] {instant_food_products,
## yogurt} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [704] {instant_food_products,
## whole_milk} => {yogurt} 0.001118454 0.3666667 0.003050330 2.6284014 11
## [705] {instant_food_products,
## rolls/buns} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [706] {instant_food_products,
## whole_milk} => {rolls/buns} 0.001118454 0.3666667 0.003050330 1.9934586 11
## [707] {instant_food_products,
## other_vegetables} => {whole_milk} 0.001525165 0.5555556 0.002745297 2.1742495 15
## [708] {instant_food_products,
## whole_milk} => {other_vegetables} 0.001525165 0.5000000 0.003050330 2.5840778 15
## [709] {specialty_cheese,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [710] {other_vegetables,
## specialty_cheese} => {whipped/sour_cream} 0.001016777 0.2380952 0.004270463 3.3215130 10
## [711] {citrus_fruit,
## specialty_cheese} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [712] {specialty_cheese,
## whole_milk} => {citrus_fruit} 0.001016777 0.2702703 0.003762074 3.2654891 10
## [713] {bottled_water,
## specialty_cheese} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [714] {other_vegetables,
## specialty_cheese} => {bottled_water} 0.001016777 0.2380952 0.004270463 2.1542472 10
## [715] {root_vegetables,
## specialty_cheese} => {yogurt} 0.001118454 0.5238095 0.002135231 3.7548591 11
## [716] {specialty_cheese,
## yogurt} => {root_vegetables} 0.001118454 0.3928571 0.002846975 3.6042444 11
## [717] {root_vegetables,
## specialty_cheese} => {other_vegetables} 0.001423488 0.6666667 0.002135231 3.4454370 14
## [718] {other_vegetables,
## specialty_cheese} => {root_vegetables} 0.001423488 0.3333333 0.004270463 3.0581468 14
## [719] {root_vegetables,
## specialty_cheese} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [720] {specialty_cheese,
## whole_milk} => {root_vegetables} 0.001321810 0.3513514 0.003762074 3.2234520 13
## [721] {specialty_cheese,
## yogurt} => {other_vegetables} 0.001626843 0.5714286 0.002846975 2.9532317 16
## [722] {other_vegetables,
## specialty_cheese} => {yogurt} 0.001626843 0.3809524 0.004270463 2.7308066 16
## [723] {specialty_cheese,
## yogurt} => {whole_milk} 0.002033554 0.7142857 0.002846975 2.7954636 20
## [724] {specialty_cheese,
## whole_milk} => {yogurt} 0.002033554 0.5405405 0.003762074 3.8747932 20
## [725] {other_vegetables,
## specialty_cheese} => {whole_milk} 0.002236909 0.5238095 0.004270463 2.0500066 22
## [726] {specialty_cheese,
## whole_milk} => {other_vegetables} 0.002236909 0.5945946 0.003762074 3.0729574 22
## [727] {chocolate_marshmallow,
## soda} => {rolls/buns} 0.001016777 0.4166667 0.002440264 2.2652939 10
## [728] {chocolate_marshmallow,
## rolls/buns} => {soda} 0.001016777 0.4545455 0.002236909 2.6066790 10
## [729] {butter,
## flower_(seeds)} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [730] {flower_(seeds),
## whole_milk} => {butter} 0.001016777 0.2564103 0.003965430 4.6271466 10
## [731] {flower_(seeds),
## root_vegetables} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [732] {flower_(seeds),
## other_vegetables} => {root_vegetables} 0.001118454 0.2972973 0.003762074 2.7275363 11
## [733] {flower_(seeds),
## root_vegetables} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [734] {flower_(seeds),
## whole_milk} => {root_vegetables} 0.001016777 0.2564103 0.003965430 2.3524206 10
## [735] {flower_(seeds),
## other_vegetables} => {whole_milk} 0.001626843 0.4324324 0.003762074 1.6923888 16
## [736] {flower_(seeds),
## whole_milk} => {other_vegetables} 0.001626843 0.4102564 0.003965430 2.1202689 16
## [737] {frozen_potato_products,
## fruit/vegetable_juice} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [738] {frozen_potato_products,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.3235294 0.003457041 4.4752627 11
## [739] {frozen_potato_products,
## yogurt} => {whole_milk} 0.001525165 0.6818182 0.002236909 2.6683971 15
## [740] {frozen_potato_products,
## whole_milk} => {yogurt} 0.001525165 0.4411765 0.003457041 3.1625150 15
## [741] {frozen_potato_products,
## rolls/buns} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [742] {frozen_potato_products,
## whole_milk} => {rolls/buns} 0.001118454 0.3235294 0.003457041 1.7589341 11
## [743] {frozen_potato_products,
## other_vegetables} => {whole_milk} 0.001830198 0.6923077 0.002643620 2.7094493 18
## [744] {frozen_potato_products,
## whole_milk} => {other_vegetables} 0.001830198 0.5294118 0.003457041 2.7360823 18
## [745] {house_keeping_products,
## napkins} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [746] {house_keeping_products,
## whole_milk} => {napkins} 0.001321810 0.3421053 0.003863752 6.5332141 13
## [747] {house_keeping_products,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.9230769 0.001321810 3.6125991 12
## [748] {house_keeping_products,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.3157895 0.003863752 4.4053751 12
## [749] {house_keeping_products,
## sausage} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [750] {house_keeping_products,
## whole_milk} => {sausage} 0.001118454 0.2894737 0.003863752 3.0811404 11
## [751] {house_keeping_products,
## tropical_fruit} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [752] {house_keeping_products,
## whole_milk} => {tropical_fruit} 0.001118454 0.2894737 0.003863752 2.7586954 11
## [753] {house_keeping_products,
## root_vegetables} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [754] {house_keeping_products,
## whole_milk} => {root_vegetables} 0.001321810 0.3421053 0.003863752 3.1386243 13
## [755] {house_keeping_products,
## yogurt} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [756] {house_keeping_products,
## other_vegetables} => {yogurt} 0.001016777 0.3703704 0.002745297 2.6549509 10
## [757] {house_keeping_products,
## yogurt} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [758] {house_keeping_products,
## whole_milk} => {yogurt} 0.001016777 0.2631579 0.003863752 1.8864125 10
## [759] {house_keeping_products,
## rolls/buns} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [760] {house_keeping_products,
## whole_milk} => {rolls/buns} 0.001118454 0.2894737 0.003863752 1.5737831 11
## [761] {house_keeping_products,
## other_vegetables} => {whole_milk} 0.001728521 0.6296296 0.002745297 2.4641494 17
## [762] {house_keeping_products,
## whole_milk} => {other_vegetables} 0.001728521 0.4473684 0.003863752 2.3120696 17
## [763] {sweet_spreads,
## white_bread} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [764] {sweet_spreads,
## whole_milk} => {white_bread} 0.001016777 0.2857143 0.003558719 6.7874396 10
## [765] {pastry,
## sweet_spreads} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [766] {sweet_spreads,
## whole_milk} => {pastry} 0.001016777 0.2857143 0.003558719 3.2114286 10
## [767] {root_vegetables,
## sweet_spreads} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [768] {sweet_spreads,
## whole_milk} => {root_vegetables} 0.001220132 0.3428571 0.003558719 3.1455224 12
## [769] {soda,
## sweet_spreads} => {yogurt} 0.001220132 0.4800000 0.002541942 3.4408163 12
## [770] {sweet_spreads,
## yogurt} => {soda} 0.001220132 0.5454545 0.002236909 3.1280148 12
## [771] {soda,
## sweet_spreads} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [772] {sweet_spreads,
## whole_milk} => {soda} 0.001423488 0.4000000 0.003558719 2.2938776 14
## [773] {sweet_spreads,
## yogurt} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [774] {sweet_spreads,
## whole_milk} => {yogurt} 0.001220132 0.3428571 0.003558719 2.4577259 12
## [775] {curd,
## turkey} => {other_vegetables} 0.001220132 0.8000000 0.001525165 4.1345244 12
## [776] {other_vegetables,
## turkey} => {curd} 0.001220132 0.3076923 0.003965430 5.7751028 12
## [777] {curd,
## turkey} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [778] {turkey,
## whole_milk} => {curd} 0.001016777 0.2777778 0.003660397 5.2136344 10
## [779] {butter,
## turkey} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [780] {turkey,
## whole_milk} => {butter} 0.001016777 0.2777778 0.003660397 5.0127421 10
## [781] {turkey,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [782] {other_vegetables,
## turkey} => {whipped/sour_cream} 0.001016777 0.2564103 0.003965430 3.5770140 10
## [783] {pastry,
## turkey} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [784] {turkey,
## whole_milk} => {pastry} 0.001118454 0.3055556 0.003660397 3.4344444 11
## [785] {bottled_water,
## turkey} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [786] {turkey,
## whole_milk} => {bottled_water} 0.001220132 0.3333333 0.003660397 3.0159460 12
## [787] {tropical_fruit,
## turkey} => {root_vegetables} 0.001525165 0.5769231 0.002643620 5.2929463 15
## [788] {root_vegetables,
## turkey} => {tropical_fruit} 0.001525165 0.6000000 0.002541942 5.7180233 15
## [789] {tropical_fruit,
## turkey} => {yogurt} 0.001220132 0.4615385 0.002643620 3.3084772 12
## [790] {turkey,
## yogurt} => {tropical_fruit} 0.001220132 0.5217391 0.002338587 4.9721941 12
## [791] {tropical_fruit,
## turkey} => {other_vegetables} 0.001626843 0.6153846 0.002643620 3.1804034 16
## [792] {other_vegetables,
## turkey} => {tropical_fruit} 0.001626843 0.4102564 0.003965430 3.9097595 16
## [793] {tropical_fruit,
## turkey} => {whole_milk} 0.001423488 0.5384615 0.002643620 2.1073495 14
## [794] {turkey,
## whole_milk} => {tropical_fruit} 0.001423488 0.3888889 0.003660397 3.7061262 14
## [795] {root_vegetables,
## turkey} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [796] {turkey,
## yogurt} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [797] {root_vegetables,
## turkey} => {other_vegetables} 0.001931876 0.7600000 0.002541942 3.9277982 19
## [798] {other_vegetables,
## turkey} => {root_vegetables} 0.001931876 0.4871795 0.003965430 4.4695991 19
## [799] {root_vegetables,
## turkey} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [800] {turkey,
## whole_milk} => {root_vegetables} 0.001525165 0.4166667 0.003660397 3.8226835 15
## [801] {turkey,
## yogurt} => {other_vegetables} 0.001423488 0.6086957 0.002338587 3.1458338 14
## [802] {other_vegetables,
## turkey} => {yogurt} 0.001423488 0.3589744 0.003965430 2.5732601 14
## [803] {turkey,
## yogurt} => {whole_milk} 0.001525165 0.6521739 0.002338587 2.5523798 15
## [804] {turkey,
## whole_milk} => {yogurt} 0.001525165 0.4166667 0.003660397 2.9868197 15
## [805] {rolls/buns,
## turkey} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [806] {other_vegetables,
## turkey} => {rolls/buns} 0.001016777 0.2564103 0.003965430 1.3940270 10
## [807] {rolls/buns,
## turkey} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [808] {turkey,
## whole_milk} => {rolls/buns} 0.001016777 0.2777778 0.003660397 1.5101959 10
## [809] {other_vegetables,
## turkey} => {whole_milk} 0.002135231 0.5384615 0.003965430 2.1073495 21
## [810] {turkey,
## whole_milk} => {other_vegetables} 0.002135231 0.5833333 0.003660397 3.0147574 21
## [811] {rice,
## sugar} => {whole_milk} 0.001220132 1.0000000 0.001220132 3.9136490 12
## [812] {rice,
## whole_milk} => {sugar} 0.001220132 0.2608696 0.004677173 7.7046612 12
## [813] {frozen_vegetables,
## rice} => {other_vegetables} 0.001118454 0.7857143 0.001423488 4.0606936 11
## [814] {other_vegetables,
## rice} => {frozen_vegetables} 0.001118454 0.2820513 0.003965430 5.8646392 11
## [815] {frozen_vegetables,
## rice} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [816] {rice,
## whole_milk} => {frozen_vegetables} 0.001016777 0.2173913 0.004677173 4.5201765 10
## [817] {butter,
## rice} => {root_vegetables} 0.001016777 0.5555556 0.001830198 5.0969113 10
## [818] {rice,
## root_vegetables} => {butter} 0.001016777 0.3225806 0.003152008 5.8212489 10
## [819] {butter,
## rice} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [820] {rice,
## yogurt} => {butter} 0.001016777 0.4347826 0.002338587 7.8460311 10
## [821] {butter,
## rice} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [822] {other_vegetables,
## rice} => {butter} 0.001220132 0.3076923 0.003965430 5.5525759 12
## [823] {butter,
## rice} => {whole_milk} 0.001525165 0.8333333 0.001830198 3.2613742 15
## [824] {rice,
## whole_milk} => {butter} 0.001525165 0.3260870 0.004677173 5.8845233 15
## [825] {domestic_eggs,
## rice} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [826] {rice,
## whole_milk} => {domestic_eggs} 0.001118454 0.2391304 0.004677173 3.7689869 11
## [827] {fruit/vegetable_juice,
## rice} => {root_vegetables} 0.001118454 0.5789474 0.001931876 5.3115181 11
## [828] {rice,
## root_vegetables} => {fruit/vegetable_juice} 0.001118454 0.3548387 0.003152008 4.9083526 11
## [829] {fruit/vegetable_juice,
## rice} => {other_vegetables} 0.001321810 0.6842105 0.001931876 3.5361064 13
## [830] {other_vegetables,
## rice} => {fruit/vegetable_juice} 0.001321810 0.3333333 0.003965430 4.6108767 13
## [831] {fruit/vegetable_juice,
## rice} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [832] {rice,
## whole_milk} => {fruit/vegetable_juice} 0.001321810 0.2826087 0.004677173 3.9092215 13
## [833] {pip_fruit,
## rice} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [834] {rice,
## whole_milk} => {pip_fruit} 0.001118454 0.2391304 0.004677173 3.1610858 11
## [835] {citrus_fruit,
## rice} => {root_vegetables} 0.001016777 0.5555556 0.001830198 5.0969113 10
## [836] {rice,
## root_vegetables} => {citrus_fruit} 0.001016777 0.3225806 0.003152008 3.8975192 10
## [837] {citrus_fruit,
## rice} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [838] {other_vegetables,
## rice} => {citrus_fruit} 0.001118454 0.2820513 0.003965430 3.4078309 11
## [839] {citrus_fruit,
## rice} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [840] {rice,
## whole_milk} => {citrus_fruit} 0.001016777 0.2173913 0.004677173 2.6265890 10
## [841] {bottled_water,
## rice} => {whole_milk} 0.001220132 0.9230769 0.001321810 3.6125991 12
## [842] {rice,
## whole_milk} => {bottled_water} 0.001220132 0.2608696 0.004677173 2.3603056 12
## [843] {rice,
## tropical_fruit} => {root_vegetables} 0.001016777 0.5263158 0.001931876 4.8286528 10
## [844] {rice,
## root_vegetables} => {tropical_fruit} 0.001016777 0.3225806 0.003152008 3.0742061 10
## [845] {rice,
## tropical_fruit} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [846] {other_vegetables,
## rice} => {tropical_fruit} 0.001220132 0.3076923 0.003965430 2.9323196 12
## [847] {rice,
## tropical_fruit} => {whole_milk} 0.001525165 0.7894737 0.001931876 3.0897229 15
## [848] {rice,
## whole_milk} => {tropical_fruit} 0.001525165 0.3260870 0.004677173 3.1076213 15
## [849] {rice,
## root_vegetables} => {yogurt} 0.001626843 0.5161290 0.003152008 3.6998025 16
## [850] {rice,
## yogurt} => {root_vegetables} 0.001626843 0.6956522 0.002338587 6.3822193 16
## [851] {rice,
## root_vegetables} => {other_vegetables} 0.002236909 0.7096774 0.003152008 3.6677233 22
## [852] {other_vegetables,
## rice} => {root_vegetables} 0.002236909 0.5641026 0.003965430 5.1753253 22
## [853] {rice,
## root_vegetables} => {whole_milk} 0.002440264 0.7741935 0.003152008 3.0299218 24
## [854] {rice,
## whole_milk} => {root_vegetables} 0.002440264 0.5217391 0.004677173 4.7866645 24
## [855] {rice,
## yogurt} => {other_vegetables} 0.001931876 0.8260870 0.002338587 4.2693459 19
## [856] {other_vegetables,
## rice} => {yogurt} 0.001931876 0.4871795 0.003965430 3.4922815 19
## [857] {rice,
## yogurt} => {whole_milk} 0.001830198 0.7826087 0.002338587 3.0628558 18
## [858] {rice,
## whole_milk} => {yogurt} 0.001830198 0.3913043 0.004677173 2.8050133 18
## [859] {other_vegetables,
## rice} => {whole_milk} 0.002643620 0.6666667 0.003965430 2.6090994 26
## [860] {rice,
## whole_milk} => {other_vegetables} 0.002643620 0.5652174 0.004677173 2.9211314 26
## [861] {newspapers,
## spread_cheese} => {rolls/buns} 0.001220132 0.7500000 0.001626843 4.0775290 12
## [862] {rolls/buns,
## spread_cheese} => {newspapers} 0.001220132 0.2926829 0.004168785 3.6669256 12
## [863] {citrus_fruit,
## spread_cheese} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [864] {other_vegetables,
## spread_cheese} => {citrus_fruit} 0.001016777 0.3333333 0.003050330 4.0274365 10
## [865] {sausage,
## spread_cheese} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [866] {spread_cheese,
## yogurt} => {sausage} 0.001016777 0.2857143 0.003558719 3.0411255 10
## [867] {sausage,
## spread_cheese} => {rolls/buns} 0.001220132 0.5000000 0.002440264 2.7183527 12
## [868] {rolls/buns,
## spread_cheese} => {sausage} 0.001220132 0.2926829 0.004168785 3.1152993 12
## [869] {bottled_water,
## spread_cheese} => {soda} 0.001016777 0.4545455 0.002236909 2.6066790 10
## [870] {soda,
## spread_cheese} => {bottled_water} 0.001016777 0.3225806 0.003152008 2.9186574 10
## [871] {spread_cheese,
## tropical_fruit} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [872] {spread_cheese,
## whole_milk} => {tropical_fruit} 0.001016777 0.3225806 0.003152008 3.0742061 10
## [873] {soda,
## spread_cheese} => {yogurt} 0.001118454 0.3548387 0.003152008 2.5436142 11
## [874] {spread_cheese,
## yogurt} => {soda} 0.001118454 0.3142857 0.003558719 1.8023324 11
## [875] {soda,
## spread_cheese} => {rolls/buns} 0.001321810 0.4193548 0.003152008 2.2799087 13
## [876] {rolls/buns,
## spread_cheese} => {soda} 0.001321810 0.3170732 0.004168785 1.8183176 13
## [877] {soda,
## spread_cheese} => {other_vegetables} 0.001016777 0.3225806 0.003152008 1.6671469 10
## [878] {other_vegetables,
## spread_cheese} => {soda} 0.001016777 0.3333333 0.003050330 1.9115646 10
## [879] {spread_cheese,
## yogurt} => {rolls/buns} 0.001626843 0.4571429 0.003558719 2.4853510 16
## [880] {rolls/buns,
## spread_cheese} => {yogurt} 0.001626843 0.3902439 0.004168785 2.7974116 16
## [881] {spread_cheese,
## yogurt} => {other_vegetables} 0.001423488 0.4000000 0.003558719 2.0672622 14
## [882] {other_vegetables,
## spread_cheese} => {yogurt} 0.001423488 0.4666667 0.003050330 3.3452381 14
## [883] {spread_cheese,
## yogurt} => {whole_milk} 0.001423488 0.4000000 0.003558719 1.5654596 14
## [884] {spread_cheese,
## whole_milk} => {yogurt} 0.001423488 0.4516129 0.003152008 3.2373272 14
## [885] {rolls/buns,
## spread_cheese} => {other_vegetables} 0.001016777 0.2439024 0.004168785 1.2605257 10
## [886] {other_vegetables,
## spread_cheese} => {rolls/buns} 0.001016777 0.3333333 0.003050330 1.8122351 10
## [887] {rolls/buns,
## spread_cheese} => {whole_milk} 0.001118454 0.2682927 0.004168785 1.0500034 11
## [888] {spread_cheese,
## whole_milk} => {rolls/buns} 0.001118454 0.3548387 0.003152008 1.9291535 11
## [889] {other_vegetables,
## spread_cheese} => {whole_milk} 0.001220132 0.4000000 0.003050330 1.5654596 12
## [890] {spread_cheese,
## whole_milk} => {other_vegetables} 0.001220132 0.3870968 0.003152008 2.0005763 12
## [891] {dish_cleaner,
## root_vegetables} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [892] {dish_cleaner,
## whole_milk} => {root_vegetables} 0.001118454 0.3793103 0.002948653 3.4799601 11
## [893] {dish_cleaner,
## yogurt} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [894] {dish_cleaner,
## whole_milk} => {yogurt} 0.001118454 0.3793103 0.002948653 2.7190359 11
## [895] {dish_cleaner,
## other_vegetables} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [896] {dish_cleaner,
## whole_milk} => {other_vegetables} 0.001118454 0.3793103 0.002948653 1.9603349 11
## [897] {cling_film/bags,
## yogurt} => {whole_milk} 0.001118454 0.4400000 0.002541942 1.7220056 11
## [898] {cling_film/bags,
## whole_milk} => {yogurt} 0.001118454 0.3055556 0.003660397 2.1903345 11
## [899] {salt,
## sugar} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [900] {salt,
## whole_milk} => {sugar} 0.001016777 0.2631579 0.003863752 7.7722459 10
## [901] {domestic_eggs,
## salt} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [902] {salt,
## whole_milk} => {domestic_eggs} 0.001321810 0.3421053 0.003863752 5.3919956 13
## [903] {fruit/vegetable_juice,
## salt} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [904] {other_vegetables,
## salt} => {fruit/vegetable_juice} 0.001016777 0.2777778 0.003660397 3.8423972 10
## [905] {salt,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.4761905 0.002135231 4.3687811 10
## [906] {root_vegetables,
## salt} => {whipped/sour_cream} 0.001016777 0.3703704 0.002745297 5.1667980 10
## [907] {pip_fruit,
## salt} => {root_vegetables} 0.001016777 0.6666667 0.001525165 6.1162935 10
## [908] {root_vegetables,
## salt} => {pip_fruit} 0.001016777 0.3703704 0.002745297 4.8959578 10
## [909] {pip_fruit,
## salt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [910] {salt,
## whole_milk} => {pip_fruit} 0.001118454 0.2894737 0.003863752 3.8265775 11
## [911] {citrus_fruit,
## salt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [912] {salt,
## whole_milk} => {citrus_fruit} 0.001118454 0.2894737 0.003863752 3.4975107 11
## [913] {root_vegetables,
## salt} => {other_vegetables} 0.001321810 0.4814815 0.002745297 2.4883712 13
## [914] {other_vegetables,
## salt} => {root_vegetables} 0.001321810 0.3611111 0.003660397 3.3129923 13
## [915] {root_vegetables,
## salt} => {whole_milk} 0.001423488 0.5185185 0.002745297 2.0292995 14
## [916] {salt,
## whole_milk} => {root_vegetables} 0.001423488 0.3684211 0.003863752 3.3800570 14
## [917] {salt,
## yogurt} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [918] {salt,
## whole_milk} => {yogurt} 0.001118454 0.2894737 0.003863752 2.0750537 11
## [919] {other_vegetables,
## salt} => {whole_milk} 0.001423488 0.3888889 0.003660397 1.5219746 14
## [920] {salt,
## whole_milk} => {other_vegetables} 0.001423488 0.3684211 0.003863752 1.9040573 14
## [921] {chocolate,
## mayonnaise} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [922] {mayonnaise,
## other_vegetables} => {chocolate} 0.001118454 0.3142857 0.003558719 6.3340164 11
## [923] {mayonnaise,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [924] {mayonnaise,
## other_vegetables} => {whipped/sour_cream} 0.001016777 0.2857143 0.003558719 3.9858156 10
## [925] {mayonnaise,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [926] {mayonnaise,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.3030303 0.003355363 4.2273802 10
## [927] {mayonnaise,
## sausage} => {rolls/buns} 0.001118454 0.5238095 0.002135231 2.8477980 11
## [928] {mayonnaise,
## rolls/buns} => {sausage} 0.001118454 0.4074074 0.002745297 4.3364198 11
## [929] {mayonnaise,
## sausage} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [930] {mayonnaise,
## other_vegetables} => {sausage} 0.001016777 0.2857143 0.003558719 3.0411255 10
## [931] {mayonnaise,
## tropical_fruit} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [932] {mayonnaise,
## other_vegetables} => {tropical_fruit} 0.001016777 0.2857143 0.003558719 2.7228682 10
## [933] {mayonnaise,
## root_vegetables} => {yogurt} 0.001321810 0.5200000 0.002541942 3.7275510 13
## [934] {mayonnaise,
## yogurt} => {root_vegetables} 0.001321810 0.4814815 0.002745297 4.4173231 13
## [935] {mayonnaise,
## root_vegetables} => {other_vegetables} 0.001626843 0.6400000 0.002541942 3.3076195 16
## [936] {mayonnaise,
## other_vegetables} => {root_vegetables} 0.001626843 0.4571429 0.003558719 4.1940299 16
## [937] {mayonnaise,
## root_vegetables} => {whole_milk} 0.001016777 0.4000000 0.002541942 1.5654596 10
## [938] {mayonnaise,
## whole_milk} => {root_vegetables} 0.001016777 0.3030303 0.003355363 2.7801334 10
## [939] {mayonnaise,
## soda} => {whole_milk} 0.001016777 0.4166667 0.002440264 1.6306871 10
## [940] {mayonnaise,
## whole_milk} => {soda} 0.001016777 0.3030303 0.003355363 1.7377860 10
## [941] {mayonnaise,
## yogurt} => {other_vegetables} 0.001626843 0.5925926 0.002745297 3.0626107 16
## [942] {mayonnaise,
## other_vegetables} => {yogurt} 0.001626843 0.4571429 0.003558719 3.2769679 16
## [943] {mayonnaise,
## yogurt} => {whole_milk} 0.001118454 0.4074074 0.002745297 1.5944496 11
## [944] {mayonnaise,
## whole_milk} => {yogurt} 0.001118454 0.3333333 0.003355363 2.3894558 11
## [945] {mayonnaise,
## rolls/buns} => {other_vegetables} 0.001016777 0.3703704 0.002745297 1.9141317 10
## [946] {mayonnaise,
## other_vegetables} => {rolls/buns} 0.001016777 0.2857143 0.003558719 1.5533444 10
## [947] {mayonnaise,
## other_vegetables} => {whole_milk} 0.001626843 0.4571429 0.003558719 1.7890967 16
## [948] {mayonnaise,
## whole_milk} => {other_vegetables} 0.001626843 0.4848485 0.003355363 2.5057724 16
## [949] {curd,
## frozen_dessert} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [950] {frozen_dessert,
## whole_milk} => {curd} 0.001016777 0.2564103 0.003965430 4.8125856 10
## [951] {frozen_dessert,
## tropical_fruit} => {rolls/buns} 0.001016777 0.3846154 0.002643620 2.0910405 10
## [952] {frozen_dessert,
## rolls/buns} => {tropical_fruit} 0.001016777 0.3448276 0.002948653 3.2862203 10
## [953] {frozen_dessert,
## tropical_fruit} => {other_vegetables} 0.001423488 0.5384615 0.002643620 2.7828530 14
## [954] {frozen_dessert,
## other_vegetables} => {tropical_fruit} 0.001423488 0.3888889 0.003660397 3.7061262 14
## [955] {frozen_dessert,
## tropical_fruit} => {whole_milk} 0.001423488 0.5384615 0.002643620 2.1073495 14
## [956] {frozen_dessert,
## whole_milk} => {tropical_fruit} 0.001423488 0.3589744 0.003965430 3.4210396 14
## [957] {frozen_dessert,
## root_vegetables} => {other_vegetables} 0.001626843 0.6666667 0.002440264 3.4454370 16
## [958] {frozen_dessert,
## other_vegetables} => {root_vegetables} 0.001626843 0.4444444 0.003660397 4.0775290 16
## [959] {frozen_dessert,
## root_vegetables} => {whole_milk} 0.001321810 0.5416667 0.002440264 2.1198932 13
## [960] {frozen_dessert,
## whole_milk} => {root_vegetables} 0.001321810 0.3333333 0.003965430 3.0581468 13
## [961] {frozen_dessert,
## soda} => {whole_milk} 0.001016777 0.4000000 0.002541942 1.5654596 10
## [962] {frozen_dessert,
## whole_milk} => {soda} 0.001016777 0.2564103 0.003965430 1.4704343 10
## [963] {frozen_dessert,
## yogurt} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [964] {frozen_dessert,
## whole_milk} => {yogurt} 0.001118454 0.2820513 0.003965430 2.0218472 11
## [965] {frozen_dessert,
## rolls/buns} => {other_vegetables} 0.001016777 0.3448276 0.002948653 1.7821226 10
## [966] {frozen_dessert,
## other_vegetables} => {rolls/buns} 0.001016777 0.2777778 0.003660397 1.5101959 10
## [967] {frozen_dessert,
## rolls/buns} => {whole_milk} 0.001423488 0.4827586 0.002948653 1.8893478 14
## [968] {frozen_dessert,
## whole_milk} => {rolls/buns} 0.001423488 0.3589744 0.003965430 1.9516378 14
## [969] {frozen_dessert,
## other_vegetables} => {whole_milk} 0.002033554 0.5555556 0.003660397 2.1742495 20
## [970] {frozen_dessert,
## whole_milk} => {other_vegetables} 0.002033554 0.5128205 0.003965430 2.6503362 20
## [971] {bottled_water,
## white_wine} => {soda} 0.001016777 0.2564103 0.003965430 1.4704343 10
## [972] {soda,
## white_wine} => {bottled_water} 0.001016777 0.2777778 0.003660397 2.5132884 10
## [973] {soda,
## white_wine} => {rolls/buns} 0.001321810 0.3611111 0.003660397 1.9632547 13
## [974] {rolls/buns,
## white_wine} => {soda} 0.001321810 0.5000000 0.002643620 2.8673469 13
## [975] {packaged_fruit/vegetables,
## pastry} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [976] {packaged_fruit/vegetables,
## whole_milk} => {pastry} 0.001016777 0.2564103 0.003965430 2.8820513 10
## [977] {bottled_water,
## packaged_fruit/vegetables} => {whole_milk} 0.001118454 0.4230769 0.002643620 1.6557746 11
## [978] {packaged_fruit/vegetables,
## whole_milk} => {bottled_water} 0.001118454 0.2820513 0.003965430 2.5519543 11
## [979] {packaged_fruit/vegetables,
## root_vegetables} => {yogurt} 0.001016777 0.2941176 0.003457041 2.1083433 10
## [980] {packaged_fruit/vegetables,
## yogurt} => {root_vegetables} 0.001016777 0.4000000 0.002541942 3.6697761 10
## [981] {packaged_fruit/vegetables,
## root_vegetables} => {rolls/buns} 0.001016777 0.2941176 0.003457041 1.5990310 10
## [982] {packaged_fruit/vegetables,
## rolls/buns} => {root_vegetables} 0.001016777 0.3846154 0.002643620 3.5286309 10
## [983] {packaged_fruit/vegetables,
## root_vegetables} => {whole_milk} 0.001220132 0.3529412 0.003457041 1.3812879 12
## [984] {packaged_fruit/vegetables,
## whole_milk} => {root_vegetables} 0.001220132 0.3076923 0.003965430 2.8229047 12
## [985] {packaged_fruit/vegetables,
## soda} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [986] {packaged_fruit/vegetables,
## whole_milk} => {soda} 0.001220132 0.3076923 0.003965430 1.7645212 12
## [987] {packaged_fruit/vegetables,
## rolls/buns} => {whole_milk} 0.001220132 0.4615385 0.002643620 1.8062996 12
## [988] {packaged_fruit/vegetables,
## whole_milk} => {rolls/buns} 0.001220132 0.3076923 0.003965430 1.6728324 12
## [989] {other_vegetables,
## packaged_fruit/vegetables} => {whole_milk} 0.001016777 0.3225806 0.003152008 1.2624674 10
## [990] {packaged_fruit/vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.2564103 0.003965430 1.3251681 10
## [991] {canned_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [992] {canned_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2631579 0.003863752 3.6711459 10
## [993] {canned_vegetables,
## pip_fruit} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [994] {canned_vegetables,
## other_vegetables} => {pip_fruit} 0.001220132 0.2608696 0.004677173 3.4484572 12
## [995] {canned_vegetables,
## citrus_fruit} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [996] {canned_vegetables,
## yogurt} => {citrus_fruit} 0.001016777 0.3333333 0.003050330 4.0274365 10
## [997] {canned_vegetables,
## citrus_fruit} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [998] {canned_vegetables,
## other_vegetables} => {citrus_fruit} 0.001118454 0.2391304 0.004677173 2.8892479 11
## [999] {canned_vegetables,
## citrus_fruit} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [1000] {canned_vegetables,
## whole_milk} => {citrus_fruit} 0.001016777 0.2631579 0.003863752 3.1795552 10
## [1001] {canned_vegetables,
## tropical_fruit} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [1002] {canned_vegetables,
## root_vegetables} => {tropical_fruit} 0.001016777 0.3846154 0.002643620 3.6653995 10
## [1003] {canned_vegetables,
## tropical_fruit} => {yogurt} 0.001118454 0.4074074 0.002745297 2.9204460 11
## [1004] {canned_vegetables,
## yogurt} => {tropical_fruit} 0.001118454 0.3666667 0.003050330 3.4943475 11
## [1005] {canned_vegetables,
## tropical_fruit} => {other_vegetables} 0.001118454 0.4074074 0.002745297 2.1055449 11
## [1006] {canned_vegetables,
## other_vegetables} => {tropical_fruit} 0.001118454 0.2391304 0.004677173 2.2789223 11
## [1007] {canned_vegetables,
## tropical_fruit} => {whole_milk} 0.001220132 0.4444444 0.002745297 1.7393996 12
## [1008] {canned_vegetables,
## whole_milk} => {tropical_fruit} 0.001220132 0.3157895 0.003863752 3.0094859 12
## [1009] {canned_vegetables,
## root_vegetables} => {other_vegetables} 0.001830198 0.6923077 0.002643620 3.5779538 18
## [1010] {canned_vegetables,
## other_vegetables} => {root_vegetables} 0.001830198 0.3913043 0.004677173 3.5899984 18
## [1011] {canned_vegetables,
## root_vegetables} => {whole_milk} 0.001321810 0.5000000 0.002643620 1.9568245 13
## [1012] {canned_vegetables,
## whole_milk} => {root_vegetables} 0.001321810 0.3421053 0.003863752 3.1386243 13
## [1013] {canned_vegetables,
## soda} => {yogurt} 0.001016777 0.3333333 0.003050330 2.3894558 10
## [1014] {canned_vegetables,
## yogurt} => {soda} 0.001016777 0.3333333 0.003050330 1.9115646 10
## [1015] {canned_vegetables,
## soda} => {other_vegetables} 0.001220132 0.4000000 0.003050330 2.0672622 12
## [1016] {canned_vegetables,
## other_vegetables} => {soda} 0.001220132 0.2608696 0.004677173 1.4960071 12
## [1017] {canned_vegetables,
## soda} => {whole_milk} 0.001016777 0.3333333 0.003050330 1.3045497 10
## [1018] {canned_vegetables,
## whole_milk} => {soda} 0.001016777 0.2631579 0.003863752 1.5091300 10
## [1019] {canned_vegetables,
## yogurt} => {whole_milk} 0.001220132 0.4000000 0.003050330 1.5654596 12
## [1020] {canned_vegetables,
## whole_milk} => {yogurt} 0.001220132 0.3157895 0.003863752 2.2636950 12
## [1021] {canned_vegetables,
## rolls/buns} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [1022] {canned_vegetables,
## whole_milk} => {rolls/buns} 0.001016777 0.2631579 0.003863752 1.4307119 10
## [1023] {canned_vegetables,
## other_vegetables} => {whole_milk} 0.002033554 0.4347826 0.004677173 1.7015865 20
## [1024] {canned_vegetables,
## whole_milk} => {other_vegetables} 0.002033554 0.5263158 0.003863752 2.7200819 20
## [1025] {roll_products_,
## sugar} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [1026] {roll_products_,
## whole_milk} => {sugar} 0.001016777 0.2173913 0.004677173 6.4205510 10
## [1027] {pork,
## roll_products_} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [1028] {other_vegetables,
## roll_products_} => {pork} 0.001016777 0.2127660 0.004778851 3.6905700 10
## [1029] {bottled_beer,
## roll_products_} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [1030] {roll_products_,
## whole_milk} => {bottled_beer} 0.001118454 0.2391304 0.004677173 2.9695048 11
## [1031] {margarine,
## roll_products_} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [1032] {other_vegetables,
## roll_products_} => {margarine} 0.001118454 0.2340426 0.004778851 3.9961953 11
## [1033] {butter,
## roll_products_} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [1034] {roll_products_,
## whole_milk} => {butter} 0.001118454 0.2391304 0.004677173 4.3153171 11
## [1035] {roll_products_,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [1036] {other_vegetables,
## roll_products_} => {whipped/sour_cream} 0.001016777 0.2127660 0.004778851 2.9681606 10
## [1037] {citrus_fruit,
## roll_products_} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [1038] {other_vegetables,
## roll_products_} => {citrus_fruit} 0.001016777 0.2127660 0.004778851 2.5707042 10
## [1039] {roll_products_,
## sausage} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [1040] {other_vegetables,
## roll_products_} => {sausage} 0.001220132 0.2553191 0.004778851 2.7176015 12
## [1041] {roll_products_,
## sausage} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [1042] {roll_products_,
## whole_milk} => {sausage} 0.001016777 0.2173913 0.004677173 2.3138999 10
## [1043] {roll_products_,
## tropical_fruit} => {root_vegetables} 0.001016777 0.5000000 0.002033554 4.5872201 10
## [1044] {roll_products_,
## root_vegetables} => {tropical_fruit} 0.001016777 0.3225806 0.003152008 3.0742061 10
## [1045] {roll_products_,
## tropical_fruit} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [1046] {other_vegetables,
## roll_products_} => {tropical_fruit} 0.001016777 0.2127660 0.004778851 2.0276678 10
## [1047] {roll_products_,
## tropical_fruit} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [1048] {roll_products_,
## whole_milk} => {tropical_fruit} 0.001118454 0.2391304 0.004677173 2.2789223 11
## [1049] {roll_products_,
## root_vegetables} => {other_vegetables} 0.001423488 0.4516129 0.003152008 2.3340057 14
## [1050] {other_vegetables,
## roll_products_} => {root_vegetables} 0.001423488 0.2978723 0.004778851 2.7328120 14
## [1051] {roll_products_,
## root_vegetables} => {whole_milk} 0.001321810 0.4193548 0.003152008 1.6412077 13
## [1052] {roll_products_,
## whole_milk} => {root_vegetables} 0.001321810 0.2826087 0.004677173 2.5927766 13
## [1053] {roll_products_,
## yogurt} => {other_vegetables} 0.001423488 0.6363636 0.002236909 3.2888263 14
## [1054] {other_vegetables,
## roll_products_} => {yogurt} 0.001423488 0.2978723 0.004778851 2.1352584 14
## [1055] {roll_products_,
## yogurt} => {whole_milk} 0.001423488 0.6363636 0.002236909 2.4905039 14
## [1056] {roll_products_,
## whole_milk} => {yogurt} 0.001423488 0.3043478 0.004677173 2.1816770 14
## [1057] {roll_products_,
## rolls/buns} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [1058] {roll_products_,
## whole_milk} => {rolls/buns} 0.001525165 0.3260870 0.004677173 1.7728387 15
## [1059] {other_vegetables,
## roll_products_} => {whole_milk} 0.002338587 0.4893617 0.004778851 1.9151899 23
## [1060] {roll_products_,
## whole_milk} => {other_vegetables} 0.002338587 0.5000000 0.004677173 2.5840778 23
## [1061] {frozen_fish,
## frozen_vegetables} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [1062] {frozen_fish,
## other_vegetables} => {frozen_vegetables} 0.001016777 0.2173913 0.004677173 4.5201765 10
## [1063] {frozen_fish,
## frozen_vegetables} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [1064] {frozen_fish,
## whole_milk} => {frozen_vegetables} 0.001016777 0.2040816 0.004982206 4.2434310 10
## [1065] {frozen_fish,
## pork} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [1066] {frozen_fish,
## whole_milk} => {pork} 0.001220132 0.2448980 0.004982206 4.2479214 12
## [1067] {frankfurter,
## frozen_fish} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [1068] {frozen_fish,
## whole_milk} => {frankfurter} 0.001118454 0.2244898 0.004982206 3.8066502 11
## [1069] {domestic_eggs,
## frozen_fish} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [1070] {frozen_fish,
## whole_milk} => {domestic_eggs} 0.001016777 0.2040816 0.004982206 3.2165751 10
## [1071] {frozen_fish,
## pip_fruit} => {tropical_fruit} 0.001220132 0.5714286 0.002135231 5.4457364 12
## [1072] {frozen_fish,
## tropical_fruit} => {pip_fruit} 0.001220132 0.4800000 0.002541942 6.3451613 12
## [1073] {frozen_fish,
## pip_fruit} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [1074] {frozen_fish,
## yogurt} => {pip_fruit} 0.001016777 0.3125000 0.003253686 4.1309644 10
## [1075] {frozen_fish,
## pip_fruit} => {other_vegetables} 0.001423488 0.6666667 0.002135231 3.4454370 14
## [1076] {frozen_fish,
## other_vegetables} => {pip_fruit} 0.001423488 0.3043478 0.004677173 4.0232001 14
## [1077] {frozen_fish,
## pip_fruit} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [1078] {frozen_fish,
## whole_milk} => {pip_fruit} 0.001321810 0.2653061 0.004982206 3.5071045 13
## [1079] {frozen_fish,
## tropical_fruit} => {yogurt} 0.001118454 0.4400000 0.002541942 3.1540816 11
## [1080] {frozen_fish,
## yogurt} => {tropical_fruit} 0.001118454 0.3437500 0.003253686 3.2759508 11
## [1081] {frozen_fish,
## tropical_fruit} => {other_vegetables} 0.001525165 0.6000000 0.002541942 3.1008933 15
## [1082] {frozen_fish,
## other_vegetables} => {tropical_fruit} 0.001525165 0.3260870 0.004677173 3.1076213 15
## [1083] {frozen_fish,
## tropical_fruit} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [1084] {frozen_fish,
## whole_milk} => {tropical_fruit} 0.001525165 0.3061224 0.004982206 2.9173588 15
## [1085] {frozen_fish,
## root_vegetables} => {yogurt} 0.001423488 0.5384615 0.002643620 3.8598901 14
## [1086] {frozen_fish,
## yogurt} => {root_vegetables} 0.001423488 0.4375000 0.003253686 4.0138176 14
## [1087] {frozen_fish,
## root_vegetables} => {other_vegetables} 0.001423488 0.5384615 0.002643620 2.7828530 14
## [1088] {frozen_fish,
## other_vegetables} => {root_vegetables} 0.001423488 0.3043478 0.004677173 2.7922210 14
## [1089] {frozen_fish,
## root_vegetables} => {whole_milk} 0.001830198 0.6923077 0.002643620 2.7094493 18
## [1090] {frozen_fish,
## whole_milk} => {root_vegetables} 0.001830198 0.3673469 0.004982206 3.3702026 18
## [1091] {frozen_fish,
## yogurt} => {other_vegetables} 0.001423488 0.4375000 0.003253686 2.2610681 14
## [1092] {frozen_fish,
## other_vegetables} => {yogurt} 0.001423488 0.3043478 0.004677173 2.1816770 14
## [1093] {frozen_fish,
## yogurt} => {whole_milk} 0.002236909 0.6875000 0.003253686 2.6906337 22
## [1094] {frozen_fish,
## whole_milk} => {yogurt} 0.002236909 0.4489796 0.004982206 3.2184506 22
## [1095] {frozen_fish,
## rolls/buns} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [1096] {frozen_fish,
## other_vegetables} => {rolls/buns} 0.001118454 0.2391304 0.004677173 1.3000817 11
## [1097] {frozen_fish,
## rolls/buns} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [1098] {frozen_fish,
## whole_milk} => {rolls/buns} 0.001118454 0.2244898 0.004982206 1.2204849 11
## [1099] {frozen_fish,
## other_vegetables} => {whole_milk} 0.002745297 0.5869565 0.004677173 2.2971418 27
## [1100] {frozen_fish,
## whole_milk} => {other_vegetables} 0.002745297 0.5510204 0.004982206 2.8477592 27
## [1101] {cake_bar,
## pastry} => {soda} 0.001016777 0.5000000 0.002033554 2.8673469 10
## [1102] {cake_bar,
## soda} => {pastry} 0.001016777 0.2272727 0.004473818 2.5545455 10
## [1103] {cake_bar,
## pastry} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [1104] {cake_bar,
## whole_milk} => {pastry} 0.001220132 0.2181818 0.005592272 2.4523636 12
## [1105] {cake_bar,
## shopping_bags} => {whole_milk} 0.001016777 0.3448276 0.002948653 1.3495341 10
## [1106] {cake_bar,
## sausage} => {rolls/buns} 0.001016777 0.4761905 0.002135231 2.5889073 10
## [1107] {cake_bar,
## rolls/buns} => {sausage} 0.001016777 0.3225806 0.003152008 3.4335288 10
## [1108] {cake_bar,
## sausage} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [1109] {cake_bar,
## whole_milk} => {sausage} 0.001118454 0.2000000 0.005592272 2.1287879 11
## [1110] {bottled_water,
## cake_bar} => {soda} 0.001016777 0.5555556 0.001830198 3.1859410 10
## [1111] {cake_bar,
## soda} => {bottled_water} 0.001016777 0.2272727 0.004473818 2.0563268 10
## [1112] {cake_bar,
## tropical_fruit} => {whole_milk} 0.001423488 0.7368421 0.001931876 2.8837414 14
## [1113] {cake_bar,
## whole_milk} => {tropical_fruit} 0.001423488 0.2545455 0.005592272 2.4258280 14
## [1114] {cake_bar,
## root_vegetables} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [1115] {cake_bar,
## other_vegetables} => {root_vegetables} 0.001016777 0.2702703 0.003762074 2.4795785 10
## [1116] {cake_bar,
## soda} => {rolls/buns} 0.001321810 0.2954545 0.004473818 1.6062993 13
## [1117] {cake_bar,
## rolls/buns} => {soda} 0.001321810 0.4193548 0.003152008 2.4048716 13
## [1118] {cake_bar,
## soda} => {whole_milk} 0.001626843 0.3636364 0.004473818 1.4231451 16
## [1119] {cake_bar,
## whole_milk} => {soda} 0.001626843 0.2909091 0.005592272 1.6682746 16
## [1120] {cake_bar,
## yogurt} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [1121] {cake_bar,
## other_vegetables} => {yogurt} 0.001016777 0.2702703 0.003762074 1.9373966 10
## [1122] {cake_bar,
## yogurt} => {whole_milk} 0.001220132 0.5000000 0.002440264 1.9568245 12
## [1123] {cake_bar,
## whole_milk} => {yogurt} 0.001220132 0.2181818 0.005592272 1.5640074 12
## [1124] {cake_bar,
## rolls/buns} => {other_vegetables} 0.001525165 0.4838710 0.003152008 2.5007204 15
## [1125] {cake_bar,
## other_vegetables} => {rolls/buns} 0.001525165 0.4054054 0.003762074 2.2040697 15
## [1126] {cake_bar,
## rolls/buns} => {whole_milk} 0.001728521 0.5483871 0.003152008 2.1461946 17
## [1127] {cake_bar,
## whole_milk} => {rolls/buns} 0.001728521 0.3090909 0.005592272 1.6804362 17
## [1128] {cake_bar,
## other_vegetables} => {whole_milk} 0.002033554 0.5405405 0.003762074 2.1154860 20
## [1129] {cake_bar,
## whole_milk} => {other_vegetables} 0.002033554 0.3636364 0.005592272 1.8793293 20
## [1130] {seasonal_products,
## tropical_fruit} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [1131] {other_vegetables,
## seasonal_products} => {tropical_fruit} 0.001016777 0.2777778 0.003660397 2.6472330 10
## [1132] {seasonal_products,
## soda} => {whole_milk} 0.001016777 0.3846154 0.002643620 1.5052496 10
## [1133] {seasonal_products,
## whole_milk} => {soda} 0.001016777 0.2702703 0.003762074 1.5499173 10
## [1134] {seasonal_products,
## yogurt} => {rolls/buns} 0.001220132 0.3750000 0.003253686 2.0387645 12
## [1135] {rolls/buns,
## seasonal_products} => {yogurt} 0.001220132 0.4444444 0.002745297 3.1859410 12
## [1136] {seasonal_products,
## yogurt} => {other_vegetables} 0.001220132 0.3750000 0.003253686 1.9380583 12
## [1137] {other_vegetables,
## seasonal_products} => {yogurt} 0.001220132 0.3333333 0.003660397 2.3894558 12
## [1138] {seasonal_products,
## yogurt} => {whole_milk} 0.001321810 0.4062500 0.003253686 1.5899199 13
## [1139] {seasonal_products,
## whole_milk} => {yogurt} 0.001321810 0.3513514 0.003762074 2.5186156 13
## [1140] {rolls/buns,
## seasonal_products} => {whole_milk} 0.001016777 0.3703704 0.002745297 1.4494996 10
## [1141] {seasonal_products,
## whole_milk} => {rolls/buns} 0.001016777 0.2702703 0.003762074 1.4693798 10
## [1142] {other_vegetables,
## seasonal_products} => {whole_milk} 0.001931876 0.5277778 0.003660397 2.0655370 19
## [1143] {seasonal_products,
## whole_milk} => {other_vegetables} 0.001931876 0.5135135 0.003762074 2.6539177 19
## [1144] {dishes,
## napkins} => {rolls/buns} 0.001118454 0.4074074 0.002745297 2.2149540 11
## [1145] {dishes,
## rolls/buns} => {napkins} 0.001118454 0.3437500 0.003253686 6.5646238 11
## [1146] {dishes,
## napkins} => {other_vegetables} 0.001016777 0.3703704 0.002745297 1.9141317 10
## [1147] {dishes,
## napkins} => {whole_milk} 0.001118454 0.4074074 0.002745297 1.5944496 11
## [1148] {dishes,
## whole_milk} => {napkins} 0.001118454 0.2115385 0.005287239 4.0397685 11
## [1149] {dishes,
## pork} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [1150] {butter,
## dishes} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [1151] {dishes,
## whole_milk} => {butter} 0.001118454 0.2115385 0.005287239 3.8173959 11
## [1152] {dishes,
## domestic_eggs} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [1153] {dishes,
## pastry} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [1154] {dishes,
## other_vegetables} => {pastry} 0.001220132 0.2033898 0.005998983 2.2861017 12
## [1155] {citrus_fruit,
## dishes} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [1156] {bottled_water,
## dishes} => {rolls/buns} 0.001016777 0.4761905 0.002135231 2.5889073 10
## [1157] {dishes,
## rolls/buns} => {bottled_water} 0.001016777 0.3125000 0.003253686 2.8274494 10
## [1158] {bottled_water,
## dishes} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [1159] {dishes,
## tropical_fruit} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [1160] {dishes,
## root_vegetables} => {other_vegetables} 0.001728521 0.6296296 0.002745297 3.2540239 17
## [1161] {dishes,
## other_vegetables} => {root_vegetables} 0.001728521 0.2881356 0.005998983 2.6434828 17
## [1162] {dishes,
## root_vegetables} => {whole_milk} 0.001220132 0.4444444 0.002745297 1.7393996 12
## [1163] {dishes,
## whole_milk} => {root_vegetables} 0.001220132 0.2307692 0.005287239 2.1171785 12
## [1164] {dishes,
## soda} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [1165] {dishes,
## other_vegetables} => {soda} 0.001321810 0.2203390 0.005998983 1.2635766 13
## [1166] {dishes,
## soda} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [1167] {dishes,
## whole_milk} => {soda} 0.001118454 0.2115385 0.005287239 1.2131083 11
## [1168] {dishes,
## yogurt} => {other_vegetables} 0.001423488 0.3783784 0.003762074 1.9555183 14
## [1169] {dishes,
## other_vegetables} => {yogurt} 0.001423488 0.2372881 0.005998983 1.7009685 14
## [1170] {dishes,
## yogurt} => {whole_milk} 0.001321810 0.3513514 0.003762074 1.3750659 13
## [1171] {dishes,
## whole_milk} => {yogurt} 0.001321810 0.2500000 0.005287239 1.7920918 13
## [1172] {dishes,
## rolls/buns} => {other_vegetables} 0.001423488 0.4375000 0.003253686 2.2610681 14
## [1173] {dishes,
## other_vegetables} => {rolls/buns} 0.001423488 0.2372881 0.005998983 1.2900657 14
## [1174] {dishes,
## rolls/buns} => {whole_milk} 0.001321810 0.4062500 0.003253686 1.5899199 13
## [1175] {dishes,
## whole_milk} => {rolls/buns} 0.001321810 0.2500000 0.005287239 1.3591763 13
## [1176] {dishes,
## other_vegetables} => {whole_milk} 0.002643620 0.4406780 0.005998983 1.7246589 26
## [1177] {dishes,
## whole_milk} => {other_vegetables} 0.002643620 0.5000000 0.005287239 2.5840778 26
## [1178] {mustard,
## oil} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [1179] {mustard,
## whole_milk} => {oil} 0.001220132 0.2352941 0.005185562 8.3844842 12
## [1180] {frankfurter,
## mustard} => {rolls/buns} 0.001321810 0.5200000 0.002541942 2.8270868 13
## [1181] {mustard,
## rolls/buns} => {frankfurter} 0.001321810 0.3095238 0.004270463 5.2485632 13
## [1182] {mustard,
## newspapers} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [1183] {mustard,
## whole_milk} => {newspapers} 0.001118454 0.2156863 0.005185562 2.7022605 11
## [1184] {mustard,
## shopping_bags} => {root_vegetables} 0.001016777 0.5000000 0.002033554 4.5872201 10
## [1185] {mustard,
## root_vegetables} => {shopping_bags} 0.001016777 0.3030303 0.003355363 3.0756481 10
## [1186] {mustard,
## sausage} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [1187] {mustard,
## root_vegetables} => {sausage} 0.001016777 0.3030303 0.003355363 3.2254362 10
## [1188] {mustard,
## sausage} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [1189] {mustard,
## other_vegetables} => {sausage} 0.001016777 0.3125000 0.003253686 3.3262311 10
## [1190] {mustard,
## sausage} => {whole_milk} 0.001016777 0.4347826 0.002338587 1.7015865 10
## [1191] {bottled_water,
## mustard} => {whole_milk} 0.001525165 0.7500000 0.002033554 2.9352368 15
## [1192] {mustard,
## whole_milk} => {bottled_water} 0.001525165 0.2941176 0.005185562 2.6611288 15
## [1193] {mustard,
## tropical_fruit} => {root_vegetables} 0.001016777 0.3846154 0.002643620 3.5286309 10
## [1194] {mustard,
## root_vegetables} => {tropical_fruit} 0.001016777 0.3030303 0.003355363 2.8878905 10
## [1195] {mustard,
## tropical_fruit} => {other_vegetables} 0.001220132 0.4615385 0.002643620 2.3853026 12
## [1196] {mustard,
## other_vegetables} => {tropical_fruit} 0.001220132 0.3750000 0.003253686 3.5737645 12
## [1197] {mustard,
## tropical_fruit} => {whole_milk} 0.001423488 0.5384615 0.002643620 2.1073495 14
## [1198] {mustard,
## whole_milk} => {tropical_fruit} 0.001423488 0.2745098 0.005185562 2.6160891 14
## [1199] {mustard,
## root_vegetables} => {rolls/buns} 0.001321810 0.3939394 0.003355363 2.1417324 13
## [1200] {mustard,
## rolls/buns} => {root_vegetables} 0.001321810 0.3095238 0.004270463 2.8397077 13
## [1201] {mustard,
## root_vegetables} => {other_vegetables} 0.001525165 0.4545455 0.003355363 2.3491616 15
## [1202] {mustard,
## other_vegetables} => {root_vegetables} 0.001525165 0.4687500 0.003253686 4.3005189 15
## [1203] {mustard,
## root_vegetables} => {whole_milk} 0.001626843 0.4848485 0.003355363 1.8975268 16
## [1204] {mustard,
## whole_milk} => {root_vegetables} 0.001626843 0.3137255 0.005185562 2.8782558 16
## [1205] {mustard,
## yogurt} => {rolls/buns} 0.001118454 0.4782609 0.002338587 2.6001634 11
## [1206] {mustard,
## rolls/buns} => {yogurt} 0.001118454 0.2619048 0.004270463 1.8774295 11
## [1207] {mustard,
## yogurt} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [1208] {mustard,
## other_vegetables} => {yogurt} 0.001118454 0.3437500 0.003253686 2.4641263 11
## [1209] {mustard,
## yogurt} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [1210] {mustard,
## whole_milk} => {yogurt} 0.001423488 0.2745098 0.005185562 1.9677871 14
## [1211] {mustard,
## rolls/buns} => {other_vegetables} 0.001220132 0.2857143 0.004270463 1.4766159 12
## [1212] {mustard,
## other_vegetables} => {rolls/buns} 0.001220132 0.3750000 0.003253686 2.0387645 12
## [1213] {mustard,
## rolls/buns} => {whole_milk} 0.001423488 0.3333333 0.004270463 1.3045497 14
## [1214] {mustard,
## whole_milk} => {rolls/buns} 0.001423488 0.2745098 0.005185562 1.4924289 14
## [1215] {mustard,
## other_vegetables} => {whole_milk} 0.001525165 0.4687500 0.003253686 1.8345230 15
## [1216] {mustard,
## whole_milk} => {other_vegetables} 0.001525165 0.2941176 0.005185562 1.5200457 15
## [1217] {bottled_beer,
## red/blush_wine} => {soda} 0.001626843 0.3333333 0.004880529 1.9115646 16
## [1218] {red/blush_wine,
## soda} => {bottled_beer} 0.001626843 0.3555556 0.004575496 4.4152637 16
## [1219] {bottled_beer,
## red/blush_wine} => {other_vegetables} 0.001525165 0.3125000 0.004880529 1.6150486 15
## [1220] {other_vegetables,
## red/blush_wine} => {bottled_beer} 0.001525165 0.3061224 0.004982206 3.8014069 15
## [1221] {fruit/vegetable_juice,
## red/blush_wine} => {shopping_bags} 0.001016777 0.5555556 0.001830198 5.6386882 10
## [1222] {red/blush_wine,
## shopping_bags} => {fruit/vegetable_juice} 0.001016777 0.3846154 0.002643620 5.3202423 10
## [1223] {bottled_water,
## red/blush_wine} => {soda} 0.001118454 0.3437500 0.003253686 1.9713010 11
## [1224] {red/blush_wine,
## soda} => {bottled_water} 0.001118454 0.2444444 0.004575496 2.2116938 11
## [1225] {bottled_water,
## red/blush_wine} => {rolls/buns} 0.001321810 0.4062500 0.003253686 2.2086616 13
## [1226] {red/blush_wine,
## rolls/buns} => {bottled_water} 0.001321810 0.3333333 0.003965430 3.0159460 13
## [1227] {bottled_water,
## red/blush_wine} => {other_vegetables} 0.001321810 0.4062500 0.003253686 2.0995632 13
## [1228] {other_vegetables,
## red/blush_wine} => {bottled_water} 0.001321810 0.2653061 0.004982206 2.4004468 13
## [1229] {red/blush_wine,
## tropical_fruit} => {whole_milk} 0.001321810 0.5200000 0.002541942 2.0350975 13
## [1230] {red/blush_wine,
## whole_milk} => {tropical_fruit} 0.001321810 0.3333333 0.003965430 3.1766796 13
## [1231] {red/blush_wine,
## root_vegetables} => {soda} 0.001118454 0.4400000 0.002541942 2.5232653 11
## [1232] {red/blush_wine,
## soda} => {root_vegetables} 0.001118454 0.2444444 0.004575496 2.2426410 11
## [1233] {red/blush_wine,
## root_vegetables} => {other_vegetables} 0.001423488 0.5600000 0.002541942 2.8941671 14
## [1234] {other_vegetables,
## red/blush_wine} => {root_vegetables} 0.001423488 0.2857143 0.004982206 2.6212687 14
## [1235] {red/blush_wine,
## soda} => {rolls/buns} 0.001220132 0.2666667 0.004575496 1.4497881 12
## [1236] {red/blush_wine,
## rolls/buns} => {soda} 0.001220132 0.3076923 0.003965430 1.7645212 12
## [1237] {red/blush_wine,
## soda} => {other_vegetables} 0.001220132 0.2666667 0.004575496 1.3781748 12
## [1238] {other_vegetables,
## red/blush_wine} => {soda} 0.001220132 0.2448980 0.004982206 1.4044148 12
## [1239] {red/blush_wine,
## soda} => {whole_milk} 0.001423488 0.3111111 0.004575496 1.2175797 14
## [1240] {red/blush_wine,
## whole_milk} => {soda} 0.001423488 0.3589744 0.003965430 2.0586081 14
## [1241] {red/blush_wine,
## yogurt} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [1242] {other_vegetables,
## red/blush_wine} => {yogurt} 0.001016777 0.2040816 0.004982206 1.4629321 10
## [1243] {red/blush_wine,
## yogurt} => {whole_milk} 0.001016777 0.4166667 0.002440264 1.6306871 10
## [1244] {red/blush_wine,
## whole_milk} => {yogurt} 0.001016777 0.2564103 0.003965430 1.8380429 10
## [1245] {red/blush_wine,
## rolls/buns} => {other_vegetables} 0.001220132 0.3076923 0.003965430 1.5902017 12
## [1246] {other_vegetables,
## red/blush_wine} => {rolls/buns} 0.001220132 0.2448980 0.004982206 1.3314380 12
## [1247] {other_vegetables,
## red/blush_wine} => {whole_milk} 0.001830198 0.3673469 0.004982206 1.4376670 18
## [1248] {red/blush_wine,
## whole_milk} => {other_vegetables} 0.001830198 0.4615385 0.003965430 2.3853026 18
## [1249] {bottled_beer,
## pot_plants} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [1250] {brown_bread,
## pot_plants} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [1251] {butter,
## pot_plants} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [1252] {fruit/vegetable_juice,
## pot_plants} => {whole_milk} 0.001220132 0.4800000 0.002541942 1.8785515 12
## [1253] {pot_plants,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [1254] {pip_fruit,
## pot_plants} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [1255] {pastry,
## pot_plants} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [1256] {citrus_fruit,
## pot_plants} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [1257] {other_vegetables,
## pot_plants} => {citrus_fruit} 0.001016777 0.2325581 0.004372140 2.8098394 10
## [1258] {citrus_fruit,
## pot_plants} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [1259] {bottled_water,
## pot_plants} => {soda} 0.001016777 0.4000000 0.002541942 2.2938776 10
## [1260] {pot_plants,
## soda} => {bottled_water} 0.001016777 0.3703704 0.002745297 3.3510511 10
## [1261] {bottled_water,
## pot_plants} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [1262] {pot_plants,
## whole_milk} => {bottled_water} 0.001525165 0.2205882 0.006914082 1.9958466 15
## [1263] {pot_plants,
## tropical_fruit} => {yogurt} 0.001118454 0.3666667 0.003050330 2.6284014 11
## [1264] {pot_plants,
## yogurt} => {tropical_fruit} 0.001118454 0.2894737 0.003863752 2.7586954 11
## [1265] {pot_plants,
## tropical_fruit} => {other_vegetables} 0.001728521 0.5666667 0.003050330 2.9286215 17
## [1266] {other_vegetables,
## pot_plants} => {tropical_fruit} 0.001728521 0.3953488 0.004372140 3.7676897 17
## [1267] {pot_plants,
## tropical_fruit} => {whole_milk} 0.001931876 0.6333333 0.003050330 2.4786444 19
## [1268] {pot_plants,
## whole_milk} => {tropical_fruit} 0.001931876 0.2794118 0.006914082 2.6628049 19
## [1269] {pot_plants,
## soda} => {whole_milk} 0.001525165 0.5555556 0.002745297 2.1742495 15
## [1270] {pot_plants,
## whole_milk} => {soda} 0.001525165 0.2205882 0.006914082 1.2650060 15
## [1271] {pot_plants,
## yogurt} => {other_vegetables} 0.001220132 0.3157895 0.003863752 1.6320491 12
## [1272] {other_vegetables,
## pot_plants} => {yogurt} 0.001220132 0.2790698 0.004372140 2.0004746 12
## [1273] {pot_plants,
## yogurt} => {whole_milk} 0.002033554 0.5263158 0.003863752 2.0598153 20
## [1274] {pot_plants,
## whole_milk} => {yogurt} 0.002033554 0.2941176 0.006914082 2.1083433 20
## [1275] {pot_plants,
## rolls/buns} => {whole_milk} 0.001728521 0.6071429 0.002846975 2.3761441 17
## [1276] {pot_plants,
## whole_milk} => {rolls/buns} 0.001728521 0.2500000 0.006914082 1.3591763 17
## [1277] {other_vegetables,
## pot_plants} => {whole_milk} 0.002440264 0.5581395 0.004372140 2.1843622 24
## [1278] {pot_plants,
## whole_milk} => {other_vegetables} 0.002440264 0.3529412 0.006914082 1.8240549 24
## [1279] {chewing_gum,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [1280] {chewing_gum,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2000000 0.005083884 2.7900709 10
## [1281] {chewing_gum,
## pip_fruit} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [1282] {chewing_gum,
## whole_milk} => {pip_fruit} 0.001016777 0.2000000 0.005083884 2.6438172 10
## [1283] {chewing_gum,
## shopping_bags} => {soda} 0.001626843 0.5000000 0.003253686 2.8673469 16
## [1284] {chewing_gum,
## soda} => {shopping_bags} 0.001626843 0.3018868 0.005388917 3.0640419 16
## [1285] {chewing_gum,
## sausage} => {soda} 0.001118454 0.4583333 0.002440264 2.6284014 11
## [1286] {chewing_gum,
## soda} => {sausage} 0.001118454 0.2075472 0.005388917 2.2091195 11
## [1287] {bottled_water,
## chewing_gum} => {soda} 0.001220132 0.4444444 0.002745297 2.5487528 12
## [1288] {chewing_gum,
## soda} => {bottled_water} 0.001220132 0.2264151 0.005388917 2.0485671 12
## [1289] {chewing_gum,
## tropical_fruit} => {other_vegetables} 0.001016777 0.4000000 0.002541942 2.0672622 10
## [1290] {chewing_gum,
## other_vegetables} => {tropical_fruit} 0.001016777 0.2222222 0.004575496 2.1177864 10
## [1291] {chewing_gum,
## tropical_fruit} => {whole_milk} 0.001321810 0.5200000 0.002541942 2.0350975 13
## [1292] {chewing_gum,
## whole_milk} => {tropical_fruit} 0.001321810 0.2600000 0.005083884 2.4778101 13
## [1293] {chewing_gum,
## root_vegetables} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [1294] {chewing_gum,
## other_vegetables} => {root_vegetables} 0.001118454 0.2444444 0.004575496 2.2426410 11
## [1295] {chewing_gum,
## soda} => {rolls/buns} 0.001321810 0.2452830 0.005388917 1.3335315 13
## [1296] {chewing_gum,
## rolls/buns} => {soda} 0.001321810 0.3421053 0.003863752 1.9618690 13
## [1297] {chewing_gum,
## soda} => {whole_milk} 0.001220132 0.2264151 0.005388917 0.8861092 12
## [1298] {chewing_gum,
## whole_milk} => {soda} 0.001220132 0.2400000 0.005083884 1.3763265 12
## [1299] {chewing_gum,
## yogurt} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [1300] {chewing_gum,
## other_vegetables} => {yogurt} 0.001016777 0.2222222 0.004575496 1.5929705 10
## [1301] {chewing_gum,
## yogurt} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [1302] {chewing_gum,
## whole_milk} => {yogurt} 0.001118454 0.2200000 0.005083884 1.5770408 11
## [1303] {chewing_gum,
## other_vegetables} => {whole_milk} 0.001626843 0.3555556 0.004575496 1.3915197 16
## [1304] {chewing_gum,
## whole_milk} => {other_vegetables} 0.001626843 0.3200000 0.005083884 1.6538098 16
## [1305] {canned_fish,
## hygiene_articles} => {whole_milk} 0.001118454 1.0000000 0.001118454 3.9136490 11
## [1306] {canned_fish,
## whole_milk} => {hygiene_articles} 0.001118454 0.2340426 0.004778851 7.1043473 11
## [1307] {canned_fish,
## coffee} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [1308] {canned_fish,
## other_vegetables} => {coffee} 0.001016777 0.2000000 0.005083884 3.4448336 10
## [1309] {canned_fish,
## frozen_vegetables} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [1310] {canned_fish,
## other_vegetables} => {frozen_vegetables} 0.001118454 0.2200000 0.005083884 4.5744186 11
## [1311] {bottled_beer,
## canned_fish} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [1312] {canned_fish,
## whole_milk} => {bottled_beer} 0.001118454 0.2340426 0.004778851 2.9063239 11
## [1313] {canned_fish,
## pastry} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [1314] {canned_fish,
## whole_milk} => {pastry} 0.001016777 0.2127660 0.004778851 2.3914894 10
## [1315] {canned_fish,
## shopping_bags} => {soda} 0.001118454 0.3793103 0.002948653 2.1752287 11
## [1316] {canned_fish,
## soda} => {shopping_bags} 0.001118454 0.3793103 0.002948653 3.8498630 11
## [1317] {canned_fish,
## shopping_bags} => {rolls/buns} 0.001016777 0.3448276 0.002948653 1.8747260 10
## [1318] {canned_fish,
## rolls/buns} => {shopping_bags} 0.001016777 0.2500000 0.004067107 2.5374097 10
## [1319] {canned_fish,
## shopping_bags} => {other_vegetables} 0.001423488 0.4827586 0.002948653 2.4949716 14
## [1320] {canned_fish,
## other_vegetables} => {shopping_bags} 0.001423488 0.2800000 0.005083884 2.8418989 14
## [1321] {canned_fish,
## tropical_fruit} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [1322] {canned_fish,
## other_vegetables} => {tropical_fruit} 0.001118454 0.2200000 0.005083884 2.0966085 11
## [1323] {canned_fish,
## tropical_fruit} => {whole_milk} 0.001016777 0.4166667 0.002440264 1.6306871 10
## [1324] {canned_fish,
## whole_milk} => {tropical_fruit} 0.001016777 0.2127660 0.004778851 2.0276678 10
## [1325] {canned_fish,
## root_vegetables} => {other_vegetables} 0.001525165 0.5769231 0.002643620 2.9816282 15
## [1326] {canned_fish,
## other_vegetables} => {root_vegetables} 0.001525165 0.3000000 0.005083884 2.7523321 15
## [1327] {canned_fish,
## root_vegetables} => {whole_milk} 0.001016777 0.3846154 0.002643620 1.5052496 10
## [1328] {canned_fish,
## whole_milk} => {root_vegetables} 0.001016777 0.2127660 0.004778851 1.9520086 10
## [1329] {canned_fish,
## soda} => {whole_milk} 0.001220132 0.4137931 0.002948653 1.6194410 12
## [1330] {canned_fish,
## whole_milk} => {soda} 0.001220132 0.2553191 0.004778851 1.4641772 12
## [1331] {canned_fish,
## yogurt} => {rolls/buns} 0.001016777 0.3125000 0.003253686 1.6989704 10
## [1332] {canned_fish,
## rolls/buns} => {yogurt} 0.001016777 0.2500000 0.004067107 1.7920918 10
## [1333] {canned_fish,
## yogurt} => {other_vegetables} 0.001220132 0.3750000 0.003253686 1.9380583 12
## [1334] {canned_fish,
## other_vegetables} => {yogurt} 0.001220132 0.2400000 0.005083884 1.7204082 12
## [1335] {canned_fish,
## yogurt} => {whole_milk} 0.001626843 0.5000000 0.003253686 1.9568245 16
## [1336] {canned_fish,
## whole_milk} => {yogurt} 0.001626843 0.3404255 0.004778851 2.4402953 16
## [1337] {canned_fish,
## rolls/buns} => {other_vegetables} 0.001423488 0.3500000 0.004067107 1.8088544 14
## [1338] {canned_fish,
## other_vegetables} => {rolls/buns} 0.001423488 0.2800000 0.005083884 1.5222775 14
## [1339] {canned_fish,
## other_vegetables} => {whole_milk} 0.001830198 0.3600000 0.005083884 1.4089136 18
## [1340] {canned_fish,
## whole_milk} => {other_vegetables} 0.001830198 0.3829787 0.004778851 1.9792936 18
## [1341] {hamburger_meat,
## pasta} => {whole_milk} 0.001423488 0.5185185 0.002745297 2.0292995 14
## [1342] {pasta,
## whole_milk} => {hamburger_meat} 0.001423488 0.2333333 0.006100661 7.0178389 14
## [1343] {chicken,
## pasta} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [1344] {other_vegetables,
## pasta} => {chicken} 0.001118454 0.2619048 0.004270463 6.1038705 11
## [1345] {beef,
## pasta} => {root_vegetables} 0.001016777 0.5882353 0.001728521 5.3967296 10
## [1346] {pasta,
## root_vegetables} => {beef} 0.001016777 0.2631579 0.003863752 5.0158099 10
## [1347] {butter,
## pasta} => {root_vegetables} 0.001016777 0.4166667 0.002440264 3.8226835 10
## [1348] {pasta,
## root_vegetables} => {butter} 0.001016777 0.2631579 0.003863752 4.7489136 10
## [1349] {domestic_eggs,
## pasta} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [1350] {fruit/vegetable_juice,
## pasta} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [1351] {pasta,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [1352] {pasta,
## root_vegetables} => {whipped/sour_cream} 0.001016777 0.2631579 0.003863752 3.6711459 10
## [1353] {pasta,
## whipped/sour_cream} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [1354] {pasta,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3548387 0.003152008 4.9501258 11
## [1355] {pasta,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [1356] {other_vegetables,
## pasta} => {whipped/sour_cream} 0.001016777 0.2380952 0.004270463 3.3215130 10
## [1357] {pasta,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [1358] {pasta,
## pip_fruit} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [1359] {other_vegetables,
## pasta} => {pip_fruit} 0.001016777 0.2380952 0.004270463 3.1474014 10
## [1360] {pasta,
## pip_fruit} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [1361] {pasta,
## whole_milk} => {pip_fruit} 0.001321810 0.2166667 0.006100661 2.8641353 13
## [1362] {pasta,
## sausage} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [1363] {pasta,
## tropical_fruit} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [1364] {pasta,
## root_vegetables} => {soda} 0.001118454 0.2894737 0.003863752 1.6600430 11
## [1365] {pasta,
## soda} => {root_vegetables} 0.001118454 0.2750000 0.004067107 2.5229711 11
## [1366] {pasta,
## root_vegetables} => {yogurt} 0.001016777 0.2631579 0.003863752 1.8864125 10
## [1367] {pasta,
## yogurt} => {root_vegetables} 0.001016777 0.3225806 0.003152008 2.9594969 10
## [1368] {pasta,
## root_vegetables} => {other_vegetables} 0.001830198 0.4736842 0.003863752 2.4480737 18
## [1369] {other_vegetables,
## pasta} => {root_vegetables} 0.001830198 0.4285714 0.004270463 3.9319030 18
## [1370] {pasta,
## root_vegetables} => {whole_milk} 0.002338587 0.6052632 0.003863752 2.3687876 23
## [1371] {pasta,
## whole_milk} => {root_vegetables} 0.002338587 0.3833333 0.006100661 3.5168688 23
## [1372] {pasta,
## soda} => {yogurt} 0.001118454 0.2750000 0.004067107 1.9713010 11
## [1373] {pasta,
## yogurt} => {soda} 0.001118454 0.3548387 0.003152008 2.0348914 11
## [1374] {pasta,
## soda} => {other_vegetables} 0.001118454 0.2750000 0.004067107 1.4212428 11
## [1375] {other_vegetables,
## pasta} => {soda} 0.001118454 0.2619048 0.004270463 1.5019436 11
## [1376] {pasta,
## soda} => {whole_milk} 0.001525165 0.3750000 0.004067107 1.4676184 15
## [1377] {pasta,
## whole_milk} => {soda} 0.001525165 0.2500000 0.006100661 1.4336735 15
## [1378] {pasta,
## yogurt} => {other_vegetables} 0.001118454 0.3548387 0.003152008 1.8338616 11
## [1379] {other_vegetables,
## pasta} => {yogurt} 0.001118454 0.2619048 0.004270463 1.8774295 11
## [1380] {pasta,
## yogurt} => {whole_milk} 0.001830198 0.5806452 0.003152008 2.2724414 18
## [1381] {pasta,
## whole_milk} => {yogurt} 0.001830198 0.3000000 0.006100661 2.1505102 18
## [1382] {pasta,
## rolls/buns} => {whole_milk} 0.001423488 0.5833333 0.002440264 2.2829619 14
## [1383] {pasta,
## whole_milk} => {rolls/buns} 0.001423488 0.2333333 0.006100661 1.2685646 14
## [1384] {other_vegetables,
## pasta} => {whole_milk} 0.002135231 0.5000000 0.004270463 1.9568245 21
## [1385] {pasta,
## whole_milk} => {other_vegetables} 0.002135231 0.3500000 0.006100661 1.8088544 21
## [1386] {hamburger_meat,
## herbs} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [1387] {chicken,
## herbs} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [1388] {frozen_vegetables,
## herbs} => {root_vegetables} 0.001423488 0.5600000 0.002541942 5.1376866 14
## [1389] {herbs,
## root_vegetables} => {frozen_vegetables} 0.001423488 0.2028986 0.007015760 4.2188314 14
## [1390] {frozen_vegetables,
## herbs} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [1391] {beef,
## herbs} => {root_vegetables} 0.001525165 0.5357143 0.002846975 4.9148787 15
## [1392] {herbs,
## root_vegetables} => {beef} 0.001525165 0.2173913 0.007015760 4.1434951 15
## [1393] {beef,
## herbs} => {rolls/buns} 0.001016777 0.3571429 0.002846975 1.9416805 10
## [1394] {herbs,
## rolls/buns} => {beef} 0.001016777 0.3333333 0.003050330 6.3533592 10
## [1395] {beef,
## herbs} => {other_vegetables} 0.001220132 0.4285714 0.002846975 2.2149238 12
## [1396] {beef,
## herbs} => {whole_milk} 0.001626843 0.5714286 0.002846975 2.2363709 16
## [1397] {herbs,
## whole_milk} => {beef} 0.001626843 0.2105263 0.007727504 4.0126479 16
## [1398] {curd,
## herbs} => {root_vegetables} 0.001423488 0.5833333 0.002440264 5.3517568 14
## [1399] {herbs,
## root_vegetables} => {curd} 0.001423488 0.2028986 0.007015760 3.8082199 14
## [1400] {curd,
## herbs} => {other_vegetables} 0.001321810 0.5416667 0.002440264 2.7994176 13
## [1401] {curd,
## herbs} => {whole_milk} 0.001830198 0.7500000 0.002440264 2.9352368 18
## [1402] {herbs,
## whole_milk} => {curd} 0.001830198 0.2368421 0.007727504 4.4453094 18
## [1403] {herbs,
## pork} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [1404] {herbs,
## pork} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [1405] {bottled_beer,
## herbs} => {bottled_water} 0.001220132 0.6315789 0.001931876 5.7144241 12
## [1406] {bottled_water,
## herbs} => {bottled_beer} 0.001220132 0.4000000 0.003050330 4.9671717 12
## [1407] {bottled_beer,
## herbs} => {root_vegetables} 0.001118454 0.5789474 0.001931876 5.3115181 11
## [1408] {bottled_beer,
## herbs} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [1409] {bottled_beer,
## herbs} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [1410] {brown_bread,
## herbs} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [1411] {herbs,
## margarine} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [1412] {herbs,
## margarine} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [1413] {butter,
## herbs} => {citrus_fruit} 0.001118454 0.4074074 0.002745297 4.9224224 11
## [1414] {citrus_fruit,
## herbs} => {butter} 0.001118454 0.3793103 0.002948653 6.8449858 11
## [1415] {butter,
## herbs} => {bottled_water} 0.001016777 0.3703704 0.002745297 3.3510511 10
## [1416] {bottled_water,
## herbs} => {butter} 0.001016777 0.3333333 0.003050330 6.0152905 10
## [1417] {butter,
## herbs} => {root_vegetables} 0.001321810 0.4814815 0.002745297 4.4173231 13
## [1418] {butter,
## herbs} => {rolls/buns} 0.001016777 0.3703704 0.002745297 2.0135946 10
## [1419] {herbs,
## rolls/buns} => {butter} 0.001016777 0.3333333 0.003050330 6.0152905 10
## [1420] {butter,
## herbs} => {other_vegetables} 0.001525165 0.5555556 0.002745297 2.8711975 15
## [1421] {butter,
## herbs} => {whole_milk} 0.001626843 0.5925926 0.002745297 2.3191994 16
## [1422] {herbs,
## whole_milk} => {butter} 0.001626843 0.2105263 0.007727504 3.7991309 16
## [1423] {domestic_eggs,
## herbs} => {root_vegetables} 0.001118454 0.5238095 0.002135231 4.8056592 11
## [1424] {domestic_eggs,
## herbs} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [1425] {domestic_eggs,
## herbs} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [1426] {fruit/vegetable_juice,
## herbs} => {other_vegetables} 0.001220132 0.8000000 0.001525165 4.1345244 12
## [1427] {fruit/vegetable_juice,
## herbs} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [1428] {herbs,
## whipped/sour_cream} => {tropical_fruit} 0.001016777 0.3225806 0.003152008 3.0742061 10
## [1429] {herbs,
## tropical_fruit} => {whipped/sour_cream} 0.001016777 0.3571429 0.002846975 4.9822695 10
## [1430] {herbs,
## whipped/sour_cream} => {root_vegetables} 0.001321810 0.4193548 0.003152008 3.8473459 13
## [1431] {herbs,
## whipped/sour_cream} => {yogurt} 0.001220132 0.3870968 0.003152008 2.7748519 12
## [1432] {herbs,
## yogurt} => {whipped/sour_cream} 0.001220132 0.3428571 0.003558719 4.7829787 12
## [1433] {herbs,
## whipped/sour_cream} => {other_vegetables} 0.002033554 0.6451613 0.003152008 3.3342939 20
## [1434] {herbs,
## other_vegetables} => {whipped/sour_cream} 0.002033554 0.2631579 0.007727504 3.6711459 20
## [1435] {herbs,
## whipped/sour_cream} => {whole_milk} 0.001931876 0.6129032 0.003152008 2.3986881 19
## [1436] {herbs,
## whole_milk} => {whipped/sour_cream} 0.001931876 0.2500000 0.007727504 3.4875887 19
## [1437] {herbs,
## pip_fruit} => {root_vegetables} 0.001423488 0.5833333 0.002440264 5.3517568 14
## [1438] {herbs,
## root_vegetables} => {pip_fruit} 0.001423488 0.2028986 0.007015760 2.6821334 14
## [1439] {herbs,
## pip_fruit} => {other_vegetables} 0.001728521 0.7083333 0.002440264 3.6607768 17
## [1440] {herbs,
## other_vegetables} => {pip_fruit} 0.001728521 0.2236842 0.007727504 2.9569008 17
## [1441] {herbs,
## pip_fruit} => {whole_milk} 0.001525165 0.6250000 0.002440264 2.4460306 15
## [1442] {citrus_fruit,
## herbs} => {bottled_water} 0.001321810 0.4482759 0.002948653 4.0559274 13
## [1443] {bottled_water,
## herbs} => {citrus_fruit} 0.001321810 0.4333333 0.003050330 5.2356675 13
## [1444] {citrus_fruit,
## herbs} => {tropical_fruit} 0.001220132 0.4137931 0.002948653 3.9434643 12
## [1445] {herbs,
## tropical_fruit} => {citrus_fruit} 0.001220132 0.4285714 0.002846975 5.1781327 12
## [1446] {citrus_fruit,
## herbs} => {root_vegetables} 0.001626843 0.5517241 0.002948653 5.0617602 16
## [1447] {herbs,
## root_vegetables} => {citrus_fruit} 0.001626843 0.2318841 0.007015760 2.8016950 16
## [1448] {citrus_fruit,
## herbs} => {other_vegetables} 0.002135231 0.7241379 0.002948653 3.7424575 21
## [1449] {herbs,
## other_vegetables} => {citrus_fruit} 0.002135231 0.2763158 0.007727504 3.3385329 21
## [1450] {citrus_fruit,
## herbs} => {whole_milk} 0.001931876 0.6551724 0.002948653 2.5641149 19
## [1451] {herbs,
## whole_milk} => {citrus_fruit} 0.001931876 0.2500000 0.007727504 3.0205774 19
## [1452] {herbs,
## shopping_bags} => {root_vegetables} 0.001321810 0.5652174 0.002338587 5.1855532 13
## [1453] {herbs,
## shopping_bags} => {other_vegetables} 0.001931876 0.8260870 0.002338587 4.2693459 19
## [1454] {herbs,
## other_vegetables} => {shopping_bags} 0.001931876 0.2500000 0.007727504 2.5374097 19
## [1455] {herbs,
## sausage} => {root_vegetables} 0.001016777 0.6666667 0.001525165 6.1162935 10
## [1456] {bottled_water,
## herbs} => {root_vegetables} 0.001626843 0.5333333 0.003050330 4.8930348 16
## [1457] {herbs,
## root_vegetables} => {bottled_water} 0.001626843 0.2318841 0.007015760 2.0980494 16
## [1458] {bottled_water,
## herbs} => {other_vegetables} 0.001423488 0.4666667 0.003050330 2.4118059 14
## [1459] {bottled_water,
## herbs} => {whole_milk} 0.001728521 0.5666667 0.003050330 2.2177344 17
## [1460] {herbs,
## whole_milk} => {bottled_water} 0.001728521 0.2236842 0.007727504 2.0238585 17
## [1461] {herbs,
## tropical_fruit} => {root_vegetables} 0.001728521 0.6071429 0.002846975 5.5701959 17
## [1462] {herbs,
## root_vegetables} => {tropical_fruit} 0.001728521 0.2463768 0.007015760 2.3479806 17
## [1463] {herbs,
## tropical_fruit} => {yogurt} 0.001220132 0.4285714 0.002846975 3.0721574 12
## [1464] {herbs,
## yogurt} => {tropical_fruit} 0.001220132 0.3428571 0.003558719 3.2674419 12
## [1465] {herbs,
## tropical_fruit} => {other_vegetables} 0.001626843 0.5714286 0.002846975 2.9532317 16
## [1466] {herbs,
## other_vegetables} => {tropical_fruit} 0.001626843 0.2105263 0.007727504 2.0063239 16
## [1467] {herbs,
## tropical_fruit} => {whole_milk} 0.002338587 0.8214286 0.002846975 3.2147831 23
## [1468] {herbs,
## whole_milk} => {tropical_fruit} 0.002338587 0.3026316 0.007727504 2.8840907 23
## [1469] {herbs,
## root_vegetables} => {yogurt} 0.002033554 0.2898551 0.007015760 2.0777876 20
## [1470] {herbs,
## yogurt} => {root_vegetables} 0.002033554 0.5714286 0.003558719 5.2425373 20
## [1471] {herbs,
## root_vegetables} => {rolls/buns} 0.001830198 0.2608696 0.007015760 1.4182710 18
## [1472] {herbs,
## rolls/buns} => {root_vegetables} 0.001830198 0.6000000 0.003050330 5.5046642 18
## [1473] {herbs,
## root_vegetables} => {other_vegetables} 0.003863752 0.5507246 0.007015760 2.8462306 38
## [1474] {herbs,
## other_vegetables} => {root_vegetables} 0.003863752 0.5000000 0.007727504 4.5872201 38
## [1475] {herbs,
## root_vegetables} => {whole_milk} 0.004168785 0.5942029 0.007015760 2.3255016 41
## [1476] {herbs,
## whole_milk} => {root_vegetables} 0.004168785 0.5394737 0.007727504 4.9493691 41
## [1477] {herbs,
## yogurt} => {other_vegetables} 0.002033554 0.5714286 0.003558719 2.9532317 20
## [1478] {herbs,
## other_vegetables} => {yogurt} 0.002033554 0.2631579 0.007727504 1.8864125 20
## [1479] {herbs,
## yogurt} => {whole_milk} 0.002135231 0.6000000 0.003558719 2.3481894 21
## [1480] {herbs,
## whole_milk} => {yogurt} 0.002135231 0.2763158 0.007727504 1.9807331 21
## [1481] {herbs,
## rolls/buns} => {other_vegetables} 0.001830198 0.6000000 0.003050330 3.1008933 18
## [1482] {herbs,
## other_vegetables} => {rolls/buns} 0.001830198 0.2368421 0.007727504 1.2876407 18
## [1483] {herbs,
## rolls/buns} => {whole_milk} 0.002440264 0.8000000 0.003050330 3.1309192 24
## [1484] {herbs,
## whole_milk} => {rolls/buns} 0.002440264 0.3157895 0.007727504 1.7168543 24
## [1485] {herbs,
## other_vegetables} => {whole_milk} 0.004067107 0.5263158 0.007727504 2.0598153 40
## [1486] {herbs,
## whole_milk} => {other_vegetables} 0.004067107 0.5263158 0.007727504 2.7200819 40
## [1487] {ham,
## processed_cheese} => {white_bread} 0.001931876 0.6333333 0.003050330 15.0454911 19
## [1488] {processed_cheese,
## white_bread} => {ham} 0.001931876 0.4634146 0.004168785 17.8034489 19
## [1489] {ham,
## white_bread} => {processed_cheese} 0.001931876 0.3800000 0.005083884 22.9282209 19
## [1490] {ham,
## processed_cheese} => {fruit/vegetable_juice} 0.001118454 0.3666667 0.003050330 5.0719644 11
## [1491] {fruit/vegetable_juice,
## processed_cheese} => {ham} 0.001118454 0.3793103 0.002948653 14.5723330 11
## [1492] {fruit/vegetable_juice,
## ham} => {processed_cheese} 0.001118454 0.2894737 0.003863752 17.4660962 11
## [1493] {ham,
## processed_cheese} => {soda} 0.001016777 0.3333333 0.003050330 1.9115646 10
## [1494] {ham,
## soda} => {processed_cheese} 0.001016777 0.2040816 0.004982206 12.3137599 10
## [1495] {ham,
## processed_cheese} => {other_vegetables} 0.001118454 0.3666667 0.003050330 1.8949904 11
## [1496] {other_vegetables,
## processed_cheese} => {ham} 0.001118454 0.2037037 0.005490595 7.8258825 11
## [1497] {ham,
## processed_cheese} => {whole_milk} 0.001525165 0.5000000 0.003050330 1.9568245 15
## [1498] {processed_cheese,
## whole_milk} => {ham} 0.001525165 0.2173913 0.007015760 8.3517323 15
## [1499] {long_life_bakery_product,
## processed_cheese} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [1500] {processed_cheese,
## white_bread} => {domestic_eggs} 0.001118454 0.2682927 0.004168785 4.2286194 11
## [1501] {domestic_eggs,
## processed_cheese} => {white_bread} 0.001118454 0.5238095 0.002135231 12.4436393 11
## [1502] {processed_cheese,
## white_bread} => {fruit/vegetable_juice} 0.001220132 0.2926829 0.004168785 4.0485747 12
## [1503] {fruit/vegetable_juice,
## processed_cheese} => {white_bread} 0.001220132 0.4137931 0.002948653 9.8300850 12
## [1504] {processed_cheese,
## white_bread} => {pip_fruit} 0.001016777 0.2439024 0.004168785 3.2241673 10
## [1505] {pip_fruit,
## processed_cheese} => {white_bread} 0.001016777 0.4347826 0.002338587 10.3287125 10
## [1506] {processed_cheese,
## white_bread} => {tropical_fruit} 0.001525165 0.3658537 0.004168785 3.4865995 15
## [1507] {processed_cheese,
## tropical_fruit} => {white_bread} 0.001525165 0.3571429 0.004270463 8.4842995 15
## [1508] {processed_cheese,
## white_bread} => {soda} 0.001728521 0.4146341 0.004168785 2.3777999 17
## [1509] {processed_cheese,
## soda} => {white_bread} 0.001728521 0.3269231 0.005287239 7.7663973 17
## [1510] {processed_cheese,
## white_bread} => {rolls/buns} 0.001321810 0.3170732 0.004168785 1.7238334 13
## [1511] {processed_cheese,
## rolls/buns} => {white_bread} 0.001321810 0.2826087 0.004677173 6.7136631 13
## [1512] {rolls/buns,
## white_bread} => {processed_cheese} 0.001321810 0.2031250 0.006507372 12.2560391 13
## [1513] {processed_cheese,
## white_bread} => {other_vegetables} 0.001321810 0.3170732 0.004168785 1.6386835 13
## [1514] {other_vegetables,
## processed_cheese} => {white_bread} 0.001321810 0.2407407 0.005490595 5.7190463 13
## [1515] {processed_cheese,
## white_bread} => {whole_milk} 0.002135231 0.5121951 0.004168785 2.0045519 21
## [1516] {processed_cheese,
## whole_milk} => {white_bread} 0.002135231 0.3043478 0.007015760 7.2300987 21
## [1517] {chocolate,
## processed_cheese} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [1518] {frozen_vegetables,
## processed_cheese} => {whole_milk} 0.001423488 0.7777778 0.001830198 3.0439492 14
## [1519] {processed_cheese,
## whole_milk} => {frozen_vegetables} 0.001423488 0.2028986 0.007015760 4.2188314 14
## [1520] {napkins,
## processed_cheese} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [1521] {margarine,
## processed_cheese} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [1522] {margarine,
## processed_cheese} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [1523] {butter,
## processed_cheese} => {other_vegetables} 0.001220132 0.5000000 0.002440264 2.5840778 12
## [1524] {other_vegetables,
## processed_cheese} => {butter} 0.001220132 0.2222222 0.005490595 4.0101937 12
## [1525] {butter,
## processed_cheese} => {whole_milk} 0.001423488 0.5833333 0.002440264 2.2829619 14
## [1526] {processed_cheese,
## whole_milk} => {butter} 0.001423488 0.2028986 0.007015760 3.6614812 14
## [1527] {domestic_eggs,
## processed_cheese} => {soda} 0.001016777 0.4761905 0.002135231 2.7308066 10
## [1528] {domestic_eggs,
## processed_cheese} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [1529] {domestic_eggs,
## processed_cheese} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [1530] {fruit/vegetable_juice,
## processed_cheese} => {soda} 0.001220132 0.4137931 0.002948653 2.3729768 12
## [1531] {processed_cheese,
## soda} => {fruit/vegetable_juice} 0.001220132 0.2307692 0.005287239 3.1921454 12
## [1532] {fruit/vegetable_juice,
## processed_cheese} => {rolls/buns} 0.001016777 0.3448276 0.002948653 1.8747260 10
## [1533] {processed_cheese,
## rolls/buns} => {fruit/vegetable_juice} 0.001016777 0.2173913 0.004677173 3.0070935 10
## [1534] {fruit/vegetable_juice,
## processed_cheese} => {whole_milk} 0.001931876 0.6551724 0.002948653 2.5641149 19
## [1535] {processed_cheese,
## whole_milk} => {fruit/vegetable_juice} 0.001931876 0.2753623 0.007015760 3.8089851 19
## [1536] {processed_cheese,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.7368421 0.001931876 3.8081146 14
## [1537] {other_vegetables,
## processed_cheese} => {whipped/sour_cream} 0.001423488 0.2592593 0.005490595 3.6167586 14
## [1538] {pip_fruit,
## processed_cheese} => {tropical_fruit} 0.001220132 0.5217391 0.002338587 4.9721941 12
## [1539] {processed_cheese,
## tropical_fruit} => {pip_fruit} 0.001220132 0.2857143 0.004270463 3.7768817 12
## [1540] {pip_fruit,
## processed_cheese} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [1541] {pip_fruit,
## processed_cheese} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [1542] {pastry,
## processed_cheese} => {sausage} 0.001016777 0.3448276 0.002948653 3.6703239 10
## [1543] {processed_cheese,
## sausage} => {pastry} 0.001016777 0.3030303 0.003355363 3.4060606 10
## [1544] {pastry,
## processed_cheese} => {rolls/buns} 0.001118454 0.3793103 0.002948653 2.0621986 11
## [1545] {processed_cheese,
## rolls/buns} => {pastry} 0.001118454 0.2391304 0.004677173 2.6878261 11
## [1546] {pastry,
## processed_cheese} => {other_vegetables} 0.001016777 0.3448276 0.002948653 1.7821226 10
## [1547] {pastry,
## processed_cheese} => {whole_milk} 0.001830198 0.6206897 0.002948653 2.4291615 18
## [1548] {processed_cheese,
## whole_milk} => {pastry} 0.001830198 0.2608696 0.007015760 2.9321739 18
## [1549] {citrus_fruit,
## processed_cheese} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [1550] {other_vegetables,
## processed_cheese} => {citrus_fruit} 0.001220132 0.2222222 0.005490595 2.6849577 12
## [1551] {citrus_fruit,
## processed_cheese} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [1552] {processed_cheese,
## shopping_bags} => {soda} 0.001016777 0.5000000 0.002033554 2.8673469 10
## [1553] {processed_cheese,
## shopping_bags} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [1554] {processed_cheese,
## sausage} => {tropical_fruit} 0.001118454 0.3333333 0.003355363 3.1766796 11
## [1555] {processed_cheese,
## tropical_fruit} => {sausage} 0.001118454 0.2619048 0.004270463 2.7876984 11
## [1556] {processed_cheese,
## sausage} => {soda} 0.001321810 0.3939394 0.003355363 2.2591218 13
## [1557] {processed_cheese,
## soda} => {sausage} 0.001321810 0.2500000 0.005287239 2.6609848 13
## [1558] {processed_cheese,
## sausage} => {rolls/buns} 0.001220132 0.3636364 0.003355363 1.9769838 12
## [1559] {processed_cheese,
## rolls/buns} => {sausage} 0.001220132 0.2608696 0.004677173 2.7766798 12
## [1560] {processed_cheese,
## sausage} => {other_vegetables} 0.001016777 0.3030303 0.003355363 1.5661077 10
## [1561] {processed_cheese,
## sausage} => {whole_milk} 0.001626843 0.4848485 0.003355363 1.8975268 16
## [1562] {processed_cheese,
## whole_milk} => {sausage} 0.001626843 0.2318841 0.007015760 2.4681599 16
## [1563] {bottled_water,
## processed_cheese} => {soda} 0.001220132 0.5217391 0.002338587 2.9920142 12
## [1564] {processed_cheese,
## soda} => {bottled_water} 0.001220132 0.2307692 0.005287239 2.0879626 12
## [1565] {bottled_water,
## processed_cheese} => {whole_milk} 0.001220132 0.5217391 0.002338587 2.0419038 12
## [1566] {processed_cheese,
## tropical_fruit} => {root_vegetables} 0.001016777 0.2380952 0.004270463 2.1843905 10
## [1567] {processed_cheese,
## root_vegetables} => {tropical_fruit} 0.001016777 0.3225806 0.003152008 3.0742061 10
## [1568] {processed_cheese,
## tropical_fruit} => {soda} 0.001626843 0.3809524 0.004270463 2.1846453 16
## [1569] {processed_cheese,
## soda} => {tropical_fruit} 0.001626843 0.3076923 0.005287239 2.9323196 16
## [1570] {processed_cheese,
## tropical_fruit} => {yogurt} 0.001321810 0.3095238 0.004270463 2.2187804 13
## [1571] {processed_cheese,
## yogurt} => {tropical_fruit} 0.001321810 0.5000000 0.002643620 4.7650194 13
## [1572] {processed_cheese,
## tropical_fruit} => {rolls/buns} 0.001016777 0.2380952 0.004270463 1.2944537 10
## [1573] {processed_cheese,
## rolls/buns} => {tropical_fruit} 0.001016777 0.2173913 0.004677173 2.0717476 10
## [1574] {processed_cheese,
## tropical_fruit} => {other_vegetables} 0.001728521 0.4047619 0.004270463 2.0918725 17
## [1575] {other_vegetables,
## processed_cheese} => {tropical_fruit} 0.001728521 0.3148148 0.005490595 3.0001974 17
## [1576] {processed_cheese,
## tropical_fruit} => {whole_milk} 0.002033554 0.4761905 0.004270463 1.8636424 20
## [1577] {processed_cheese,
## whole_milk} => {tropical_fruit} 0.002033554 0.2898551 0.007015760 2.7623301 20
## [1578] {processed_cheese,
## root_vegetables} => {soda} 0.001016777 0.3225806 0.003152008 1.8499013 10
## [1579] {processed_cheese,
## root_vegetables} => {other_vegetables} 0.002135231 0.6774194 0.003152008 3.5010086 21
## [1580] {other_vegetables,
## processed_cheese} => {root_vegetables} 0.002135231 0.3888889 0.005490595 3.5678379 21
## [1581] {processed_cheese,
## root_vegetables} => {whole_milk} 0.002033554 0.6451613 0.003152008 2.5249349 20
## [1582] {processed_cheese,
## whole_milk} => {root_vegetables} 0.002033554 0.2898551 0.007015760 2.6592581 20
## [1583] {processed_cheese,
## soda} => {rolls/buns} 0.001118454 0.2115385 0.005287239 1.1500723 11
## [1584] {processed_cheese,
## rolls/buns} => {soda} 0.001118454 0.2391304 0.004677173 1.3713398 11
## [1585] {processed_cheese,
## soda} => {other_vegetables} 0.001423488 0.2692308 0.005287239 1.3914265 14
## [1586] {other_vegetables,
## processed_cheese} => {soda} 0.001423488 0.2592593 0.005490595 1.4867725 14
## [1587] {processed_cheese,
## soda} => {whole_milk} 0.002541942 0.4807692 0.005287239 1.8815620 25
## [1588] {processed_cheese,
## whole_milk} => {soda} 0.002541942 0.3623188 0.007015760 2.0777876 25
## [1589] {processed_cheese,
## yogurt} => {other_vegetables} 0.001118454 0.4230769 0.002643620 2.1865273 11
## [1590] {other_vegetables,
## processed_cheese} => {yogurt} 0.001118454 0.2037037 0.005490595 1.4602230 11
## [1591] {processed_cheese,
## yogurt} => {whole_milk} 0.001220132 0.4615385 0.002643620 1.8062996 12
## [1592] {processed_cheese,
## rolls/buns} => {other_vegetables} 0.001321810 0.2826087 0.004677173 1.4605657 13
## [1593] {other_vegetables,
## processed_cheese} => {rolls/buns} 0.001321810 0.2407407 0.005490595 1.3088365 13
## [1594] {processed_cheese,
## rolls/buns} => {whole_milk} 0.001931876 0.4130435 0.004677173 1.6165072 19
## [1595] {processed_cheese,
## whole_milk} => {rolls/buns} 0.001931876 0.2753623 0.007015760 1.4970638 19
## [1596] {other_vegetables,
## processed_cheese} => {whole_milk} 0.002541942 0.4629630 0.005490595 1.8118745 25
## [1597] {processed_cheese,
## whole_milk} => {other_vegetables} 0.002541942 0.3623188 0.007015760 1.8725201 25
## [1598] {frozen_vegetables,
## semi_finished_bread} => {tropical_fruit} 0.001220132 0.5454545 0.002236909 5.1982030 12
## [1599] {semi_finished_bread,
## tropical_fruit} => {frozen_vegetables} 0.001220132 0.2857143 0.004270463 5.9408034 12
## [1600] {frozen_vegetables,
## semi_finished_bread} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [1601] {other_vegetables,
## semi_finished_bread} => {frozen_vegetables} 0.001118454 0.2156863 0.005185562 4.4847241 11
## [1602] {frozen_vegetables,
## semi_finished_bread} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [1603] {curd,
## semi_finished_bread} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [1604] {other_vegetables,
## semi_finished_bread} => {curd} 0.001220132 0.2352941 0.005185562 4.4162551 12
## [1605] {curd,
## semi_finished_bread} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [1606] {pork,
## semi_finished_bread} => {tropical_fruit} 0.001016777 0.5555556 0.001830198 5.2944660 10
## [1607] {semi_finished_bread,
## tropical_fruit} => {pork} 0.001016777 0.2380952 0.004270463 4.1299236 10
## [1608] {pork,
## semi_finished_bread} => {other_vegetables} 0.001423488 0.7777778 0.001830198 4.0196765 14
## [1609] {other_vegetables,
## semi_finished_bread} => {pork} 0.001423488 0.2745098 0.005185562 4.7615589 14
## [1610] {pork,
## semi_finished_bread} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [1611] {frankfurter,
## semi_finished_bread} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [1612] {brown_bread,
## semi_finished_bread} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [1613] {margarine,
## semi_finished_bread} => {tropical_fruit} 0.001016777 0.5000000 0.002033554 4.7650194 10
## [1614] {semi_finished_bread,
## tropical_fruit} => {margarine} 0.001016777 0.2380952 0.004270463 4.0653935 10
## [1615] {margarine,
## semi_finished_bread} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [1616] {newspapers,
## semi_finished_bread} => {other_vegetables} 0.001220132 0.4615385 0.002643620 2.3853026 12
## [1617] {other_vegetables,
## semi_finished_bread} => {newspapers} 0.001220132 0.2352941 0.005185562 2.9479206 12
## [1618] {newspapers,
## semi_finished_bread} => {whole_milk} 0.001321810 0.5000000 0.002643620 1.9568245 13
## [1619] {domestic_eggs,
## semi_finished_bread} => {tropical_fruit} 0.001016777 0.5882353 0.001728521 5.6059052 10
## [1620] {semi_finished_bread,
## tropical_fruit} => {domestic_eggs} 0.001016777 0.2380952 0.004270463 3.7526709 10
## [1621] {fruit/vegetable_juice,
## semi_finished_bread} => {tropical_fruit} 0.001016777 0.4166667 0.002440264 3.9708495 10
## [1622] {semi_finished_bread,
## tropical_fruit} => {fruit/vegetable_juice} 0.001016777 0.2380952 0.004270463 3.2934834 10
## [1623] {fruit/vegetable_juice,
## semi_finished_bread} => {other_vegetables} 0.001220132 0.5000000 0.002440264 2.5840778 12
## [1624] {other_vegetables,
## semi_finished_bread} => {fruit/vegetable_juice} 0.001220132 0.2352941 0.005185562 3.2547365 12
## [1625] {fruit/vegetable_juice,
## semi_finished_bread} => {whole_milk} 0.001525165 0.6250000 0.002440264 2.4460306 15
## [1626] {semi_finished_bread,
## whole_milk} => {fruit/vegetable_juice} 0.001525165 0.2142857 0.007117438 2.9641350 15
## [1627] {semi_finished_bread,
## whipped/sour_cream} => {tropical_fruit} 0.001118454 0.4583333 0.002440264 4.3679344 11
## [1628] {semi_finished_bread,
## tropical_fruit} => {whipped/sour_cream} 0.001118454 0.2619048 0.004270463 3.6536643 11
## [1629] {semi_finished_bread,
## whipped/sour_cream} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [1630] {semi_finished_bread,
## yogurt} => {whipped/sour_cream} 0.001016777 0.2857143 0.003558719 3.9858156 10
## [1631] {semi_finished_bread,
## whipped/sour_cream} => {other_vegetables} 0.001525165 0.6250000 0.002440264 3.2300972 15
## [1632] {other_vegetables,
## semi_finished_bread} => {whipped/sour_cream} 0.001525165 0.2941176 0.005185562 4.1030455 15
## [1633] {semi_finished_bread,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.5416667 0.002440264 2.1198932 13
## [1634] {pastry,
## semi_finished_bread} => {tropical_fruit} 0.001016777 0.3125000 0.003253686 2.9781371 10
## [1635] {semi_finished_bread,
## tropical_fruit} => {pastry} 0.001016777 0.2380952 0.004270463 2.6761905 10
## [1636] {pastry,
## semi_finished_bread} => {soda} 0.001016777 0.3125000 0.003253686 1.7920918 10
## [1637] {semi_finished_bread,
## soda} => {pastry} 0.001016777 0.2500000 0.004067107 2.8100000 10
## [1638] {pastry,
## semi_finished_bread} => {yogurt} 0.001016777 0.3125000 0.003253686 2.2401148 10
## [1639] {semi_finished_bread,
## yogurt} => {pastry} 0.001016777 0.2857143 0.003558719 3.2114286 10
## [1640] {pastry,
## semi_finished_bread} => {other_vegetables} 0.001016777 0.3125000 0.003253686 1.6150486 10
## [1641] {pastry,
## semi_finished_bread} => {whole_milk} 0.001830198 0.5625000 0.003253686 2.2014276 18
## [1642] {semi_finished_bread,
## whole_milk} => {pastry} 0.001830198 0.2571429 0.007117438 2.8902857 18
## [1643] {citrus_fruit,
## semi_finished_bread} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [1644] {citrus_fruit,
## semi_finished_bread} => {whole_milk} 0.001321810 0.5416667 0.002440264 2.1198932 13
## [1645] {semi_finished_bread,
## shopping_bags} => {soda} 0.001016777 0.3125000 0.003253686 1.7920918 10
## [1646] {semi_finished_bread,
## soda} => {shopping_bags} 0.001016777 0.2500000 0.004067107 2.5374097 10
## [1647] {semi_finished_bread,
## shopping_bags} => {whole_milk} 0.001220132 0.3750000 0.003253686 1.4676184 12
## [1648] {sausage,
## semi_finished_bread} => {tropical_fruit} 0.001118454 0.3928571 0.002846975 3.7439438 11
## [1649] {semi_finished_bread,
## tropical_fruit} => {sausage} 0.001118454 0.2619048 0.004270463 2.7876984 11
## [1650] {sausage,
## semi_finished_bread} => {other_vegetables} 0.001423488 0.5000000 0.002846975 2.5840778 14
## [1651] {other_vegetables,
## semi_finished_bread} => {sausage} 0.001423488 0.2745098 0.005185562 2.9218657 14
## [1652] {sausage,
## semi_finished_bread} => {whole_milk} 0.001118454 0.3928571 0.002846975 1.5375050 11
## [1653] {bottled_water,
## semi_finished_bread} => {yogurt} 0.001118454 0.4400000 0.002541942 3.1540816 11
## [1654] {semi_finished_bread,
## yogurt} => {bottled_water} 0.001118454 0.3142857 0.003558719 2.8436063 11
## [1655] {bottled_water,
## semi_finished_bread} => {other_vegetables} 0.001016777 0.4000000 0.002541942 2.0672622 10
## [1656] {semi_finished_bread,
## tropical_fruit} => {soda} 0.001525165 0.3571429 0.004270463 2.0481050 15
## [1657] {semi_finished_bread,
## soda} => {tropical_fruit} 0.001525165 0.3750000 0.004067107 3.5737645 15
## [1658] {semi_finished_bread,
## tropical_fruit} => {yogurt} 0.001626843 0.3809524 0.004270463 2.7308066 16
## [1659] {semi_finished_bread,
## yogurt} => {tropical_fruit} 0.001626843 0.4571429 0.003558719 4.3565891 16
## [1660] {semi_finished_bread,
## tropical_fruit} => {rolls/buns} 0.001220132 0.2857143 0.004270463 1.5533444 12
## [1661] {rolls/buns,
## semi_finished_bread} => {tropical_fruit} 0.001220132 0.3529412 0.003457041 3.3635431 12
## [1662] {semi_finished_bread,
## tropical_fruit} => {other_vegetables} 0.002236909 0.5238095 0.004270463 2.7071291 22
## [1663] {other_vegetables,
## semi_finished_bread} => {tropical_fruit} 0.002236909 0.4313725 0.005185562 4.1109971 22
## [1664] {semi_finished_bread,
## tropical_fruit} => {whole_milk} 0.002135231 0.5000000 0.004270463 1.9568245 21
## [1665] {semi_finished_bread,
## whole_milk} => {tropical_fruit} 0.002135231 0.3000000 0.007117438 2.8590116 21
## [1666] {root_vegetables,
## semi_finished_bread} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [1667] {other_vegetables,
## semi_finished_bread} => {root_vegetables} 0.001118454 0.2156863 0.005185562 1.9788008 11
## [1668] {root_vegetables,
## semi_finished_bread} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [1669] {semi_finished_bread,
## whole_milk} => {root_vegetables} 0.001423488 0.2000000 0.007117438 1.8348881 14
## [1670] {semi_finished_bread,
## soda} => {yogurt} 0.001118454 0.2750000 0.004067107 1.9713010 11
## [1671] {semi_finished_bread,
## yogurt} => {soda} 0.001118454 0.3142857 0.003558719 1.8023324 11
## [1672] {semi_finished_bread,
## soda} => {other_vegetables} 0.001220132 0.3000000 0.004067107 1.5504467 12
## [1673] {other_vegetables,
## semi_finished_bread} => {soda} 0.001220132 0.2352941 0.005185562 1.3493397 12
## [1674] {semi_finished_bread,
## soda} => {whole_milk} 0.002236909 0.5500000 0.004067107 2.1525070 22
## [1675] {semi_finished_bread,
## whole_milk} => {soda} 0.002236909 0.3142857 0.007117438 1.8023324 22
## [1676] {semi_finished_bread,
## yogurt} => {rolls/buns} 0.001016777 0.2857143 0.003558719 1.5533444 10
## [1677] {rolls/buns,
## semi_finished_bread} => {yogurt} 0.001016777 0.2941176 0.003457041 2.1083433 10
## [1678] {semi_finished_bread,
## yogurt} => {other_vegetables} 0.002236909 0.6285714 0.003558719 3.2485549 22
## [1679] {other_vegetables,
## semi_finished_bread} => {yogurt} 0.002236909 0.4313725 0.005185562 3.0922369 22
## [1680] {semi_finished_bread,
## yogurt} => {whole_milk} 0.002033554 0.5714286 0.003558719 2.2363709 20
## [1681] {semi_finished_bread,
## whole_milk} => {yogurt} 0.002033554 0.2857143 0.007117438 2.0481050 20
## [1682] {rolls/buns,
## semi_finished_bread} => {other_vegetables} 0.001220132 0.3529412 0.003457041 1.8240549 12
## [1683] {other_vegetables,
## semi_finished_bread} => {rolls/buns} 0.001220132 0.2352941 0.005185562 1.2792248 12
## [1684] {rolls/buns,
## semi_finished_bread} => {whole_milk} 0.001830198 0.5294118 0.003457041 2.0719318 18
## [1685] {semi_finished_bread,
## whole_milk} => {rolls/buns} 0.001830198 0.2571429 0.007117438 1.3980100 18
## [1686] {other_vegetables,
## semi_finished_bread} => {whole_milk} 0.002643620 0.5098039 0.005185562 1.9951936 26
## [1687] {semi_finished_bread,
## whole_milk} => {other_vegetables} 0.002643620 0.3714286 0.007117438 1.9196006 26
## [1688] {beverages,
## chicken} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [1689] {beverages,
## newspapers} => {whole_milk} 0.001423488 0.5833333 0.002440264 2.2829619 14
## [1690] {beverages,
## whole_milk} => {newspapers} 0.001423488 0.2089552 0.006812405 2.6179295 14
## [1691] {beverages,
## fruit/vegetable_juice} => {yogurt} 0.001423488 0.5000000 0.002846975 3.5841837 14
## [1692] {beverages,
## yogurt} => {fruit/vegetable_juice} 0.001423488 0.2592593 0.005490595 3.5862374 14
## [1693] {beverages,
## fruit/vegetable_juice} => {whole_milk} 0.001118454 0.3928571 0.002846975 1.5375050 11
## [1694] {beverages,
## whipped/sour_cream} => {tropical_fruit} 0.001016777 0.4347826 0.002338587 4.1434951 10
## [1695] {beverages,
## tropical_fruit} => {whipped/sour_cream} 0.001016777 0.2380952 0.004270463 3.3215130 10
## [1696] {beverages,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [1697] {beverages,
## other_vegetables} => {whipped/sour_cream} 0.001118454 0.2156863 0.005185562 3.0089000 11
## [1698] {beverages,
## pip_fruit} => {tropical_fruit} 0.001220132 0.4285714 0.002846975 4.0843023 12
## [1699] {beverages,
## tropical_fruit} => {pip_fruit} 0.001220132 0.2857143 0.004270463 3.7768817 12
## [1700] {beverages,
## pip_fruit} => {other_vegetables} 0.001220132 0.4285714 0.002846975 2.2149238 12
## [1701] {beverages,
## other_vegetables} => {pip_fruit} 0.001220132 0.2352941 0.005185562 3.1103732 12
## [1702] {beverages,
## pastry} => {soda} 0.001016777 0.3125000 0.003253686 1.7920918 10
## [1703] {beverages,
## soda} => {pastry} 0.001016777 0.2127660 0.004778851 2.3914894 10
## [1704] {beverages,
## citrus_fruit} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [1705] {beverages,
## other_vegetables} => {citrus_fruit} 0.001321810 0.2549020 0.005185562 3.0798044 13
## [1706] {beverages,
## shopping_bags} => {rolls/buns} 0.001016777 0.3333333 0.003050330 1.8122351 10
## [1707] {beverages,
## sausage} => {rolls/buns} 0.001321810 0.4814815 0.002745297 2.6176730 13
## [1708] {beverages,
## rolls/buns} => {sausage} 0.001321810 0.2452830 0.005388917 2.6107776 13
## [1709] {beverages,
## bottled_water} => {yogurt} 0.001220132 0.4000000 0.003050330 2.8673469 12
## [1710] {beverages,
## yogurt} => {bottled_water} 0.001220132 0.2222222 0.005490595 2.0106307 12
## [1711] {beverages,
## bottled_water} => {whole_milk} 0.001118454 0.3666667 0.003050330 1.4350046 11
## [1712] {beverages,
## tropical_fruit} => {root_vegetables} 0.001016777 0.2380952 0.004270463 2.1843905 10
## [1713] {beverages,
## root_vegetables} => {tropical_fruit} 0.001016777 0.3225806 0.003152008 3.0742061 10
## [1714] {beverages,
## tropical_fruit} => {yogurt} 0.001321810 0.3095238 0.004270463 2.2187804 13
## [1715] {beverages,
## yogurt} => {tropical_fruit} 0.001321810 0.2407407 0.005490595 2.2942686 13
## [1716] {beverages,
## tropical_fruit} => {other_vegetables} 0.001931876 0.4523810 0.004270463 2.3379751 19
## [1717] {beverages,
## other_vegetables} => {tropical_fruit} 0.001931876 0.3725490 0.005185562 3.5504066 19
## [1718] {beverages,
## tropical_fruit} => {whole_milk} 0.001626843 0.3809524 0.004270463 1.4909139 16
## [1719] {beverages,
## whole_milk} => {tropical_fruit} 0.001626843 0.2388060 0.006812405 2.2758302 16
## [1720] {beverages,
## root_vegetables} => {yogurt} 0.001321810 0.4193548 0.003152008 3.0060895 13
## [1721] {beverages,
## yogurt} => {root_vegetables} 0.001321810 0.2407407 0.005490595 2.2086616 13
## [1722] {beverages,
## root_vegetables} => {other_vegetables} 0.001626843 0.5161290 0.003152008 2.6674351 16
## [1723] {beverages,
## other_vegetables} => {root_vegetables} 0.001626843 0.3137255 0.005185562 2.8782558 16
## [1724] {beverages,
## root_vegetables} => {whole_milk} 0.001220132 0.3870968 0.003152008 1.5149609 12
## [1725] {beverages,
## soda} => {yogurt} 0.001118454 0.2340426 0.004778851 1.6777030 11
## [1726] {beverages,
## yogurt} => {soda} 0.001118454 0.2037037 0.005490595 1.1681784 11
## [1727] {beverages,
## soda} => {rolls/buns} 0.001118454 0.2340426 0.004778851 1.2724204 11
## [1728] {beverages,
## rolls/buns} => {soda} 0.001118454 0.2075472 0.005388917 1.1902195 11
## [1729] {beverages,
## soda} => {other_vegetables} 0.001016777 0.2127660 0.004778851 1.0996076 10
## [1730] {beverages,
## soda} => {whole_milk} 0.001220132 0.2553191 0.004778851 0.9992295 12
## [1731] {beverages,
## yogurt} => {rolls/buns} 0.001626843 0.2962963 0.005490595 1.6108757 16
## [1732] {beverages,
## rolls/buns} => {yogurt} 0.001626843 0.3018868 0.005388917 2.1640354 16
## [1733] {beverages,
## yogurt} => {other_vegetables} 0.001830198 0.3333333 0.005490595 1.7227185 18
## [1734] {beverages,
## other_vegetables} => {yogurt} 0.001830198 0.3529412 0.005185562 2.5300120 18
## [1735] {beverages,
## yogurt} => {whole_milk} 0.002135231 0.3888889 0.005490595 1.5219746 21
## [1736] {beverages,
## whole_milk} => {yogurt} 0.002135231 0.3134328 0.006812405 2.2468017 21
## [1737] {beverages,
## rolls/buns} => {other_vegetables} 0.001830198 0.3396226 0.005388917 1.7552226 18
## [1738] {beverages,
## other_vegetables} => {rolls/buns} 0.001830198 0.3529412 0.005185562 1.9188372 18
## [1739] {beverages,
## other_vegetables} => {whole_milk} 0.001626843 0.3137255 0.005185562 1.2278115 16
## [1740] {beverages,
## whole_milk} => {other_vegetables} 0.001626843 0.2388060 0.006812405 1.2341864 16
## [1741] {ice_cream,
## salty_snack} => {soda} 0.001016777 0.4347826 0.002338587 2.4933452 10
## [1742] {frozen_vegetables,
## ice_cream} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [1743] {ice_cream,
## other_vegetables} => {frozen_vegetables} 0.001016777 0.2000000 0.005083884 4.1585624 10
## [1744] {ice_cream,
## napkins} => {soda} 0.001016777 0.5555556 0.001830198 3.1859410 10
## [1745] {butter,
## ice_cream} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [1746] {ice_cream,
## other_vegetables} => {butter} 0.001016777 0.2000000 0.005083884 3.6091743 10
## [1747] {butter,
## ice_cream} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [1748] {ice_cream,
## newspapers} => {other_vegetables} 0.001830198 0.6206897 0.002948653 3.2078207 18
## [1749] {ice_cream,
## other_vegetables} => {newspapers} 0.001830198 0.3600000 0.005083884 4.5103185 18
## [1750] {ice_cream,
## newspapers} => {whole_milk} 0.001118454 0.3793103 0.002948653 1.4844876 11
## [1751] {fruit/vegetable_juice,
## ice_cream} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [1752] {ice_cream,
## other_vegetables} => {fruit/vegetable_juice} 0.001118454 0.2200000 0.005083884 3.0431786 11
## [1753] {ice_cream,
## whipped/sour_cream} => {other_vegetables} 0.001626843 0.6153846 0.002643620 3.1804034 16
## [1754] {ice_cream,
## other_vegetables} => {whipped/sour_cream} 0.001626843 0.3200000 0.005083884 4.4641135 16
## [1755] {ice_cream,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.5000000 0.002643620 1.9568245 13
## [1756] {ice_cream,
## whole_milk} => {whipped/sour_cream} 0.001321810 0.2241379 0.005897306 3.1268036 13
## [1757] {ice_cream,
## pip_fruit} => {tropical_fruit} 0.001220132 0.5000000 0.002440264 4.7650194 12
## [1758] {ice_cream,
## tropical_fruit} => {pip_fruit} 0.001220132 0.3000000 0.004067107 3.9657258 12
## [1759] {ice_cream,
## pastry} => {soda} 0.001016777 0.4761905 0.002135231 2.7308066 10
## [1760] {ice_cream,
## pastry} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [1761] {ice_cream,
## other_vegetables} => {pastry} 0.001016777 0.2000000 0.005083884 2.2480000 10
## [1762] {ice_cream,
## pastry} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [1763] {ice_cream,
## shopping_bags} => {soda} 0.001118454 0.3548387 0.003152008 2.0348914 11
## [1764] {ice_cream,
## shopping_bags} => {whole_milk} 0.001220132 0.3870968 0.003152008 1.5149609 12
## [1765] {ice_cream,
## whole_milk} => {shopping_bags} 0.001220132 0.2068966 0.005897306 2.0999253 12
## [1766] {bottled_water,
## ice_cream} => {soda} 0.001016777 0.3846154 0.002643620 2.2056515 10
## [1767] {bottled_water,
## ice_cream} => {whole_milk} 0.001118454 0.4230769 0.002643620 1.6557746 11
## [1768] {ice_cream,
## tropical_fruit} => {soda} 0.001423488 0.3500000 0.004067107 2.0071429 14
## [1769] {ice_cream,
## soda} => {tropical_fruit} 0.001423488 0.2333333 0.006100661 2.2236757 14
## [1770] {ice_cream,
## tropical_fruit} => {yogurt} 0.001220132 0.3000000 0.004067107 2.1505102 12
## [1771] {ice_cream,
## yogurt} => {tropical_fruit} 0.001220132 0.3428571 0.003558719 3.2674419 12
## [1772] {ice_cream,
## tropical_fruit} => {other_vegetables} 0.001525165 0.3750000 0.004067107 1.9380583 15
## [1773] {ice_cream,
## other_vegetables} => {tropical_fruit} 0.001525165 0.3000000 0.005083884 2.8590116 15
## [1774] {ice_cream,
## tropical_fruit} => {whole_milk} 0.001830198 0.4500000 0.004067107 1.7611421 18
## [1775] {ice_cream,
## whole_milk} => {tropical_fruit} 0.001830198 0.3103448 0.005897306 2.9575982 18
## [1776] {ice_cream,
## root_vegetables} => {other_vegetables} 0.001830198 0.6206897 0.002948653 3.2078207 18
## [1777] {ice_cream,
## other_vegetables} => {root_vegetables} 0.001830198 0.3600000 0.005083884 3.3027985 18
## [1778] {ice_cream,
## soda} => {yogurt} 0.001525165 0.2500000 0.006100661 1.7920918 15
## [1779] {ice_cream,
## yogurt} => {soda} 0.001525165 0.4285714 0.003558719 2.4577259 15
## [1780] {ice_cream,
## soda} => {rolls/buns} 0.001220132 0.2000000 0.006100661 1.0873411 12
## [1781] {ice_cream,
## rolls/buns} => {soda} 0.001220132 0.3636364 0.003355363 2.0853432 12
## [1782] {ice_cream,
## soda} => {other_vegetables} 0.001321810 0.2166667 0.006100661 1.1197670 13
## [1783] {ice_cream,
## other_vegetables} => {soda} 0.001321810 0.2600000 0.005083884 1.4910204 13
## [1784] {ice_cream,
## soda} => {whole_milk} 0.001728521 0.2833333 0.006100661 1.1088672 17
## [1785] {ice_cream,
## whole_milk} => {soda} 0.001728521 0.2931034 0.005897306 1.6808586 17
## [1786] {ice_cream,
## yogurt} => {other_vegetables} 0.001118454 0.3142857 0.003558719 1.6242775 11
## [1787] {ice_cream,
## other_vegetables} => {yogurt} 0.001118454 0.2200000 0.005083884 1.5770408 11
## [1788] {ice_cream,
## yogurt} => {whole_milk} 0.001321810 0.3714286 0.003558719 1.4536411 13
## [1789] {ice_cream,
## whole_milk} => {yogurt} 0.001321810 0.2241379 0.005897306 1.6067030 13
## [1790] {ice_cream,
## rolls/buns} => {other_vegetables} 0.001016777 0.3030303 0.003355363 1.5661077 10
## [1791] {ice_cream,
## other_vegetables} => {rolls/buns} 0.001016777 0.2000000 0.005083884 1.0873411 10
## [1792] {ice_cream,
## other_vegetables} => {whole_milk} 0.002338587 0.4600000 0.005083884 1.8002786 23
## [1793] {ice_cream,
## whole_milk} => {other_vegetables} 0.002338587 0.3965517 0.005897306 2.0494410 23
## [1794] {detergent,
## oil} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [1795] {detergent,
## oil} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [1796] {berries,
## detergent} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [1797] {detergent,
## white_bread} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [1798] {detergent,
## frozen_vegetables} => {yogurt} 0.001016777 0.3703704 0.002745297 2.6549509 10
## [1799] {detergent,
## yogurt} => {frozen_vegetables} 0.001016777 0.2564103 0.003965430 5.3314902 10
## [1800] {detergent,
## frozen_vegetables} => {other_vegetables} 0.001423488 0.5185185 0.002745297 2.6797844 14
## [1801] {detergent,
## other_vegetables} => {frozen_vegetables} 0.001423488 0.2222222 0.006405694 4.6206249 14
## [1802] {detergent,
## frozen_vegetables} => {whole_milk} 0.001728521 0.6296296 0.002745297 2.4641494 17
## [1803] {beef,
## detergent} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [1804] {curd,
## detergent} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [1805] {curd,
## detergent} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [1806] {detergent,
## napkins} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [1807] {detergent,
## pork} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [1808] {detergent,
## frankfurter} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [1809] {detergent,
## frankfurter} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [1810] {butter,
## detergent} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [1811] {butter,
## detergent} => {whole_milk} 0.001525165 0.6818182 0.002236909 2.6683971 15
## [1812] {detergent,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [1813] {detergent,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.7894737 0.001931876 3.0897229 15
## [1814] {detergent,
## pip_fruit} => {tropical_fruit} 0.001118454 0.4400000 0.002541942 4.1932171 11
## [1815] {detergent,
## tropical_fruit} => {pip_fruit} 0.001118454 0.3333333 0.003355363 4.4063620 11
## [1816] {detergent,
## pip_fruit} => {other_vegetables} 0.001016777 0.4000000 0.002541942 2.0672622 10
## [1817] {detergent,
## pip_fruit} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [1818] {detergent,
## pastry} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [1819] {detergent,
## pastry} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [1820] {citrus_fruit,
## detergent} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [1821] {citrus_fruit,
## detergent} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [1822] {detergent,
## shopping_bags} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [1823] {detergent,
## sausage} => {other_vegetables} 0.001220132 0.4800000 0.002541942 2.4807147 12
## [1824] {detergent,
## sausage} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [1825] {bottled_water,
## detergent} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [1826] {bottled_water,
## detergent} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [1827] {detergent,
## tropical_fruit} => {other_vegetables} 0.001728521 0.5151515 0.003355363 2.6623832 17
## [1828] {detergent,
## other_vegetables} => {tropical_fruit} 0.001728521 0.2698413 0.006405694 2.5715978 17
## [1829] {detergent,
## tropical_fruit} => {whole_milk} 0.002033554 0.6060606 0.003355363 2.3719085 20
## [1830] {detergent,
## whole_milk} => {tropical_fruit} 0.002033554 0.2272727 0.008947636 2.1659179 20
## [1831] {detergent,
## root_vegetables} => {yogurt} 0.001016777 0.2325581 0.004372140 1.6670622 10
## [1832] {detergent,
## yogurt} => {root_vegetables} 0.001016777 0.2564103 0.003965430 2.3524206 10
## [1833] {detergent,
## root_vegetables} => {other_vegetables} 0.002033554 0.4651163 0.004372140 2.4037933 20
## [1834] {detergent,
## other_vegetables} => {root_vegetables} 0.002033554 0.3174603 0.006405694 2.9125207 20
## [1835] {detergent,
## root_vegetables} => {whole_milk} 0.002745297 0.6279070 0.004372140 2.4574075 27
## [1836] {detergent,
## whole_milk} => {root_vegetables} 0.002745297 0.3068182 0.008947636 2.8148851 27
## [1837] {detergent,
## soda} => {other_vegetables} 0.001016777 0.2941176 0.003457041 1.5200457 10
## [1838] {detergent,
## soda} => {whole_milk} 0.001728521 0.5000000 0.003457041 1.9568245 17
## [1839] {detergent,
## yogurt} => {other_vegetables} 0.001830198 0.4615385 0.003965430 2.3853026 18
## [1840] {detergent,
## other_vegetables} => {yogurt} 0.001830198 0.2857143 0.006405694 2.0481050 18
## [1841] {detergent,
## yogurt} => {whole_milk} 0.002135231 0.5384615 0.003965430 2.1073495 21
## [1842] {detergent,
## whole_milk} => {yogurt} 0.002135231 0.2386364 0.008947636 1.7106331 21
## [1843] {detergent,
## rolls/buns} => {other_vegetables} 0.001016777 0.3333333 0.003050330 1.7227185 10
## [1844] {detergent,
## rolls/buns} => {whole_milk} 0.002033554 0.6666667 0.003050330 2.6090994 20
## [1845] {detergent,
## whole_milk} => {rolls/buns} 0.002033554 0.2272727 0.008947636 1.2356149 20
## [1846] {detergent,
## other_vegetables} => {whole_milk} 0.003558719 0.5555556 0.006405694 2.1742495 35
## [1847] {detergent,
## whole_milk} => {other_vegetables} 0.003558719 0.3977273 0.008947636 2.0555164 35
## [1848] {long_life_bakery_product,
## pickled_vegetables} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [1849] {chicken,
## pickled_vegetables} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [1850] {chicken,
## pickled_vegetables} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [1851] {chocolate,
## pickled_vegetables} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [1852] {frozen_vegetables,
## pickled_vegetables} => {tropical_fruit} 0.001016777 0.3846154 0.002643620 3.6653995 10
## [1853] {pickled_vegetables,
## tropical_fruit} => {frozen_vegetables} 0.001016777 0.2702703 0.003762074 5.6196789 10
## [1854] {frozen_vegetables,
## pickled_vegetables} => {other_vegetables} 0.001118454 0.4230769 0.002643620 2.1865273 11
## [1855] {frozen_vegetables,
## pickled_vegetables} => {whole_milk} 0.001016777 0.3846154 0.002643620 1.5052496 10
## [1856] {beef,
## pickled_vegetables} => {tropical_fruit} 0.001016777 0.4347826 0.002338587 4.1434951 10
## [1857] {pickled_vegetables,
## tropical_fruit} => {beef} 0.001016777 0.2702703 0.003762074 5.1513723 10
## [1858] {beef,
## pickled_vegetables} => {other_vegetables} 0.001423488 0.6086957 0.002338587 3.1458338 14
## [1859] {other_vegetables,
## pickled_vegetables} => {beef} 0.001423488 0.2222222 0.006405694 4.2355728 14
## [1860] {beef,
## pickled_vegetables} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [1861] {pickled_vegetables,
## whole_milk} => {beef} 0.001423488 0.2000000 0.007117438 3.8120155 14
## [1862] {bottled_beer,
## pickled_vegetables} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [1863] {margarine,
## pickled_vegetables} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [1864] {butter,
## pickled_vegetables} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [1865] {newspapers,
## pickled_vegetables} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [1866] {domestic_eggs,
## pickled_vegetables} => {root_vegetables} 0.001016777 0.4166667 0.002440264 3.8226835 10
## [1867] {pickled_vegetables,
## root_vegetables} => {domestic_eggs} 0.001016777 0.2500000 0.004067107 3.9403045 10
## [1868] {domestic_eggs,
## pickled_vegetables} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [1869] {domestic_eggs,
## pickled_vegetables} => {whole_milk} 0.001321810 0.5416667 0.002440264 2.1198932 13
## [1870] {fruit/vegetable_juice,
## pickled_vegetables} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [1871] {pickled_vegetables,
## pip_fruit} => {whole_milk} 0.001220132 0.5000000 0.002440264 1.9568245 12
## [1872] {pastry,
## pickled_vegetables} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [1873] {citrus_fruit,
## pickled_vegetables} => {root_vegetables} 0.001016777 0.3333333 0.003050330 3.0581468 10
## [1874] {pickled_vegetables,
## root_vegetables} => {citrus_fruit} 0.001016777 0.2500000 0.004067107 3.0205774 10
## [1875] {citrus_fruit,
## pickled_vegetables} => {other_vegetables} 0.001728521 0.5666667 0.003050330 2.9286215 17
## [1876] {other_vegetables,
## pickled_vegetables} => {citrus_fruit} 0.001728521 0.2698413 0.006405694 3.2603058 17
## [1877] {citrus_fruit,
## pickled_vegetables} => {whole_milk} 0.001220132 0.4000000 0.003050330 1.5654596 12
## [1878] {pickled_vegetables,
## sausage} => {rolls/buns} 0.001321810 0.4333333 0.003050330 2.3559057 13
## [1879] {pickled_vegetables,
## rolls/buns} => {sausage} 0.001321810 0.3095238 0.004270463 3.2945527 13
## [1880] {pickled_vegetables,
## sausage} => {whole_milk} 0.001321810 0.4333333 0.003050330 1.6959146 13
## [1881] {bottled_water,
## pickled_vegetables} => {other_vegetables} 0.001016777 0.3333333 0.003050330 1.7227185 10
## [1882] {bottled_water,
## pickled_vegetables} => {whole_milk} 0.001423488 0.4666667 0.003050330 1.8263695 14
## [1883] {pickled_vegetables,
## whole_milk} => {bottled_water} 0.001423488 0.2000000 0.007117438 1.8095676 14
## [1884] {pickled_vegetables,
## tropical_fruit} => {root_vegetables} 0.001220132 0.3243243 0.003762074 2.9754942 12
## [1885] {pickled_vegetables,
## root_vegetables} => {tropical_fruit} 0.001220132 0.3000000 0.004067107 2.8590116 12
## [1886] {pickled_vegetables,
## tropical_fruit} => {soda} 0.001525165 0.4054054 0.003762074 2.3248759 15
## [1887] {pickled_vegetables,
## soda} => {tropical_fruit} 0.001525165 0.3750000 0.004067107 3.5737645 15
## [1888] {pickled_vegetables,
## tropical_fruit} => {other_vegetables} 0.002033554 0.5405405 0.003762074 2.7935976 20
## [1889] {other_vegetables,
## pickled_vegetables} => {tropical_fruit} 0.002033554 0.3174603 0.006405694 3.0254091 20
## [1890] {pickled_vegetables,
## tropical_fruit} => {whole_milk} 0.001626843 0.4324324 0.003762074 1.6923888 16
## [1891] {pickled_vegetables,
## whole_milk} => {tropical_fruit} 0.001626843 0.2285714 0.007117438 2.1782946 16
## [1892] {pickled_vegetables,
## root_vegetables} => {other_vegetables} 0.002135231 0.5250000 0.004067107 2.7132817 21
## [1893] {other_vegetables,
## pickled_vegetables} => {root_vegetables} 0.002135231 0.3333333 0.006405694 3.0581468 21
## [1894] {pickled_vegetables,
## root_vegetables} => {whole_milk} 0.001830198 0.4500000 0.004067107 1.7611421 18
## [1895] {pickled_vegetables,
## whole_milk} => {root_vegetables} 0.001830198 0.2571429 0.007117438 2.3591418 18
## [1896] {pickled_vegetables,
## soda} => {yogurt} 0.001016777 0.2500000 0.004067107 1.7920918 10
## [1897] {pickled_vegetables,
## yogurt} => {soda} 0.001016777 0.2702703 0.003762074 1.5499173 10
## [1898] {pickled_vegetables,
## soda} => {rolls/buns} 0.001118454 0.2750000 0.004067107 1.4950940 11
## [1899] {pickled_vegetables,
## rolls/buns} => {soda} 0.001118454 0.2619048 0.004270463 1.5019436 11
## [1900] {pickled_vegetables,
## soda} => {other_vegetables} 0.001423488 0.3500000 0.004067107 1.8088544 14
## [1901] {other_vegetables,
## pickled_vegetables} => {soda} 0.001423488 0.2222222 0.006405694 1.2743764 14
## [1902] {pickled_vegetables,
## soda} => {whole_milk} 0.001830198 0.4500000 0.004067107 1.7611421 18
## [1903] {pickled_vegetables,
## whole_milk} => {soda} 0.001830198 0.2571429 0.007117438 1.4746356 18
## [1904] {pickled_vegetables,
## yogurt} => {rolls/buns} 0.001220132 0.3243243 0.003762074 1.7632558 12
## [1905] {pickled_vegetables,
## rolls/buns} => {yogurt} 0.001220132 0.2857143 0.004270463 2.0481050 12
## [1906] {pickled_vegetables,
## yogurt} => {other_vegetables} 0.001321810 0.3513514 0.003762074 1.8158384 13
## [1907] {other_vegetables,
## pickled_vegetables} => {yogurt} 0.001321810 0.2063492 0.006405694 1.4791869 13
## [1908] {pickled_vegetables,
## yogurt} => {whole_milk} 0.001830198 0.4864865 0.003762074 1.9039374 18
## [1909] {pickled_vegetables,
## whole_milk} => {yogurt} 0.001830198 0.2571429 0.007117438 1.8432945 18
## [1910] {pickled_vegetables,
## rolls/buns} => {other_vegetables} 0.001016777 0.2380952 0.004270463 1.2305132 10
## [1911] {pickled_vegetables,
## rolls/buns} => {whole_milk} 0.001830198 0.4285714 0.004270463 1.6772782 18
## [1912] {pickled_vegetables,
## whole_milk} => {rolls/buns} 0.001830198 0.2571429 0.007117438 1.3980100 18
## [1913] {other_vegetables,
## pickled_vegetables} => {whole_milk} 0.002033554 0.3174603 0.006405694 1.2424283 20
## [1914] {pickled_vegetables,
## whole_milk} => {other_vegetables} 0.002033554 0.2857143 0.007117438 1.4766159 20
## [1915] {baking_powder,
## flour} => {sugar} 0.001016777 0.5555556 0.001830198 16.4080747 10
## [1916] {baking_powder,
## sugar} => {flour} 0.001016777 0.3125000 0.003253686 17.9733187 10
## [1917] {flour,
## sugar} => {baking_powder} 0.001016777 0.2040816 0.004982206 11.5353038 10
## [1918] {baking_powder,
## hard_cheese} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [1919] {baking_powder,
## sugar} => {margarine} 0.001118454 0.3437500 0.003253686 5.8694119 11
## [1920] {baking_powder,
## margarine} => {sugar} 0.001118454 0.3666667 0.003050330 10.8293293 11
## [1921] {margarine,
## sugar} => {baking_powder} 0.001118454 0.2037037 0.005490595 11.5139421 11
## [1922] {baking_powder,
## sugar} => {domestic_eggs} 0.001016777 0.3125000 0.003253686 4.9253806 10
## [1923] {baking_powder,
## domestic_eggs} => {sugar} 0.001016777 0.3225806 0.003152008 9.5272692 10
## [1924] {domestic_eggs,
## sugar} => {baking_powder} 0.001016777 0.2040816 0.004982206 11.5353038 10
## [1925] {baking_powder,
## sugar} => {whipped/sour_cream} 0.001321810 0.4062500 0.003253686 5.6673316 13
## [1926] {baking_powder,
## whipped/sour_cream} => {sugar} 0.001321810 0.2888889 0.004575496 8.5321989 13
## [1927] {sugar,
## whipped/sour_cream} => {baking_powder} 0.001321810 0.2708333 0.004880529 15.3083094 13
## [1928] {baking_powder,
## sugar} => {other_vegetables} 0.001525165 0.4687500 0.003253686 2.4225729 15
## [1929] {baking_powder,
## other_vegetables} => {sugar} 0.001525165 0.2083333 0.007320793 6.1530280 15
## [1930] {baking_powder,
## sugar} => {whole_milk} 0.001626843 0.5000000 0.003253686 1.9568245 16
## [1931] {baking_powder,
## long_life_bakery_product} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [1932] {baking_powder,
## long_life_bakery_product} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [1933] {baking_powder,
## cream_cheese_} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [1934] {baking_powder,
## chocolate} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [1935] {baking_powder,
## frozen_vegetables} => {root_vegetables} 0.001118454 0.4583333 0.002440264 4.2049518 11
## [1936] {baking_powder,
## root_vegetables} => {frozen_vegetables} 0.001118454 0.3142857 0.003558719 6.5348837 11
## [1937] {baking_powder,
## frozen_vegetables} => {other_vegetables} 0.001321810 0.5416667 0.002440264 2.7994176 13
## [1938] {baking_powder,
## frozen_vegetables} => {whole_milk} 0.001525165 0.6250000 0.002440264 2.4460306 15
## [1939] {baking_powder,
## beef} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [1940] {baking_powder,
## curd} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [1941] {baking_powder,
## napkins} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [1942] {baking_powder,
## pork} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [1943] {baking_powder,
## pork} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [1944] {baking_powder,
## margarine} => {yogurt} 0.001016777 0.3333333 0.003050330 2.3894558 10
## [1945] {baking_powder,
## yogurt} => {margarine} 0.001016777 0.2222222 0.004575496 3.7943673 10
## [1946] {baking_powder,
## margarine} => {other_vegetables} 0.001728521 0.5666667 0.003050330 2.9286215 17
## [1947] {baking_powder,
## other_vegetables} => {margarine} 0.001728521 0.2361111 0.007320793 4.0315152 17
## [1948] {baking_powder,
## margarine} => {whole_milk} 0.001830198 0.6000000 0.003050330 2.3481894 18
## [1949] {baking_powder,
## butter} => {domestic_eggs} 0.001016777 0.3571429 0.002846975 5.6290064 10
## [1950] {baking_powder,
## domestic_eggs} => {butter} 0.001016777 0.3225806 0.003152008 5.8212489 10
## [1951] {baking_powder,
## butter} => {root_vegetables} 0.001118454 0.3928571 0.002846975 3.6042444 11
## [1952] {baking_powder,
## root_vegetables} => {butter} 0.001118454 0.3142857 0.003558719 5.6715596 11
## [1953] {baking_powder,
## butter} => {other_vegetables} 0.001423488 0.5000000 0.002846975 2.5840778 14
## [1954] {baking_powder,
## butter} => {whole_milk} 0.001626843 0.5714286 0.002846975 2.2363709 16
## [1955] {baking_powder,
## newspapers} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [1956] {baking_powder,
## domestic_eggs} => {other_vegetables} 0.001220132 0.3870968 0.003152008 2.0005763 12
## [1957] {baking_powder,
## domestic_eggs} => {whole_milk} 0.001931876 0.6129032 0.003152008 2.3986881 19
## [1958] {baking_powder,
## whole_milk} => {domestic_eggs} 0.001931876 0.2087912 0.009252669 3.2908037 19
## [1959] {baking_powder,
## fruit/vegetable_juice} => {tropical_fruit} 0.001016777 0.4545455 0.002236909 4.3318358 10
## [1960] {baking_powder,
## tropical_fruit} => {fruit/vegetable_juice} 0.001016777 0.2702703 0.003762074 3.7385487 10
## [1961] {baking_powder,
## fruit/vegetable_juice} => {yogurt} 0.001118454 0.5000000 0.002236909 3.5841837 11
## [1962] {baking_powder,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.2444444 0.004575496 3.3813096 11
## [1963] {baking_powder,
## fruit/vegetable_juice} => {whole_milk} 0.001423488 0.6363636 0.002236909 2.4905039 14
## [1964] {baking_powder,
## whipped/sour_cream} => {citrus_fruit} 0.001016777 0.2222222 0.004575496 2.6849577 10
## [1965] {baking_powder,
## citrus_fruit} => {whipped/sour_cream} 0.001016777 0.2941176 0.003457041 4.1030455 10
## [1966] {baking_powder,
## whipped/sour_cream} => {tropical_fruit} 0.001118454 0.2444444 0.004575496 2.3295650 11
## [1967] {baking_powder,
## tropical_fruit} => {whipped/sour_cream} 0.001118454 0.2972973 0.003762074 4.1474027 11
## [1968] {baking_powder,
## whipped/sour_cream} => {root_vegetables} 0.001118454 0.2444444 0.004575496 2.2426410 11
## [1969] {baking_powder,
## root_vegetables} => {whipped/sour_cream} 0.001118454 0.3142857 0.003558719 4.3843972 11
## [1970] {baking_powder,
## whipped/sour_cream} => {yogurt} 0.001423488 0.3111111 0.004575496 2.2301587 14
## [1971] {baking_powder,
## yogurt} => {whipped/sour_cream} 0.001423488 0.3111111 0.004575496 4.3401103 14
## [1972] {baking_powder,
## whipped/sour_cream} => {rolls/buns} 0.001016777 0.2222222 0.004575496 1.2081567 10
## [1973] {baking_powder,
## rolls/buns} => {whipped/sour_cream} 0.001016777 0.2857143 0.003558719 3.9858156 10
## [1974] {baking_powder,
## whipped/sour_cream} => {other_vegetables} 0.002440264 0.5333333 0.004575496 2.7563496 24
## [1975] {baking_powder,
## other_vegetables} => {whipped/sour_cream} 0.002440264 0.3333333 0.007320793 4.6501182 24
## [1976] {baking_powder,
## whipped/sour_cream} => {whole_milk} 0.002643620 0.5777778 0.004575496 2.2612194 26
## [1977] {baking_powder,
## whole_milk} => {whipped/sour_cream} 0.002643620 0.2857143 0.009252669 3.9858156 26
## [1978] {baking_powder,
## pip_fruit} => {other_vegetables} 0.001321810 0.5200000 0.002541942 2.6874409 13
## [1979] {baking_powder,
## pip_fruit} => {whole_milk} 0.001626843 0.6400000 0.002541942 2.5047354 16
## [1980] {baking_powder,
## pastry} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [1981] {baking_powder,
## pastry} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [1982] {baking_powder,
## citrus_fruit} => {other_vegetables} 0.001626843 0.4705882 0.003457041 2.4320732 16
## [1983] {baking_powder,
## other_vegetables} => {citrus_fruit} 0.001626843 0.2222222 0.007320793 2.6849577 16
## [1984] {baking_powder,
## citrus_fruit} => {whole_milk} 0.001830198 0.5294118 0.003457041 2.0719318 18
## [1985] {baking_powder,
## sausage} => {other_vegetables} 0.001525165 0.6250000 0.002440264 3.2300972 15
## [1986] {baking_powder,
## other_vegetables} => {sausage} 0.001525165 0.2083333 0.007320793 2.2174874 15
## [1987] {baking_powder,
## sausage} => {whole_milk} 0.001321810 0.5416667 0.002440264 2.1198932 13
## [1988] {baking_powder,
## bottled_water} => {other_vegetables} 0.001118454 0.3928571 0.002846975 2.0303468 11
## [1989] {baking_powder,
## bottled_water} => {whole_milk} 0.001931876 0.6785714 0.002846975 2.6556904 19
## [1990] {baking_powder,
## whole_milk} => {bottled_water} 0.001931876 0.2087912 0.009252669 1.8891091 19
## [1991] {baking_powder,
## tropical_fruit} => {root_vegetables} 0.001321810 0.3513514 0.003762074 3.2234520 13
## [1992] {baking_powder,
## root_vegetables} => {tropical_fruit} 0.001321810 0.3714286 0.003558719 3.5397287 13
## [1993] {baking_powder,
## tropical_fruit} => {yogurt} 0.001321810 0.3513514 0.003762074 2.5186156 13
## [1994] {baking_powder,
## yogurt} => {tropical_fruit} 0.001321810 0.2888889 0.004575496 2.7531223 13
## [1995] {baking_powder,
## tropical_fruit} => {other_vegetables} 0.001830198 0.4864865 0.003762074 2.5142378 18
## [1996] {baking_powder,
## other_vegetables} => {tropical_fruit} 0.001830198 0.2500000 0.007320793 2.3825097 18
## [1997] {baking_powder,
## tropical_fruit} => {whole_milk} 0.002033554 0.5405405 0.003762074 2.1154860 20
## [1998] {baking_powder,
## whole_milk} => {tropical_fruit} 0.002033554 0.2197802 0.009252669 2.0945140 20
## [1999] {baking_powder,
## root_vegetables} => {yogurt} 0.001220132 0.3428571 0.003558719 2.4577259 12
## [2000] {baking_powder,
## yogurt} => {root_vegetables} 0.001220132 0.2666667 0.004575496 2.4465174 12
## [2001] {baking_powder,
## root_vegetables} => {rolls/buns} 0.001220132 0.3428571 0.003558719 1.8640133 12
## [2002] {baking_powder,
## rolls/buns} => {root_vegetables} 0.001220132 0.3428571 0.003558719 3.1455224 12
## [2003] {baking_powder,
## root_vegetables} => {other_vegetables} 0.002541942 0.7142857 0.003558719 3.6915397 25
## [2004] {baking_powder,
## other_vegetables} => {root_vegetables} 0.002541942 0.3472222 0.007320793 3.1855695 25
## [2005] {baking_powder,
## root_vegetables} => {whole_milk} 0.002338587 0.6571429 0.003558719 2.5718265 23
## [2006] {baking_powder,
## whole_milk} => {root_vegetables} 0.002338587 0.2527473 0.009252669 2.3188146 23
## [2007] {baking_powder,
## soda} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [2008] {baking_powder,
## yogurt} => {other_vegetables} 0.002338587 0.5111111 0.004575496 2.6415017 23
## [2009] {baking_powder,
## other_vegetables} => {yogurt} 0.002338587 0.3194444 0.007320793 2.2898951 23
## [2010] {baking_powder,
## yogurt} => {whole_milk} 0.003253686 0.7111111 0.004575496 2.7830393 32
## [2011] {baking_powder,
## whole_milk} => {yogurt} 0.003253686 0.3516484 0.009252669 2.5207446 32
## [2012] {baking_powder,
## rolls/buns} => {other_vegetables} 0.002135231 0.6000000 0.003558719 3.1008933 21
## [2013] {baking_powder,
## other_vegetables} => {rolls/buns} 0.002135231 0.2916667 0.007320793 1.5857057 21
## [2014] {baking_powder,
## rolls/buns} => {whole_milk} 0.002236909 0.6285714 0.003558719 2.4600080 22
## [2015] {baking_powder,
## whole_milk} => {rolls/buns} 0.002236909 0.2417582 0.009252669 1.3143683 22
## [2016] {baking_powder,
## other_vegetables} => {whole_milk} 0.004372140 0.5972222 0.007320793 2.3373182 43
## [2017] {baking_powder,
## whole_milk} => {other_vegetables} 0.004372140 0.4725275 0.009252669 2.4420955 43
## [2018] {flour,
## oil} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [2019] {flour,
## hygiene_articles} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [2020] {flour,
## sugar} => {curd} 0.001118454 0.2244898 0.004982206 4.2134678 11
## [2021] {curd,
## flour} => {sugar} 0.001118454 0.3548387 0.003152008 10.4799961 11
## [2022] {curd,
## sugar} => {flour} 0.001118454 0.3235294 0.003457041 18.6076711 11
## [2023] {flour,
## sugar} => {margarine} 0.001626843 0.3265306 0.004982206 5.5753968 16
## [2024] {flour,
## margarine} => {sugar} 0.001626843 0.4324324 0.003762074 12.7716906 16
## [2025] {margarine,
## sugar} => {flour} 0.001626843 0.2962963 0.005490595 17.0413689 16
## [2026] {flour,
## sugar} => {whipped/sour_cream} 0.001016777 0.2040816 0.004982206 2.8470111 10
## [2027] {flour,
## whipped/sour_cream} => {sugar} 0.001016777 0.2500000 0.004067107 7.3836336 10
## [2028] {sugar,
## whipped/sour_cream} => {flour} 0.001016777 0.2083333 0.004880529 11.9822125 10
## [2029] {flour,
## sugar} => {citrus_fruit} 0.001016777 0.2040816 0.004982206 2.4657775 10
## [2030] {citrus_fruit,
## flour} => {sugar} 0.001016777 0.3125000 0.003253686 9.2295420 10
## [2031] {citrus_fruit,
## sugar} => {flour} 0.001016777 0.2127660 0.004778851 12.2371532 10
## [2032] {flour,
## sugar} => {root_vegetables} 0.001423488 0.2857143 0.004982206 2.6212687 14
## [2033] {flour,
## root_vegetables} => {sugar} 0.001423488 0.3043478 0.004677173 8.9887714 14
## [2034] {root_vegetables,
## sugar} => {flour} 0.001423488 0.2222222 0.006405694 12.7810266 14
## [2035] {flour,
## sugar} => {soda} 0.001118454 0.2244898 0.004982206 1.2873803 11
## [2036] {flour,
## soda} => {sugar} 0.001118454 0.3928571 0.002846975 11.6028529 11
## [2037] {flour,
## sugar} => {yogurt} 0.001321810 0.2653061 0.004982206 1.9018117 13
## [2038] {flour,
## yogurt} => {sugar} 0.001321810 0.2708333 0.004880529 7.9989364 13
## [2039] {flour,
## sugar} => {other_vegetables} 0.001423488 0.2857143 0.004982206 1.4766159 14
## [2040] {flour,
## other_vegetables} => {sugar} 0.001423488 0.2258065 0.006304016 6.6690884 14
## [2041] {flour,
## sugar} => {whole_milk} 0.002846975 0.5714286 0.004982206 2.2363709 28
## [2042] {flour,
## whole_milk} => {sugar} 0.002846975 0.3373494 0.008439248 9.9634574 28
## [2043] {chicken,
## flour} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [2044] {chicken,
## flour} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [2045] {coffee,
## flour} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [2046] {beef,
## flour} => {citrus_fruit} 0.001016777 0.3571429 0.002846975 4.3151106 10
## [2047] {citrus_fruit,
## flour} => {beef} 0.001016777 0.3125000 0.003253686 5.9562742 10
## [2048] {beef,
## flour} => {root_vegetables} 0.001321810 0.4642857 0.002846975 4.2595616 13
## [2049] {flour,
## root_vegetables} => {beef} 0.001321810 0.2826087 0.004677173 5.3865436 13
## [2050] {beef,
## flour} => {rolls/buns} 0.001016777 0.3571429 0.002846975 1.9416805 10
## [2051] {flour,
## rolls/buns} => {beef} 0.001016777 0.2702703 0.003762074 5.1513723 10
## [2052] {beef,
## flour} => {other_vegetables} 0.001016777 0.3571429 0.002846975 1.8457698 10
## [2053] {beef,
## flour} => {whole_milk} 0.001016777 0.3571429 0.002846975 1.3977318 10
## [2054] {curd,
## flour} => {whipped/sour_cream} 0.001321810 0.4193548 0.003152008 5.8501487 13
## [2055] {flour,
## whipped/sour_cream} => {curd} 0.001321810 0.3250000 0.004067107 6.0999523 13
## [2056] {curd,
## flour} => {yogurt} 0.001118454 0.3548387 0.003152008 2.5436142 11
## [2057] {flour,
## yogurt} => {curd} 0.001118454 0.2291667 0.004880529 4.3012484 11
## [2058] {curd,
## flour} => {other_vegetables} 0.001016777 0.3225806 0.003152008 1.6671469 10
## [2059] {curd,
## flour} => {whole_milk} 0.001728521 0.5483871 0.003152008 2.1461946 17
## [2060] {flour,
## whole_milk} => {curd} 0.001728521 0.2048193 0.008439248 3.8442702 17
## [2061] {flour,
## pork} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [2062] {flour,
## frankfurter} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [2063] {flour,
## margarine} => {whipped/sour_cream} 0.001118454 0.2972973 0.003762074 4.1474027 11
## [2064] {flour,
## whipped/sour_cream} => {margarine} 0.001118454 0.2750000 0.004067107 4.6955295 11
## [2065] {flour,
## margarine} => {citrus_fruit} 0.001016777 0.2702703 0.003762074 3.2654891 10
## [2066] {citrus_fruit,
## flour} => {margarine} 0.001016777 0.3125000 0.003253686 5.3358290 10
## [2067] {flour,
## margarine} => {bottled_water} 0.001016777 0.2702703 0.003762074 2.4453616 10
## [2068] {bottled_water,
## flour} => {margarine} 0.001016777 0.3703704 0.002745297 6.3239455 10
## [2069] {flour,
## margarine} => {tropical_fruit} 0.001423488 0.3783784 0.003762074 3.6059606 14
## [2070] {flour,
## tropical_fruit} => {margarine} 0.001423488 0.4375000 0.003253686 7.4701606 14
## [2071] {flour,
## margarine} => {yogurt} 0.001728521 0.4594595 0.003762074 3.2935742 17
## [2072] {flour,
## yogurt} => {margarine} 0.001728521 0.3541667 0.004880529 6.0472729 17
## [2073] {flour,
## margarine} => {rolls/buns} 0.001016777 0.2702703 0.003762074 1.4693798 10
## [2074] {flour,
## rolls/buns} => {margarine} 0.001016777 0.2702703 0.003762074 4.6147710 10
## [2075] {flour,
## margarine} => {other_vegetables} 0.001423488 0.3783784 0.003762074 1.9555183 14
## [2076] {flour,
## other_vegetables} => {margarine} 0.001423488 0.2258065 0.006304016 3.8555668 14
## [2077] {flour,
## margarine} => {whole_milk} 0.001931876 0.5135135 0.003762074 2.0097117 19
## [2078] {flour,
## whole_milk} => {margarine} 0.001931876 0.2289157 0.008439248 3.9086555 19
## [2079] {butter,
## flour} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [2080] {butter,
## flour} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [2081] {domestic_eggs,
## flour} => {other_vegetables} 0.001016777 0.3125000 0.003253686 1.6150486 10
## [2082] {domestic_eggs,
## flour} => {whole_milk} 0.001626843 0.5000000 0.003253686 1.9568245 16
## [2083] {flour,
## fruit/vegetable_juice} => {yogurt} 0.001321810 0.5416667 0.002440264 3.8828656 13
## [2084] {flour,
## yogurt} => {fruit/vegetable_juice} 0.001321810 0.2708333 0.004880529 3.7463373 13
## [2085] {flour,
## fruit/vegetable_juice} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [2086] {flour,
## whipped/sour_cream} => {citrus_fruit} 0.001016777 0.2500000 0.004067107 3.0205774 10
## [2087] {citrus_fruit,
## flour} => {whipped/sour_cream} 0.001016777 0.3125000 0.003253686 4.3594858 10
## [2088] {flour,
## whipped/sour_cream} => {root_vegetables} 0.001728521 0.4250000 0.004067107 3.8991371 17
## [2089] {flour,
## root_vegetables} => {whipped/sour_cream} 0.001728521 0.3695652 0.004677173 5.1555658 17
## [2090] {flour,
## whipped/sour_cream} => {yogurt} 0.001626843 0.4000000 0.004067107 2.8673469 16
## [2091] {flour,
## yogurt} => {whipped/sour_cream} 0.001626843 0.3333333 0.004880529 4.6501182 16
## [2092] {flour,
## whipped/sour_cream} => {other_vegetables} 0.001830198 0.4500000 0.004067107 2.3256700 18
## [2093] {flour,
## other_vegetables} => {whipped/sour_cream} 0.001830198 0.2903226 0.006304016 4.0501030 18
## [2094] {flour,
## whipped/sour_cream} => {whole_milk} 0.002541942 0.6250000 0.004067107 2.4460306 25
## [2095] {flour,
## whole_milk} => {whipped/sour_cream} 0.002541942 0.3012048 0.008439248 4.2019140 25
## [2096] {flour,
## pip_fruit} => {yogurt} 0.001016777 0.4347826 0.002338587 3.1166815 10
## [2097] {flour,
## yogurt} => {pip_fruit} 0.001016777 0.2083333 0.004880529 2.7539763 10
## [2098] {flour,
## pip_fruit} => {whole_milk} 0.001220132 0.5217391 0.002338587 2.0419038 12
## [2099] {flour,
## pastry} => {other_vegetables} 0.001220132 0.4800000 0.002541942 2.4807147 12
## [2100] {flour,
## pastry} => {whole_milk} 0.001220132 0.4800000 0.002541942 1.8785515 12
## [2101] {citrus_fruit,
## flour} => {root_vegetables} 0.001016777 0.3125000 0.003253686 2.8670126 10
## [2102] {flour,
## root_vegetables} => {citrus_fruit} 0.001016777 0.2173913 0.004677173 2.6265890 10
## [2103] {citrus_fruit,
## flour} => {yogurt} 0.001016777 0.3125000 0.003253686 2.2401148 10
## [2104] {flour,
## yogurt} => {citrus_fruit} 0.001016777 0.2083333 0.004880529 2.5171478 10
## [2105] {citrus_fruit,
## flour} => {rolls/buns} 0.001118454 0.3437500 0.003253686 1.8688675 11
## [2106] {flour,
## rolls/buns} => {citrus_fruit} 0.001118454 0.2972973 0.003762074 3.5920380 11
## [2107] {citrus_fruit,
## flour} => {other_vegetables} 0.001728521 0.5312500 0.003253686 2.7455826 17
## [2108] {flour,
## other_vegetables} => {citrus_fruit} 0.001728521 0.2741935 0.006304016 3.3128913 17
## [2109] {citrus_fruit,
## flour} => {whole_milk} 0.001626843 0.5000000 0.003253686 1.9568245 16
## [2110] {flour,
## shopping_bags} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [2111] {bottled_water,
## flour} => {yogurt} 0.001220132 0.4444444 0.002745297 3.1859410 12
## [2112] {flour,
## yogurt} => {bottled_water} 0.001220132 0.2500000 0.004880529 2.2619595 12
## [2113] {bottled_water,
## flour} => {whole_milk} 0.001220132 0.4444444 0.002745297 1.7393996 12
## [2114] {flour,
## tropical_fruit} => {yogurt} 0.001423488 0.4375000 0.003253686 3.1361607 14
## [2115] {flour,
## yogurt} => {tropical_fruit} 0.001423488 0.2916667 0.004880529 2.7795946 14
## [2116] {flour,
## tropical_fruit} => {other_vegetables} 0.001830198 0.5625000 0.003253686 2.9070875 18
## [2117] {flour,
## other_vegetables} => {tropical_fruit} 0.001830198 0.2903226 0.006304016 2.7667854 18
## [2118] {flour,
## tropical_fruit} => {whole_milk} 0.001626843 0.5000000 0.003253686 1.9568245 16
## [2119] {flour,
## root_vegetables} => {yogurt} 0.001728521 0.3695652 0.004677173 2.6491792 17
## [2120] {flour,
## yogurt} => {root_vegetables} 0.001728521 0.3541667 0.004880529 3.2492809 17
## [2121] {flour,
## root_vegetables} => {rolls/buns} 0.001220132 0.2608696 0.004677173 1.4182710 12
## [2122] {flour,
## rolls/buns} => {root_vegetables} 0.001220132 0.3243243 0.003762074 2.9754942 12
## [2123] {flour,
## root_vegetables} => {other_vegetables} 0.002338587 0.5000000 0.004677173 2.5840778 23
## [2124] {flour,
## other_vegetables} => {root_vegetables} 0.002338587 0.3709677 0.006304016 3.4034214 23
## [2125] {flour,
## root_vegetables} => {whole_milk} 0.002948653 0.6304348 0.004677173 2.4673005 29
## [2126] {flour,
## whole_milk} => {root_vegetables} 0.002948653 0.3493976 0.008439248 3.2055273 29
## [2127] {flour,
## soda} => {other_vegetables} 0.001016777 0.3571429 0.002846975 1.8457698 10
## [2128] {flour,
## soda} => {whole_milk} 0.001220132 0.4285714 0.002846975 1.6772782 12
## [2129] {flour,
## yogurt} => {rolls/buns} 0.001118454 0.2291667 0.004880529 1.2459116 11
## [2130] {flour,
## rolls/buns} => {yogurt} 0.001118454 0.2972973 0.003762074 2.1311362 11
## [2131] {flour,
## yogurt} => {other_vegetables} 0.002745297 0.5625000 0.004880529 2.9070875 27
## [2132] {flour,
## other_vegetables} => {yogurt} 0.002745297 0.4354839 0.006304016 3.1217084 27
## [2133] {flour,
## yogurt} => {whole_milk} 0.002541942 0.5208333 0.004880529 2.0383589 25
## [2134] {flour,
## whole_milk} => {yogurt} 0.002541942 0.3012048 0.008439248 2.1591468 25
## [2135] {flour,
## rolls/buns} => {other_vegetables} 0.001931876 0.5135135 0.003762074 2.6539177 19
## [2136] {flour,
## other_vegetables} => {rolls/buns} 0.001931876 0.3064516 0.006304016 1.6660871 19
## [2137] {flour,
## rolls/buns} => {whole_milk} 0.002033554 0.5405405 0.003762074 2.1154860 20
## [2138] {flour,
## whole_milk} => {rolls/buns} 0.002033554 0.2409639 0.008439248 1.3100495 20
## [2139] {flour,
## other_vegetables} => {whole_milk} 0.003762074 0.5967742 0.006304016 2.3355647 37
## [2140] {flour,
## whole_milk} => {other_vegetables} 0.003762074 0.4457831 0.008439248 2.3038766 37
## [2141] {hard_cheese,
## soft_cheese} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [2142] {ham,
## soft_cheese} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [2143] {ham,
## soft_cheese} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [2144] {sliced_cheese,
## soft_cheese} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [2145] {sliced_cheese,
## soft_cheese} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [2146] {onions,
## soft_cheese} => {other_vegetables} 0.001321810 0.7647059 0.001728521 3.9521189 13
## [2147] {long_life_bakery_product,
## soft_cheese} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [2148] {cream_cheese_,
## soft_cheese} => {root_vegetables} 0.001118454 0.5500000 0.002033554 5.0459422 11
## [2149] {root_vegetables,
## soft_cheese} => {cream_cheese_} 0.001118454 0.3333333 0.003355363 8.4059829 11
## [2150] {cream_cheese_,
## soft_cheese} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [2151] {cream_cheese_,
## soft_cheese} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [2152] {cream_cheese_,
## soft_cheese} => {whole_milk} 0.001423488 0.7000000 0.002033554 2.7395543 14
## [2153] {chicken,
## soft_cheese} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [2154] {chocolate,
## soft_cheese} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [2155] {chocolate,
## soft_cheese} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [2156] {coffee,
## soft_cheese} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [2157] {coffee,
## soft_cheese} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [2158] {coffee,
## soft_cheese} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [2159] {frozen_vegetables,
## soft_cheese} => {fruit/vegetable_juice} 0.001016777 0.4545455 0.002236909 6.2875591 10
## [2160] {fruit/vegetable_juice,
## soft_cheese} => {frozen_vegetables} 0.001016777 0.3703704 0.002745297 7.7010414 10
## [2161] {frozen_vegetables,
## soft_cheese} => {other_vegetables} 0.001626843 0.7272727 0.002236909 3.7586586 16
## [2162] {other_vegetables,
## soft_cheese} => {frozen_vegetables} 0.001626843 0.2285714 0.007117438 4.7526427 16
## [2163] {frozen_vegetables,
## soft_cheese} => {whole_milk} 0.001525165 0.6818182 0.002236909 2.6683971 15
## [2164] {soft_cheese,
## whole_milk} => {frozen_vegetables} 0.001525165 0.2027027 0.007524148 4.2147592 15
## [2165] {beef,
## soft_cheese} => {rolls/buns} 0.001016777 0.4166667 0.002440264 2.2652939 10
## [2166] {beef,
## soft_cheese} => {other_vegetables} 0.001321810 0.5416667 0.002440264 2.7994176 13
## [2167] {beef,
## soft_cheese} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [2168] {curd,
## soft_cheese} => {whipped/sour_cream} 0.001016777 0.4545455 0.002236909 6.3410703 10
## [2169] {soft_cheese,
## whipped/sour_cream} => {curd} 0.001016777 0.3333333 0.003050330 6.2563613 10
## [2170] {curd,
## soft_cheese} => {yogurt} 0.001525165 0.6818182 0.002236909 4.8875232 15
## [2171] {soft_cheese,
## yogurt} => {curd} 0.001525165 0.2542373 0.005998983 4.7718010 15
## [2172] {curd,
## soft_cheese} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [2173] {curd,
## soft_cheese} => {whole_milk} 0.001423488 0.6363636 0.002236909 2.4905039 14
## [2174] {frankfurter,
## soft_cheese} => {yogurt} 0.001016777 0.4545455 0.002236909 3.2583488 10
## [2175] {frankfurter,
## soft_cheese} => {rolls/buns} 0.001220132 0.5454545 0.002236909 2.9654757 12
## [2176] {rolls/buns,
## soft_cheese} => {frankfurter} 0.001220132 0.2264151 0.005388917 3.8392973 12
## [2177] {frankfurter,
## soft_cheese} => {other_vegetables} 0.001423488 0.6363636 0.002236909 3.2888263 14
## [2178] {other_vegetables,
## soft_cheese} => {frankfurter} 0.001423488 0.2000000 0.007117438 3.3913793 14
## [2179] {margarine,
## soft_cheese} => {yogurt} 0.001118454 0.5000000 0.002236909 3.5841837 11
## [2180] {margarine,
## soft_cheese} => {other_vegetables} 0.001525165 0.6818182 0.002236909 3.5237424 15
## [2181] {other_vegetables,
## soft_cheese} => {margarine} 0.001525165 0.2142857 0.007117438 3.6588542 15
## [2182] {margarine,
## soft_cheese} => {whole_milk} 0.001423488 0.6363636 0.002236909 2.4905039 14
## [2183] {butter,
## soft_cheese} => {domestic_eggs} 0.001016777 0.3703704 0.002745297 5.8374881 10
## [2184] {domestic_eggs,
## soft_cheese} => {butter} 0.001016777 0.3225806 0.003152008 5.8212489 10
## [2185] {butter,
## soft_cheese} => {whipped/sour_cream} 0.001016777 0.3703704 0.002745297 5.1667980 10
## [2186] {soft_cheese,
## whipped/sour_cream} => {butter} 0.001016777 0.3333333 0.003050330 6.0152905 10
## [2187] {butter,
## soft_cheese} => {yogurt} 0.001525165 0.5555556 0.002745297 3.9824263 15
## [2188] {soft_cheese,
## yogurt} => {butter} 0.001525165 0.2542373 0.005998983 4.5879334 15
## [2189] {butter,
## soft_cheese} => {other_vegetables} 0.001626843 0.5925926 0.002745297 3.0626107 16
## [2190] {other_vegetables,
## soft_cheese} => {butter} 0.001626843 0.2285714 0.007117438 4.1247706 16
## [2191] {butter,
## soft_cheese} => {whole_milk} 0.002033554 0.7407407 0.002745297 2.8989993 20
## [2192] {soft_cheese,
## whole_milk} => {butter} 0.002033554 0.2702703 0.007524148 4.8772626 20
## [2193] {domestic_eggs,
## soft_cheese} => {tropical_fruit} 0.001016777 0.3225806 0.003152008 3.0742061 10
## [2194] {soft_cheese,
## tropical_fruit} => {domestic_eggs} 0.001016777 0.3125000 0.003253686 4.9253806 10
## [2195] {domestic_eggs,
## soft_cheese} => {root_vegetables} 0.001220132 0.3870968 0.003152008 3.5513962 12
## [2196] {root_vegetables,
## soft_cheese} => {domestic_eggs} 0.001220132 0.3636364 0.003355363 5.7313520 12
## [2197] {domestic_eggs,
## soft_cheese} => {yogurt} 0.001728521 0.5483871 0.003152008 3.9310402 17
## [2198] {soft_cheese,
## yogurt} => {domestic_eggs} 0.001728521 0.2881356 0.005998983 4.5413679 17
## [2199] {domestic_eggs,
## soft_cheese} => {rolls/buns} 0.001423488 0.4516129 0.003152008 2.4552863 14
## [2200] {rolls/buns,
## soft_cheese} => {domestic_eggs} 0.001423488 0.2641509 0.005388917 4.1633406 14
## [2201] {domestic_eggs,
## soft_cheese} => {other_vegetables} 0.002033554 0.6451613 0.003152008 3.3342939 20
## [2202] {other_vegetables,
## soft_cheese} => {domestic_eggs} 0.002033554 0.2857143 0.007117438 4.5032051 20
## [2203] {domestic_eggs,
## soft_cheese} => {whole_milk} 0.002135231 0.6774194 0.003152008 2.6511816 21
## [2204] {soft_cheese,
## whole_milk} => {domestic_eggs} 0.002135231 0.2837838 0.007524148 4.4727781 21
## [2205] {fruit/vegetable_juice,
## soft_cheese} => {tropical_fruit} 0.001016777 0.3703704 0.002745297 3.5296440 10
## [2206] {soft_cheese,
## tropical_fruit} => {fruit/vegetable_juice} 0.001016777 0.3125000 0.003253686 4.3226969 10
## [2207] {fruit/vegetable_juice,
## soft_cheese} => {yogurt} 0.001830198 0.6666667 0.002745297 4.7789116 18
## [2208] {soft_cheese,
## yogurt} => {fruit/vegetable_juice} 0.001830198 0.3050847 0.005998983 4.2201244 18
## [2209] {fruit/vegetable_juice,
## soft_cheese} => {other_vegetables} 0.001626843 0.5925926 0.002745297 3.0626107 16
## [2210] {other_vegetables,
## soft_cheese} => {fruit/vegetable_juice} 0.001626843 0.2285714 0.007117438 3.1617440 16
## [2211] {fruit/vegetable_juice,
## soft_cheese} => {whole_milk} 0.001728521 0.6296296 0.002745297 2.4641494 17
## [2212] {soft_cheese,
## whole_milk} => {fruit/vegetable_juice} 0.001728521 0.2297297 0.007524148 3.1777664 17
## [2213] {soft_cheese,
## whipped/sour_cream} => {tropical_fruit} 0.001321810 0.4333333 0.003050330 4.1296835 13
## [2214] {soft_cheese,
## tropical_fruit} => {whipped/sour_cream} 0.001321810 0.4062500 0.003253686 5.6673316 13
## [2215] {soft_cheese,
## whipped/sour_cream} => {root_vegetables} 0.001321810 0.4333333 0.003050330 3.9755908 13
## [2216] {root_vegetables,
## soft_cheese} => {whipped/sour_cream} 0.001321810 0.3939394 0.003355363 5.4955942 13
## [2217] {soft_cheese,
## whipped/sour_cream} => {yogurt} 0.001525165 0.5000000 0.003050330 3.5841837 15
## [2218] {soft_cheese,
## yogurt} => {whipped/sour_cream} 0.001525165 0.2542373 0.005998983 3.5467003 15
## [2219] {soft_cheese,
## whipped/sour_cream} => {rolls/buns} 0.001016777 0.3333333 0.003050330 1.8122351 10
## [2220] {soft_cheese,
## whipped/sour_cream} => {other_vegetables} 0.002236909 0.7333333 0.003050330 3.7899807 22
## [2221] {other_vegetables,
## soft_cheese} => {whipped/sour_cream} 0.002236909 0.3142857 0.007117438 4.3843972 22
## [2222] {soft_cheese,
## whipped/sour_cream} => {whole_milk} 0.002033554 0.6666667 0.003050330 2.6090994 20
## [2223] {soft_cheese,
## whole_milk} => {whipped/sour_cream} 0.002033554 0.2702703 0.007524148 3.7703661 20
## [2224] {pip_fruit,
## soft_cheese} => {root_vegetables} 0.001016777 0.3448276 0.002948653 3.1636001 10
## [2225] {root_vegetables,
## soft_cheese} => {pip_fruit} 0.001016777 0.3030303 0.003355363 4.0057836 10
## [2226] {pip_fruit,
## soft_cheese} => {yogurt} 0.001220132 0.4137931 0.002948653 2.9662210 12
## [2227] {soft_cheese,
## yogurt} => {pip_fruit} 0.001220132 0.2033898 0.005998983 2.6886277 12
## [2228] {pip_fruit,
## soft_cheese} => {other_vegetables} 0.001321810 0.4482759 0.002948653 2.3167594 13
## [2229] {pip_fruit,
## soft_cheese} => {whole_milk} 0.001321810 0.4482759 0.002948653 1.7543944 13
## [2230] {pastry,
## soft_cheese} => {shopping_bags} 0.001016777 0.3703704 0.002745297 3.7591255 10
## [2231] {shopping_bags,
## soft_cheese} => {pastry} 0.001016777 0.3571429 0.002846975 4.0142857 10
## [2232] {pastry,
## soft_cheese} => {yogurt} 0.001220132 0.4444444 0.002745297 3.1859410 12
## [2233] {soft_cheese,
## yogurt} => {pastry} 0.001220132 0.2033898 0.005998983 2.2861017 12
## [2234] {pastry,
## soft_cheese} => {rolls/buns} 0.001016777 0.3703704 0.002745297 2.0135946 10
## [2235] {pastry,
## soft_cheese} => {other_vegetables} 0.001423488 0.5185185 0.002745297 2.6797844 14
## [2236] {other_vegetables,
## soft_cheese} => {pastry} 0.001423488 0.2000000 0.007117438 2.2480000 14
## [2237] {pastry,
## soft_cheese} => {whole_milk} 0.001220132 0.4444444 0.002745297 1.7393996 12
## [2238] {citrus_fruit,
## soft_cheese} => {root_vegetables} 0.001016777 0.3846154 0.002643620 3.5286309 10
## [2239] {root_vegetables,
## soft_cheese} => {citrus_fruit} 0.001016777 0.3030303 0.003355363 3.6613059 10
## [2240] {citrus_fruit,
## soft_cheese} => {yogurt} 0.001118454 0.4230769 0.002643620 3.0327708 11
## [2241] {citrus_fruit,
## soft_cheese} => {other_vegetables} 0.001525165 0.5769231 0.002643620 2.9816282 15
## [2242] {other_vegetables,
## soft_cheese} => {citrus_fruit} 0.001525165 0.2142857 0.007117438 2.5890663 15
## [2243] {citrus_fruit,
## soft_cheese} => {whole_milk} 0.001525165 0.5769231 0.002643620 2.2578744 15
## [2244] {soft_cheese,
## whole_milk} => {citrus_fruit} 0.001525165 0.2027027 0.007524148 2.4491168 15
## [2245] {shopping_bags,
## soft_cheese} => {yogurt} 0.001118454 0.3928571 0.002846975 2.8161443 11
## [2246] {shopping_bags,
## soft_cheese} => {rolls/buns} 0.001220132 0.4285714 0.002846975 2.3300166 12
## [2247] {rolls/buns,
## soft_cheese} => {shopping_bags} 0.001220132 0.2264151 0.005388917 2.2980314 12
## [2248] {shopping_bags,
## soft_cheese} => {other_vegetables} 0.001220132 0.4285714 0.002846975 2.2149238 12
## [2249] {sausage,
## soft_cheese} => {root_vegetables} 0.001016777 0.2941176 0.003457041 2.6983648 10
## [2250] {root_vegetables,
## soft_cheese} => {sausage} 0.001016777 0.3030303 0.003355363 3.2254362 10
## [2251] {sausage,
## soft_cheese} => {yogurt} 0.001423488 0.4117647 0.003457041 2.9516807 14
## [2252] {soft_cheese,
## yogurt} => {sausage} 0.001423488 0.2372881 0.005998983 2.5256805 14
## [2253] {sausage,
## soft_cheese} => {rolls/buns} 0.001525165 0.4411765 0.003457041 2.3985465 15
## [2254] {rolls/buns,
## soft_cheese} => {sausage} 0.001525165 0.2830189 0.005388917 3.0124357 15
## [2255] {sausage,
## soft_cheese} => {other_vegetables} 0.001830198 0.5294118 0.003457041 2.7360823 18
## [2256] {other_vegetables,
## soft_cheese} => {sausage} 0.001830198 0.2571429 0.007117438 2.7370130 18
## [2257] {sausage,
## soft_cheese} => {whole_milk} 0.001118454 0.3235294 0.003457041 1.2661806 11
## [2258] {bottled_water,
## soft_cheese} => {yogurt} 0.001321810 0.6190476 0.002135231 4.4375607 13
## [2259] {soft_cheese,
## yogurt} => {bottled_water} 0.001321810 0.2203390 0.005998983 1.9935914 13
## [2260] {bottled_water,
## soft_cheese} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [2261] {soft_cheese,
## tropical_fruit} => {yogurt} 0.001931876 0.5937500 0.003253686 4.2562181 19
## [2262] {soft_cheese,
## yogurt} => {tropical_fruit} 0.001931876 0.3220339 0.005998983 3.0689955 19
## [2263] {soft_cheese,
## tropical_fruit} => {other_vegetables} 0.002135231 0.6562500 0.003253686 3.3916021 21
## [2264] {other_vegetables,
## soft_cheese} => {tropical_fruit} 0.002135231 0.3000000 0.007117438 2.8590116 21
## [2265] {soft_cheese,
## tropical_fruit} => {whole_milk} 0.002135231 0.6562500 0.003253686 2.5683322 21
## [2266] {soft_cheese,
## whole_milk} => {tropical_fruit} 0.002135231 0.2837838 0.007524148 2.7044705 21
## [2267] {root_vegetables,
## soft_cheese} => {yogurt} 0.001626843 0.4848485 0.003355363 3.4755720 16
## [2268] {soft_cheese,
## yogurt} => {root_vegetables} 0.001626843 0.2711864 0.005998983 2.4879838 16
## [2269] {root_vegetables,
## soft_cheese} => {other_vegetables} 0.002440264 0.7272727 0.003355363 3.7586586 24
## [2270] {other_vegetables,
## soft_cheese} => {root_vegetables} 0.002440264 0.3428571 0.007117438 3.1455224 24
## [2271] {root_vegetables,
## soft_cheese} => {whole_milk} 0.002338587 0.6969697 0.003355363 2.7276948 23
## [2272] {soft_cheese,
## whole_milk} => {root_vegetables} 0.002338587 0.3108108 0.007524148 2.8515152 23
## [2273] {soda,
## soft_cheese} => {yogurt} 0.001118454 0.4074074 0.002745297 2.9204460 11
## [2274] {soda,
## soft_cheese} => {other_vegetables} 0.001321810 0.4814815 0.002745297 2.4883712 13
## [2275] {soda,
## soft_cheese} => {whole_milk} 0.001016777 0.3703704 0.002745297 1.4494996 10
## [2276] {soft_cheese,
## yogurt} => {rolls/buns} 0.002135231 0.3559322 0.005998983 1.9350985 21
## [2277] {rolls/buns,
## soft_cheese} => {yogurt} 0.002135231 0.3962264 0.005388917 2.8402965 21
## [2278] {soft_cheese,
## yogurt} => {other_vegetables} 0.002846975 0.4745763 0.005998983 2.4526840 28
## [2279] {other_vegetables,
## soft_cheese} => {yogurt} 0.002846975 0.4000000 0.007117438 2.8673469 28
## [2280] {soft_cheese,
## yogurt} => {whole_milk} 0.003457041 0.5762712 0.005998983 2.2553232 34
## [2281] {soft_cheese,
## whole_milk} => {yogurt} 0.003457041 0.4594595 0.007524148 3.2935742 34
## [2282] {rolls/buns,
## soft_cheese} => {other_vegetables} 0.002135231 0.3962264 0.005388917 2.0477597 21
## [2283] {other_vegetables,
## soft_cheese} => {rolls/buns} 0.002135231 0.3000000 0.007117438 1.6310116 21
## [2284] {rolls/buns,
## soft_cheese} => {whole_milk} 0.001931876 0.3584906 0.005388917 1.4030063 19
## [2285] {soft_cheese,
## whole_milk} => {rolls/buns} 0.001931876 0.2567568 0.007524148 1.3959108 19
## [2286] {other_vegetables,
## soft_cheese} => {whole_milk} 0.003457041 0.4857143 0.007117438 1.9009152 34
## [2287] {soft_cheese,
## whole_milk} => {other_vegetables} 0.003457041 0.4594595 0.007524148 2.3745580 34
## [2288] {salty_snack,
## specialty_bar} => {soda} 0.001016777 0.4347826 0.002338587 2.4933452 10
## [2289] {salty_snack,
## specialty_bar} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [2290] {salty_snack,
## specialty_bar} => {whole_milk} 0.001016777 0.4347826 0.002338587 1.7015865 10
## [2291] {specialty_bar,
## waffles} => {pastry} 0.001118454 0.3928571 0.002846975 4.4157143 11
## [2292] {pastry,
## specialty_bar} => {waffles} 0.001118454 0.2619048 0.004270463 6.8143739 11
## [2293] {specialty_bar,
## waffles} => {tropical_fruit} 0.001016777 0.3571429 0.002846975 3.4035853 10
## [2294] {specialty_bar,
## tropical_fruit} => {waffles} 0.001016777 0.3125000 0.003253686 8.1307870 10
## [2295] {specialty_bar,
## waffles} => {other_vegetables} 0.001118454 0.3928571 0.002846975 2.0303468 11
## [2296] {other_vegetables,
## specialty_bar} => {waffles} 0.001118454 0.2000000 0.005592272 5.2037037 11
## [2297] {specialty_bar,
## white_bread} => {whole_milk} 0.001016777 0.4347826 0.002338587 1.7015865 10
## [2298] {chocolate,
## specialty_bar} => {soda} 0.001016777 0.3448276 0.002948653 1.9774806 10
## [2299] {chocolate,
## specialty_bar} => {whole_milk} 0.001016777 0.3448276 0.002948653 1.3495341 10
## [2300] {coffee,
## specialty_bar} => {yogurt} 0.001118454 0.6875000 0.001626843 4.9282526 11
## [2301] {specialty_bar,
## yogurt} => {coffee} 0.001118454 0.2500000 0.004473818 4.3060420 11
## [2302] {pork,
## specialty_bar} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [2303] {other_vegetables,
## specialty_bar} => {pork} 0.001220132 0.2181818 0.005592272 3.7845118 12
## [2304] {domestic_eggs,
## specialty_bar} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [2305] {other_vegetables,
## specialty_bar} => {domestic_eggs} 0.001118454 0.2000000 0.005592272 3.1522436 11
## [2306] {fruit/vegetable_juice,
## specialty_bar} => {soda} 0.001118454 0.4230769 0.002643620 2.4262166 11
## [2307] {fruit/vegetable_juice,
## specialty_bar} => {whole_milk} 0.001220132 0.4615385 0.002643620 1.8062996 12
## [2308] {pastry,
## specialty_bar} => {soda} 0.001728521 0.4047619 0.004270463 2.3211856 17
## [2309] {soda,
## specialty_bar} => {pastry} 0.001728521 0.2394366 0.007219115 2.6912676 17
## [2310] {pastry,
## specialty_bar} => {rolls/buns} 0.001118454 0.2619048 0.004270463 1.4238990 11
## [2311] {rolls/buns,
## specialty_bar} => {pastry} 0.001118454 0.2000000 0.005592272 2.2480000 11
## [2312] {pastry,
## specialty_bar} => {other_vegetables} 0.001626843 0.3809524 0.004270463 1.9688212 16
## [2313] {other_vegetables,
## specialty_bar} => {pastry} 0.001626843 0.2909091 0.005592272 3.2698182 16
## [2314] {pastry,
## specialty_bar} => {whole_milk} 0.001423488 0.3333333 0.004270463 1.3045497 14
## [2315] {specialty_bar,
## whole_milk} => {pastry} 0.001423488 0.2187500 0.006507372 2.4587500 14
## [2316] {shopping_bags,
## specialty_bar} => {whole_milk} 0.001016777 0.2941176 0.003457041 1.1510732 10
## [2317] {sausage,
## specialty_bar} => {rolls/buns} 0.001321810 0.5652174 0.002338587 3.0729204 13
## [2318] {rolls/buns,
## specialty_bar} => {sausage} 0.001321810 0.2363636 0.005592272 2.5158402 13
## [2319] {bottled_water,
## specialty_bar} => {soda} 0.001220132 0.4444444 0.002745297 2.5487528 12
## [2320] {specialty_bar,
## tropical_fruit} => {soda} 0.001118454 0.3437500 0.003253686 1.9713010 11
## [2321] {specialty_bar,
## tropical_fruit} => {yogurt} 0.001220132 0.3750000 0.003253686 2.6881378 12
## [2322] {specialty_bar,
## yogurt} => {tropical_fruit} 0.001220132 0.2727273 0.004473818 2.5991015 12
## [2323] {specialty_bar,
## tropical_fruit} => {whole_milk} 0.001626843 0.5000000 0.003253686 1.9568245 16
## [2324] {specialty_bar,
## whole_milk} => {tropical_fruit} 0.001626843 0.2500000 0.006507372 2.3825097 16
## [2325] {root_vegetables,
## specialty_bar} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [2326] {specialty_bar,
## yogurt} => {soda} 0.001321810 0.2954545 0.004473818 1.6943414 13
## [2327] {soda,
## specialty_bar} => {rolls/buns} 0.002135231 0.2957746 0.007219115 1.6080396 21
## [2328] {rolls/buns,
## specialty_bar} => {soda} 0.002135231 0.3818182 0.005592272 2.1896104 21
## [2329] {soda,
## specialty_bar} => {other_vegetables} 0.001626843 0.2253521 0.007219115 1.1646548 16
## [2330] {other_vegetables,
## specialty_bar} => {soda} 0.001626843 0.2909091 0.005592272 1.6682746 16
## [2331] {soda,
## specialty_bar} => {whole_milk} 0.002440264 0.3380282 0.007219115 1.3229236 24
## [2332] {specialty_bar,
## whole_milk} => {soda} 0.002440264 0.3750000 0.006507372 2.1505102 24
## [2333] {specialty_bar,
## yogurt} => {rolls/buns} 0.001118454 0.2500000 0.004473818 1.3591763 11
## [2334] {rolls/buns,
## specialty_bar} => {yogurt} 0.001118454 0.2000000 0.005592272 1.4336735 11
## [2335] {specialty_bar,
## yogurt} => {other_vegetables} 0.001728521 0.3863636 0.004473818 1.9967874 17
## [2336] {other_vegetables,
## specialty_bar} => {yogurt} 0.001728521 0.3090909 0.005592272 2.2156772 17
## [2337] {specialty_bar,
## yogurt} => {whole_milk} 0.001626843 0.3636364 0.004473818 1.4231451 16
## [2338] {specialty_bar,
## whole_milk} => {yogurt} 0.001626843 0.2500000 0.006507372 1.7920918 16
## [2339] {rolls/buns,
## specialty_bar} => {other_vegetables} 0.001525165 0.2727273 0.005592272 1.4094970 15
## [2340] {other_vegetables,
## specialty_bar} => {rolls/buns} 0.001525165 0.2727273 0.005592272 1.4827378 15
## [2341] {rolls/buns,
## specialty_bar} => {whole_milk} 0.001423488 0.2545455 0.005592272 0.9962016 14
## [2342] {specialty_bar,
## whole_milk} => {rolls/buns} 0.001423488 0.2187500 0.006507372 1.1892793 14
## [2343] {other_vegetables,
## specialty_bar} => {whole_milk} 0.002440264 0.4363636 0.005592272 1.7077741 24
## [2344] {specialty_bar,
## whole_milk} => {other_vegetables} 0.002440264 0.3750000 0.006507372 1.9380583 24
## [2345] {hygiene_articles,
## misc._beverages} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [2346] {cream_cheese_,
## misc._beverages} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [2347] {chocolate,
## misc._beverages} => {soda} 0.001220132 0.5217391 0.002338587 2.9920142 12
## [2348] {coffee,
## misc._beverages} => {soda} 0.001016777 0.7692308 0.001321810 4.4113030 10
## [2349] {frozen_vegetables,
## misc._beverages} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [2350] {curd,
## misc._beverages} => {whole_milk} 0.001423488 0.7368421 0.001931876 2.8837414 14
## [2351] {misc._beverages,
## whole_milk} => {curd} 0.001423488 0.2028986 0.007015760 3.8082199 14
## [2352] {bottled_beer,
## misc._beverages} => {bottled_water} 0.001016777 0.4545455 0.002236909 4.1126537 10
## [2353] {butter,
## misc._beverages} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [2354] {misc._beverages,
## whole_milk} => {butter} 0.001423488 0.2028986 0.007015760 3.6614812 14
## [2355] {domestic_eggs,
## misc._beverages} => {whole_milk} 0.001626843 0.5517241 0.002948653 2.1592546 16
## [2356] {misc._beverages,
## whole_milk} => {domestic_eggs} 0.001626843 0.2318841 0.007015760 3.6547752 16
## [2357] {fruit/vegetable_juice,
## misc._beverages} => {bottled_water} 0.001118454 0.2820513 0.003965430 2.5519543 11
## [2358] {bottled_water,
## misc._beverages} => {fruit/vegetable_juice} 0.001118454 0.2115385 0.005287239 2.9261333 11
## [2359] {fruit/vegetable_juice,
## misc._beverages} => {tropical_fruit} 0.001423488 0.3589744 0.003965430 3.4210396 14
## [2360] {misc._beverages,
## tropical_fruit} => {fruit/vegetable_juice} 0.001423488 0.3111111 0.004575496 4.3034849 14
## [2361] {fruit/vegetable_juice,
## misc._beverages} => {yogurt} 0.001118454 0.2820513 0.003965430 2.0218472 11
## [2362] {misc._beverages,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.2500000 0.004473818 3.4581575 11
## [2363] {fruit/vegetable_juice,
## misc._beverages} => {other_vegetables} 0.001525165 0.3846154 0.003965430 1.9877521 15
## [2364] {misc._beverages,
## other_vegetables} => {fruit/vegetable_juice} 0.001525165 0.2727273 0.005592272 3.7725355 15
## [2365] {fruit/vegetable_juice,
## misc._beverages} => {whole_milk} 0.001525165 0.3846154 0.003965430 1.5052496 15
## [2366] {misc._beverages,
## whole_milk} => {fruit/vegetable_juice} 0.001525165 0.2173913 0.007015760 3.0070935 15
## [2367] {misc._beverages,
## whipped/sour_cream} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [2368] {misc._beverages,
## yogurt} => {whipped/sour_cream} 0.001016777 0.2272727 0.004473818 3.1705351 10
## [2369] {misc._beverages,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [2370] {misc._beverages,
## pip_fruit} => {tropical_fruit} 0.001321810 0.6190476 0.002135231 5.8995478 13
## [2371] {misc._beverages,
## tropical_fruit} => {pip_fruit} 0.001321810 0.2888889 0.004575496 3.8188471 13
## [2372] {misc._beverages,
## pastry} => {soda} 0.001220132 0.6315789 0.001931876 3.6219119 12
## [2373] {misc._beverages,
## pastry} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [2374] {citrus_fruit,
## misc._beverages} => {tropical_fruit} 0.001118454 0.5000000 0.002236909 4.7650194 11
## [2375] {misc._beverages,
## tropical_fruit} => {citrus_fruit} 0.001118454 0.2444444 0.004575496 2.9534535 11
## [2376] {misc._beverages,
## shopping_bags} => {soda} 0.001423488 0.3333333 0.004270463 1.9115646 14
## [2377] {misc._beverages,
## shopping_bags} => {whole_milk} 0.001220132 0.2857143 0.004270463 1.1181854 12
## [2378] {bottled_water,
## misc._beverages} => {tropical_fruit} 0.001525165 0.2884615 0.005287239 2.7490496 15
## [2379] {misc._beverages,
## tropical_fruit} => {bottled_water} 0.001525165 0.3333333 0.004575496 3.0159460 15
## [2380] {misc._beverages,
## root_vegetables} => {bottled_water} 0.001016777 0.3333333 0.003050330 3.0159460 10
## [2381] {bottled_water,
## misc._beverages} => {soda} 0.001931876 0.3653846 0.005287239 2.0953689 19
## [2382] {misc._beverages,
## soda} => {bottled_water} 0.001931876 0.2638889 0.007320793 2.3876239 19
## [2383] {bottled_water,
## misc._beverages} => {yogurt} 0.001118454 0.2115385 0.005287239 1.5163854 11
## [2384] {misc._beverages,
## yogurt} => {bottled_water} 0.001118454 0.2500000 0.004473818 2.2619595 11
## [2385] {bottled_water,
## misc._beverages} => {other_vegetables} 0.001423488 0.2692308 0.005287239 1.3914265 14
## [2386] {misc._beverages,
## other_vegetables} => {bottled_water} 0.001423488 0.2545455 0.005592272 2.3030861 14
## [2387] {bottled_water,
## misc._beverages} => {whole_milk} 0.001626843 0.3076923 0.005287239 1.2041997 16
## [2388] {misc._beverages,
## whole_milk} => {bottled_water} 0.001626843 0.2318841 0.007015760 2.0980494 16
## [2389] {misc._beverages,
## tropical_fruit} => {soda} 0.001931876 0.4222222 0.004575496 2.4213152 19
## [2390] {misc._beverages,
## soda} => {tropical_fruit} 0.001931876 0.2638889 0.007320793 2.5148713 19
## [2391] {misc._beverages,
## tropical_fruit} => {yogurt} 0.001118454 0.2444444 0.004575496 1.7522676 11
## [2392] {misc._beverages,
## yogurt} => {tropical_fruit} 0.001118454 0.2500000 0.004473818 2.3825097 11
## [2393] {misc._beverages,
## tropical_fruit} => {rolls/buns} 0.001220132 0.2666667 0.004575496 1.4497881 12
## [2394] {misc._beverages,
## rolls/buns} => {tropical_fruit} 0.001220132 0.2608696 0.004677173 2.4860971 12
## [2395] {misc._beverages,
## tropical_fruit} => {other_vegetables} 0.001728521 0.3777778 0.004575496 1.9524143 17
## [2396] {misc._beverages,
## other_vegetables} => {tropical_fruit} 0.001728521 0.3090909 0.005592272 2.9456483 17
## [2397] {misc._beverages,
## tropical_fruit} => {whole_milk} 0.001931876 0.4222222 0.004575496 1.6524296 19
## [2398] {misc._beverages,
## whole_milk} => {tropical_fruit} 0.001931876 0.2753623 0.007015760 2.6242136 19
## [2399] {misc._beverages,
## root_vegetables} => {soda} 0.001118454 0.3666667 0.003050330 2.1027211 11
## [2400] {misc._beverages,
## root_vegetables} => {other_vegetables} 0.001423488 0.4666667 0.003050330 2.4118059 14
## [2401] {misc._beverages,
## other_vegetables} => {root_vegetables} 0.001423488 0.2545455 0.005592272 2.3353121 14
## [2402] {misc._beverages,
## root_vegetables} => {whole_milk} 0.001321810 0.4333333 0.003050330 1.6959146 13
## [2403] {misc._beverages,
## soda} => {yogurt} 0.001626843 0.2222222 0.007320793 1.5929705 16
## [2404] {misc._beverages,
## yogurt} => {soda} 0.001626843 0.3636364 0.004473818 2.0853432 16
## [2405] {misc._beverages,
## soda} => {rolls/buns} 0.001830198 0.2500000 0.007320793 1.3591763 18
## [2406] {misc._beverages,
## rolls/buns} => {soda} 0.001830198 0.3913043 0.004677173 2.2440106 18
## [2407] {misc._beverages,
## soda} => {other_vegetables} 0.001728521 0.2361111 0.007320793 1.2202589 17
## [2408] {misc._beverages,
## other_vegetables} => {soda} 0.001728521 0.3090909 0.005592272 1.7725417 17
## [2409] {misc._beverages,
## soda} => {whole_milk} 0.002033554 0.2777778 0.007320793 1.0871247 20
## [2410] {misc._beverages,
## whole_milk} => {soda} 0.002033554 0.2898551 0.007015760 1.6622301 20
## [2411] {misc._beverages,
## yogurt} => {rolls/buns} 0.001220132 0.2727273 0.004473818 1.4827378 12
## [2412] {misc._beverages,
## rolls/buns} => {yogurt} 0.001220132 0.2608696 0.004677173 1.8700089 12
## [2413] {misc._beverages,
## yogurt} => {other_vegetables} 0.001525165 0.3409091 0.004473818 1.7618712 15
## [2414] {misc._beverages,
## other_vegetables} => {yogurt} 0.001525165 0.2727273 0.005592272 1.9550093 15
## [2415] {misc._beverages,
## yogurt} => {whole_milk} 0.002135231 0.4772727 0.004473818 1.8678779 21
## [2416] {misc._beverages,
## whole_milk} => {yogurt} 0.002135231 0.3043478 0.007015760 2.1816770 21
## [2417] {misc._beverages,
## other_vegetables} => {whole_milk} 0.002440264 0.4363636 0.005592272 1.7077741 24
## [2418] {misc._beverages,
## whole_milk} => {other_vegetables} 0.002440264 0.3478261 0.007015760 1.7976193 24
## [2419] {frozen_meals,
## grapes} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [2420] {grapes,
## onions} => {other_vegetables} 0.001118454 0.9166667 0.001220132 4.7374759 11
## [2421] {berries,
## grapes} => {other_vegetables} 0.001321810 0.5000000 0.002643620 2.5840778 13
## [2422] {chicken,
## grapes} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [2423] {chocolate,
## grapes} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [2424] {chocolate,
## grapes} => {whole_milk} 0.001220132 0.5000000 0.002440264 1.9568245 12
## [2425] {frozen_vegetables,
## grapes} => {other_vegetables} 0.001321810 0.6842105 0.001931876 3.5361064 13
## [2426] {frozen_vegetables,
## grapes} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [2427] {beef,
## grapes} => {root_vegetables} 0.001016777 0.4000000 0.002541942 3.6697761 10
## [2428] {grapes,
## root_vegetables} => {beef} 0.001016777 0.2272727 0.004473818 4.3318358 10
## [2429] {beef,
## grapes} => {other_vegetables} 0.001220132 0.4800000 0.002541942 2.4807147 12
## [2430] {beef,
## grapes} => {whole_milk} 0.001321810 0.5200000 0.002541942 2.0350975 13
## [2431] {curd,
## grapes} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [2432] {grapes,
## yogurt} => {curd} 0.001016777 0.2173913 0.004677173 4.0802356 10
## [2433] {curd,
## grapes} => {other_vegetables} 0.001423488 0.7000000 0.002033554 3.6177089 14
## [2434] {curd,
## grapes} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [2435] {grapes,
## napkins} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [2436] {grapes,
## pork} => {other_vegetables} 0.001626843 0.7272727 0.002236909 3.7586586 16
## [2437] {grapes,
## pork} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [2438] {frankfurter,
## grapes} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [2439] {frankfurter,
## grapes} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [2440] {brown_bread,
## grapes} => {tropical_fruit} 0.001016777 0.4545455 0.002236909 4.3318358 10
## [2441] {brown_bread,
## grapes} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [2442] {brown_bread,
## grapes} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [2443] {butter,
## grapes} => {bottled_water} 0.001016777 0.4166667 0.002440264 3.7699325 10
## [2444] {bottled_water,
## grapes} => {butter} 0.001016777 0.2325581 0.004372140 4.1967143 10
## [2445] {butter,
## grapes} => {other_vegetables} 0.001321810 0.5416667 0.002440264 2.7994176 13
## [2446] {butter,
## grapes} => {whole_milk} 0.001525165 0.6250000 0.002440264 2.4460306 15
## [2447] {grapes,
## whole_milk} => {butter} 0.001525165 0.2083333 0.007320793 3.7595566 15
## [2448] {grapes,
## newspapers} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [2449] {domestic_eggs,
## grapes} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [2450] {fruit/vegetable_juice,
## grapes} => {citrus_fruit} 0.001321810 0.4062500 0.003253686 4.9084383 13
## [2451] {citrus_fruit,
## grapes} => {fruit/vegetable_juice} 0.001321810 0.3421053 0.003863752 4.7322156 13
## [2452] {fruit/vegetable_juice,
## grapes} => {bottled_water} 0.001525165 0.4687500 0.003253686 4.2411741 15
## [2453] {bottled_water,
## grapes} => {fruit/vegetable_juice} 0.001525165 0.3488372 0.004372140 4.8253361 15
## [2454] {fruit/vegetable_juice,
## grapes} => {tropical_fruit} 0.001626843 0.5000000 0.003253686 4.7650194 16
## [2455] {grapes,
## tropical_fruit} => {fruit/vegetable_juice} 0.001626843 0.2666667 0.006100661 3.6887014 16
## [2456] {fruit/vegetable_juice,
## grapes} => {yogurt} 0.001118454 0.3437500 0.003253686 2.4641263 11
## [2457] {grapes,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.2391304 0.004677173 3.3078028 11
## [2458] {fruit/vegetable_juice,
## grapes} => {other_vegetables} 0.001423488 0.4375000 0.003253686 2.2610681 14
## [2459] {fruit/vegetable_juice,
## grapes} => {whole_milk} 0.001626843 0.5000000 0.003253686 1.9568245 16
## [2460] {grapes,
## whole_milk} => {fruit/vegetable_juice} 0.001626843 0.2222222 0.007320793 3.0739178 16
## [2461] {grapes,
## whipped/sour_cream} => {bottled_water} 0.001016777 0.3333333 0.003050330 3.0159460 10
## [2462] {bottled_water,
## grapes} => {whipped/sour_cream} 0.001016777 0.2325581 0.004372140 3.2442685 10
## [2463] {grapes,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.3333333 0.003050330 3.0581468 10
## [2464] {grapes,
## root_vegetables} => {whipped/sour_cream} 0.001016777 0.2272727 0.004473818 3.1705351 10
## [2465] {grapes,
## whipped/sour_cream} => {other_vegetables} 0.001626843 0.5333333 0.003050330 2.7563496 16
## [2466] {grapes,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.5000000 0.003050330 1.9568245 15
## [2467] {grapes,
## whole_milk} => {whipped/sour_cream} 0.001525165 0.2083333 0.007320793 2.9063239 15
## [2468] {grapes,
## pip_fruit} => {citrus_fruit} 0.001016777 0.2702703 0.003762074 3.2654891 10
## [2469] {citrus_fruit,
## grapes} => {pip_fruit} 0.001016777 0.2631579 0.003863752 3.4787068 10
## [2470] {grapes,
## pip_fruit} => {tropical_fruit} 0.002135231 0.5675676 0.003762074 5.4089409 21
## [2471] {grapes,
## tropical_fruit} => {pip_fruit} 0.002135231 0.3500000 0.006100661 4.6266801 21
## [2472] {grapes,
## pip_fruit} => {root_vegetables} 0.001118454 0.2972973 0.003762074 2.7275363 11
## [2473] {grapes,
## root_vegetables} => {pip_fruit} 0.001118454 0.2500000 0.004473818 3.3047715 11
## [2474] {grapes,
## pip_fruit} => {yogurt} 0.001321810 0.3513514 0.003762074 2.5186156 13
## [2475] {grapes,
## yogurt} => {pip_fruit} 0.001321810 0.2826087 0.004677173 3.7358287 13
## [2476] {grapes,
## pip_fruit} => {other_vegetables} 0.001931876 0.5135135 0.003762074 2.6539177 19
## [2477] {grapes,
## other_vegetables} => {pip_fruit} 0.001931876 0.2134831 0.009049314 2.8220521 19
## [2478] {grapes,
## pip_fruit} => {whole_milk} 0.001728521 0.4594595 0.003762074 1.7981631 17
## [2479] {grapes,
## whole_milk} => {pip_fruit} 0.001728521 0.2361111 0.007320793 3.1211731 17
## [2480] {grapes,
## pastry} => {shopping_bags} 0.001016777 0.2631579 0.003863752 2.6709576 10
## [2481] {grapes,
## shopping_bags} => {pastry} 0.001016777 0.4166667 0.002440264 4.6833333 10
## [2482] {grapes,
## pastry} => {tropical_fruit} 0.001423488 0.3684211 0.003863752 3.5110669 14
## [2483] {grapes,
## tropical_fruit} => {pastry} 0.001423488 0.2333333 0.006100661 2.6226667 14
## [2484] {grapes,
## pastry} => {soda} 0.001220132 0.3157895 0.003863752 1.8109560 12
## [2485] {grapes,
## soda} => {pastry} 0.001220132 0.3000000 0.004067107 3.3720000 12
## [2486] {grapes,
## pastry} => {rolls/buns} 0.001423488 0.3684211 0.003863752 2.0029967 14
## [2487] {grapes,
## rolls/buns} => {pastry} 0.001423488 0.2978723 0.004778851 3.3480851 14
## [2488] {grapes,
## pastry} => {other_vegetables} 0.002033554 0.5263158 0.003863752 2.7200819 20
## [2489] {grapes,
## other_vegetables} => {pastry} 0.002033554 0.2247191 0.009049314 2.5258427 20
## [2490] {grapes,
## pastry} => {whole_milk} 0.001626843 0.4210526 0.003863752 1.6478522 16
## [2491] {grapes,
## whole_milk} => {pastry} 0.001626843 0.2222222 0.007320793 2.4977778 16
## [2492] {citrus_fruit,
## grapes} => {bottled_water} 0.001016777 0.2631579 0.003863752 2.3810100 10
## [2493] {bottled_water,
## grapes} => {citrus_fruit} 0.001016777 0.2325581 0.004372140 2.8098394 10
## [2494] {citrus_fruit,
## grapes} => {tropical_fruit} 0.001830198 0.4736842 0.003863752 4.5142289 18
## [2495] {grapes,
## tropical_fruit} => {citrus_fruit} 0.001830198 0.3000000 0.006100661 3.6246929 18
## [2496] {citrus_fruit,
## grapes} => {root_vegetables} 0.001220132 0.3157895 0.003863752 2.8971917 12
## [2497] {grapes,
## root_vegetables} => {citrus_fruit} 0.001220132 0.2727273 0.004473818 3.2951753 12
## [2498] {citrus_fruit,
## grapes} => {rolls/buns} 0.001321810 0.3421053 0.003863752 1.8599255 13
## [2499] {grapes,
## rolls/buns} => {citrus_fruit} 0.001321810 0.2765957 0.004778851 3.3419154 13
## [2500] {citrus_fruit,
## grapes} => {other_vegetables} 0.001728521 0.4473684 0.003863752 2.3120696 17
## [2501] {citrus_fruit,
## grapes} => {whole_milk} 0.001321810 0.3421053 0.003863752 1.3388799 13
## [2502] {grapes,
## shopping_bags} => {tropical_fruit} 0.001016777 0.4166667 0.002440264 3.9708495 10
## [2503] {grapes,
## sausage} => {tropical_fruit} 0.001016777 0.3225806 0.003152008 3.0742061 10
## [2504] {grapes,
## sausage} => {soda} 0.001016777 0.3225806 0.003152008 1.8499013 10
## [2505] {grapes,
## soda} => {sausage} 0.001016777 0.2500000 0.004067107 2.6609848 10
## [2506] {grapes,
## sausage} => {other_vegetables} 0.001830198 0.5806452 0.003152008 3.0008645 18
## [2507] {grapes,
## other_vegetables} => {sausage} 0.001830198 0.2022472 0.009049314 2.1527068 18
## [2508] {grapes,
## sausage} => {whole_milk} 0.001321810 0.4193548 0.003152008 1.6412077 13
## [2509] {bottled_water,
## grapes} => {tropical_fruit} 0.001423488 0.3255814 0.004372140 3.1028033 14
## [2510] {grapes,
## tropical_fruit} => {bottled_water} 0.001423488 0.2333333 0.006100661 2.1111622 14
## [2511] {bottled_water,
## grapes} => {soda} 0.001321810 0.3023256 0.004372140 1.7337447 13
## [2512] {grapes,
## soda} => {bottled_water} 0.001321810 0.3250000 0.004067107 2.9405474 13
## [2513] {bottled_water,
## grapes} => {yogurt} 0.001220132 0.2790698 0.004372140 2.0004746 12
## [2514] {grapes,
## yogurt} => {bottled_water} 0.001220132 0.2608696 0.004677173 2.3603056 12
## [2515] {bottled_water,
## grapes} => {other_vegetables} 0.001830198 0.4186047 0.004372140 2.1634139 18
## [2516] {grapes,
## other_vegetables} => {bottled_water} 0.001830198 0.2022472 0.009049314 1.8298998 18
## [2517] {bottled_water,
## grapes} => {whole_milk} 0.002033554 0.4651163 0.004372140 1.8203019 20
## [2518] {grapes,
## whole_milk} => {bottled_water} 0.002033554 0.2777778 0.007320793 2.5132884 20
## [2519] {grapes,
## tropical_fruit} => {root_vegetables} 0.001525165 0.2500000 0.006100661 2.2936101 15
## [2520] {grapes,
## root_vegetables} => {tropical_fruit} 0.001525165 0.3409091 0.004473818 3.2488768 15
## [2521] {grapes,
## tropical_fruit} => {soda} 0.001423488 0.2333333 0.006100661 1.3380952 14
## [2522] {grapes,
## soda} => {tropical_fruit} 0.001423488 0.3500000 0.004067107 3.3355136 14
## [2523] {grapes,
## tropical_fruit} => {yogurt} 0.001728521 0.2833333 0.006100661 2.0310374 17
## [2524] {grapes,
## yogurt} => {tropical_fruit} 0.001728521 0.3695652 0.004677173 3.5219708 17
## [2525] {grapes,
## rolls/buns} => {tropical_fruit} 0.001118454 0.2340426 0.004778851 2.2304346 11
## [2526] {grapes,
## tropical_fruit} => {other_vegetables} 0.003660397 0.6000000 0.006100661 3.1008933 36
## [2527] {grapes,
## other_vegetables} => {tropical_fruit} 0.003660397 0.4044944 0.009049314 3.8548471 36
## [2528] {grapes,
## tropical_fruit} => {whole_milk} 0.002541942 0.4166667 0.006100661 1.6306871 25
## [2529] {grapes,
## whole_milk} => {tropical_fruit} 0.002541942 0.3472222 0.007320793 3.3090412 25
## [2530] {grapes,
## root_vegetables} => {yogurt} 0.001016777 0.2272727 0.004473818 1.6291744 10
## [2531] {grapes,
## yogurt} => {root_vegetables} 0.001016777 0.2173913 0.004677173 1.9944435 10
## [2532] {grapes,
## root_vegetables} => {rolls/buns} 0.001321810 0.2954545 0.004473818 1.6062993 13
## [2533] {grapes,
## rolls/buns} => {root_vegetables} 0.001321810 0.2765957 0.004778851 2.5376111 13
## [2534] {grapes,
## root_vegetables} => {other_vegetables} 0.002745297 0.6136364 0.004473818 3.1713682 27
## [2535] {grapes,
## other_vegetables} => {root_vegetables} 0.002745297 0.3033708 0.009049314 2.7832572 27
## [2536] {grapes,
## root_vegetables} => {whole_milk} 0.001931876 0.4318182 0.004473818 1.6899848 19
## [2537] {grapes,
## whole_milk} => {root_vegetables} 0.001931876 0.2638889 0.007320793 2.4210329 19
## [2538] {grapes,
## soda} => {rolls/buns} 0.001525165 0.3750000 0.004067107 2.0387645 15
## [2539] {grapes,
## rolls/buns} => {soda} 0.001525165 0.3191489 0.004778851 1.8302215 15
## [2540] {grapes,
## soda} => {other_vegetables} 0.001321810 0.3250000 0.004067107 1.6796506 13
## [2541] {grapes,
## soda} => {whole_milk} 0.001220132 0.3000000 0.004067107 1.1740947 12
## [2542] {grapes,
## yogurt} => {rolls/buns} 0.001220132 0.2608696 0.004677173 1.4182710 12
## [2543] {grapes,
## rolls/buns} => {yogurt} 0.001220132 0.2553191 0.004778851 1.8302215 12
## [2544] {grapes,
## yogurt} => {other_vegetables} 0.002846975 0.6086957 0.004677173 3.1458338 28
## [2545] {grapes,
## other_vegetables} => {yogurt} 0.002846975 0.3146067 0.009049314 2.2552167 28
## [2546] {grapes,
## yogurt} => {whole_milk} 0.002338587 0.5000000 0.004677173 1.9568245 23
## [2547] {grapes,
## whole_milk} => {yogurt} 0.002338587 0.3194444 0.007320793 2.2898951 23
## [2548] {grapes,
## rolls/buns} => {other_vegetables} 0.001931876 0.4042553 0.004778851 2.0892544 19
## [2549] {grapes,
## other_vegetables} => {rolls/buns} 0.001931876 0.2134831 0.009049314 1.1606450 19
## [2550] {grapes,
## rolls/buns} => {whole_milk} 0.001220132 0.2553191 0.004778851 0.9992295 12
## [2551] {grapes,
## other_vegetables} => {whole_milk} 0.003863752 0.4269663 0.009049314 1.6709962 38
## [2552] {grapes,
## whole_milk} => {other_vegetables} 0.003863752 0.5277778 0.007320793 2.7276376 38
## [2553] {cat_food,
## hamburger_meat} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [2554] {cat_food,
## hygiene_articles} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [2555] {cat_food,
## dessert} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [2556] {cat_food,
## chocolate} => {yogurt} 0.001423488 0.4516129 0.003152008 3.2373272 14
## [2557] {cat_food,
## yogurt} => {chocolate} 0.001423488 0.2295082 0.006202339 4.6254367 14
## [2558] {cat_food,
## chocolate} => {whole_milk} 0.001626843 0.5161290 0.003152008 2.0199479 16
## [2559] {cat_food,
## coffee} => {whole_milk} 0.001118454 0.4074074 0.002745297 1.5944496 11
## [2560] {beef,
## cat_food} => {root_vegetables} 0.001118454 0.3235294 0.003457041 2.9682013 11
## [2561] {cat_food,
## root_vegetables} => {beef} 0.001118454 0.2391304 0.004677173 4.5578446 11
## [2562] {beef,
## cat_food} => {yogurt} 0.001220132 0.3529412 0.003457041 2.5300120 12
## [2563] {beef,
## cat_food} => {rolls/buns} 0.001220132 0.3529412 0.003457041 1.9188372 12
## [2564] {cat_food,
## rolls/buns} => {beef} 0.001220132 0.3076923 0.003965430 5.8646392 12
## [2565] {beef,
## cat_food} => {other_vegetables} 0.001118454 0.3235294 0.003457041 1.6720503 11
## [2566] {beef,
## cat_food} => {whole_milk} 0.001728521 0.5000000 0.003457041 1.9568245 17
## [2567] {cat_food,
## curd} => {whole_milk} 0.001728521 0.7391304 0.002338587 2.8926971 17
## [2568] {cat_food,
## napkins} => {bottled_water} 0.001220132 0.3428571 0.003558719 3.1021159 12
## [2569] {bottled_water,
## cat_food} => {napkins} 0.001220132 0.2727273 0.004473818 5.2082966 12
## [2570] {cat_food,
## napkins} => {tropical_fruit} 0.001016777 0.2857143 0.003558719 2.7228682 10
## [2571] {cat_food,
## tropical_fruit} => {napkins} 0.001016777 0.2127660 0.004778851 4.0632101 10
## [2572] {cat_food,
## napkins} => {yogurt} 0.001525165 0.4285714 0.003558719 3.0721574 15
## [2573] {cat_food,
## yogurt} => {napkins} 0.001525165 0.2459016 0.006202339 4.6960051 15
## [2574] {cat_food,
## napkins} => {other_vegetables} 0.001220132 0.3428571 0.003558719 1.7719390 12
## [2575] {cat_food,
## napkins} => {whole_milk} 0.001626843 0.4571429 0.003558719 1.7890967 16
## [2576] {cat_food,
## pork} => {root_vegetables} 0.001220132 0.5000000 0.002440264 4.5872201 12
## [2577] {cat_food,
## root_vegetables} => {pork} 0.001220132 0.2608696 0.004677173 4.5249597 12
## [2578] {cat_food,
## pork} => {other_vegetables} 0.001321810 0.5416667 0.002440264 2.7994176 13
## [2579] {cat_food,
## other_vegetables} => {pork} 0.001321810 0.2031250 0.006507372 3.5233410 13
## [2580] {cat_food,
## pork} => {whole_milk} 0.001321810 0.5416667 0.002440264 2.1198932 13
## [2581] {brown_bread,
## cat_food} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [2582] {cat_food,
## margarine} => {yogurt} 0.001016777 0.3448276 0.002948653 2.4718508 10
## [2583] {cat_food,
## margarine} => {whole_milk} 0.001118454 0.3793103 0.002948653 1.4844876 11
## [2584] {butter,
## cat_food} => {whole_milk} 0.001728521 0.7083333 0.002440264 2.7721681 17
## [2585] {cat_food,
## newspapers} => {whole_milk} 0.001016777 0.3703704 0.002745297 1.4494996 10
## [2586] {cat_food,
## domestic_eggs} => {other_vegetables} 0.001016777 0.3846154 0.002643620 1.9877521 10
## [2587] {cat_food,
## domestic_eggs} => {whole_milk} 0.001118454 0.4230769 0.002643620 1.6557746 11
## [2588] {cat_food,
## fruit/vegetable_juice} => {soda} 0.001016777 0.4347826 0.002338587 2.4933452 10
## [2589] {cat_food,
## soda} => {fruit/vegetable_juice} 0.001016777 0.2222222 0.004575496 3.0739178 10
## [2590] {cat_food,
## fruit/vegetable_juice} => {yogurt} 0.001220132 0.5217391 0.002338587 3.7400177 12
## [2591] {cat_food,
## fruit/vegetable_juice} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [2592] {cat_food,
## fruit/vegetable_juice} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [2593] {cat_food,
## whipped/sour_cream} => {yogurt} 0.001118454 0.3928571 0.002846975 2.8161443 11
## [2594] {cat_food,
## whipped/sour_cream} => {other_vegetables} 0.001931876 0.6785714 0.002846975 3.5069627 19
## [2595] {cat_food,
## other_vegetables} => {whipped/sour_cream} 0.001931876 0.2968750 0.006507372 4.1415115 19
## [2596] {cat_food,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.5357143 0.002846975 2.0965977 15
## [2597] {cat_food,
## pip_fruit} => {tropical_fruit} 0.001423488 0.5833333 0.002440264 5.5591893 14
## [2598] {cat_food,
## tropical_fruit} => {pip_fruit} 0.001423488 0.2978723 0.004778851 3.9376001 14
## [2599] {cat_food,
## pip_fruit} => {root_vegetables} 0.001118454 0.4583333 0.002440264 4.2049518 11
## [2600] {cat_food,
## root_vegetables} => {pip_fruit} 0.001118454 0.2391304 0.004677173 3.1610858 11
## [2601] {cat_food,
## pip_fruit} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [2602] {cat_food,
## pastry} => {tropical_fruit} 0.001118454 0.3548387 0.003152008 3.3816267 11
## [2603] {cat_food,
## tropical_fruit} => {pastry} 0.001118454 0.2340426 0.004778851 2.6306383 11
## [2604] {cat_food,
## pastry} => {yogurt} 0.001016777 0.3225806 0.003152008 2.3123766 10
## [2605] {cat_food,
## pastry} => {rolls/buns} 0.001016777 0.3225806 0.003152008 1.7537759 10
## [2606] {cat_food,
## rolls/buns} => {pastry} 0.001016777 0.2564103 0.003965430 2.8820513 10
## [2607] {cat_food,
## pastry} => {other_vegetables} 0.001118454 0.3548387 0.003152008 1.8338616 11
## [2608] {cat_food,
## citrus_fruit} => {bottled_water} 0.001016777 0.2777778 0.003660397 2.5132884 10
## [2609] {bottled_water,
## cat_food} => {citrus_fruit} 0.001016777 0.2272727 0.004473818 2.7459795 10
## [2610] {cat_food,
## citrus_fruit} => {tropical_fruit} 0.001016777 0.2777778 0.003660397 2.6472330 10
## [2611] {cat_food,
## tropical_fruit} => {citrus_fruit} 0.001016777 0.2127660 0.004778851 2.5707042 10
## [2612] {cat_food,
## citrus_fruit} => {root_vegetables} 0.001525165 0.4166667 0.003660397 3.8226835 15
## [2613] {cat_food,
## root_vegetables} => {citrus_fruit} 0.001525165 0.3260870 0.004677173 3.9398836 15
## [2614] {cat_food,
## citrus_fruit} => {yogurt} 0.001728521 0.4722222 0.003660397 3.3850624 17
## [2615] {cat_food,
## yogurt} => {citrus_fruit} 0.001728521 0.2786885 0.006202339 3.3672010 17
## [2616] {cat_food,
## citrus_fruit} => {other_vegetables} 0.001626843 0.4444444 0.003660397 2.2969580 16
## [2617] {cat_food,
## other_vegetables} => {citrus_fruit} 0.001626843 0.2500000 0.006507372 3.0205774 16
## [2618] {cat_food,
## citrus_fruit} => {whole_milk} 0.001626843 0.4444444 0.003660397 1.7393996 16
## [2619] {cat_food,
## shopping_bags} => {tropical_fruit} 0.001016777 0.2222222 0.004575496 2.1177864 10
## [2620] {cat_food,
## tropical_fruit} => {shopping_bags} 0.001016777 0.2127660 0.004778851 2.1594976 10
## [2621] {cat_food,
## shopping_bags} => {root_vegetables} 0.001321810 0.2888889 0.004575496 2.6503939 13
## [2622] {cat_food,
## root_vegetables} => {shopping_bags} 0.001321810 0.2826087 0.004677173 2.8683762 13
## [2623] {cat_food,
## shopping_bags} => {other_vegetables} 0.001525165 0.3333333 0.004575496 1.7227185 15
## [2624] {cat_food,
## other_vegetables} => {shopping_bags} 0.001525165 0.2343750 0.006507372 2.3788216 15
## [2625] {cat_food,
## shopping_bags} => {whole_milk} 0.001423488 0.3111111 0.004575496 1.2175797 14
## [2626] {cat_food,
## sausage} => {yogurt} 0.001118454 0.3142857 0.003558719 2.2529155 11
## [2627] {cat_food,
## sausage} => {other_vegetables} 0.001423488 0.4000000 0.003558719 2.0672622 14
## [2628] {cat_food,
## other_vegetables} => {sausage} 0.001423488 0.2187500 0.006507372 2.3283617 14
## [2629] {cat_food,
## sausage} => {whole_milk} 0.001220132 0.3428571 0.003558719 1.3418225 12
## [2630] {bottled_water,
## cat_food} => {tropical_fruit} 0.001423488 0.3181818 0.004473818 3.0322851 14
## [2631] {cat_food,
## tropical_fruit} => {bottled_water} 0.001423488 0.2978723 0.004778851 2.6951007 14
## [2632] {bottled_water,
## cat_food} => {soda} 0.001220132 0.2727273 0.004473818 1.5640074 12
## [2633] {cat_food,
## soda} => {bottled_water} 0.001220132 0.2666667 0.004575496 2.4127568 12
## [2634] {bottled_water,
## cat_food} => {yogurt} 0.001626843 0.3636364 0.004473818 2.6066790 16
## [2635] {cat_food,
## yogurt} => {bottled_water} 0.001626843 0.2622951 0.006202339 2.3732034 16
## [2636] {bottled_water,
## cat_food} => {rolls/buns} 0.001016777 0.2272727 0.004473818 1.2356149 10
## [2637] {cat_food,
## rolls/buns} => {bottled_water} 0.001016777 0.2564103 0.003965430 2.3199585 10
## [2638] {bottled_water,
## cat_food} => {other_vegetables} 0.001423488 0.3181818 0.004473818 1.6444131 14
## [2639] {cat_food,
## other_vegetables} => {bottled_water} 0.001423488 0.2187500 0.006507372 1.9792146 14
## [2640] {bottled_water,
## cat_food} => {whole_milk} 0.001626843 0.3636364 0.004473818 1.4231451 16
## [2641] {cat_food,
## tropical_fruit} => {root_vegetables} 0.001220132 0.2553191 0.004778851 2.3424103 12
## [2642] {cat_food,
## root_vegetables} => {tropical_fruit} 0.001220132 0.2608696 0.004677173 2.4860971 12
## [2643] {cat_food,
## tropical_fruit} => {soda} 0.001118454 0.2340426 0.004778851 1.3421624 11
## [2644] {cat_food,
## soda} => {tropical_fruit} 0.001118454 0.2444444 0.004575496 2.3295650 11
## [2645] {cat_food,
## tropical_fruit} => {yogurt} 0.001931876 0.4042553 0.004778851 2.8978506 19
## [2646] {cat_food,
## yogurt} => {tropical_fruit} 0.001931876 0.3114754 0.006202339 2.9683727 19
## [2647] {cat_food,
## tropical_fruit} => {rolls/buns} 0.001220132 0.2553191 0.004778851 1.3880950 12
## [2648] {cat_food,
## rolls/buns} => {tropical_fruit} 0.001220132 0.3076923 0.003965430 2.9323196 12
## [2649] {cat_food,
## tropical_fruit} => {other_vegetables} 0.001830198 0.3829787 0.004778851 1.9792936 18
## [2650] {cat_food,
## other_vegetables} => {tropical_fruit} 0.001830198 0.2812500 0.006507372 2.6803234 18
## [2651] {cat_food,
## tropical_fruit} => {whole_milk} 0.002643620 0.5531915 0.004778851 2.1649973 26
## [2652] {cat_food,
## whole_milk} => {tropical_fruit} 0.002643620 0.2988506 0.008845958 2.8480576 26
## [2653] {cat_food,
## root_vegetables} => {yogurt} 0.001423488 0.3043478 0.004677173 2.1816770 14
## [2654] {cat_food,
## yogurt} => {root_vegetables} 0.001423488 0.2295082 0.006202339 2.1056092 14
## [2655] {cat_food,
## root_vegetables} => {rolls/buns} 0.001220132 0.2608696 0.004677173 1.4182710 12
## [2656] {cat_food,
## rolls/buns} => {root_vegetables} 0.001220132 0.3076923 0.003965430 2.8229047 12
## [2657] {cat_food,
## root_vegetables} => {other_vegetables} 0.002846975 0.6086957 0.004677173 3.1458338 28
## [2658] {cat_food,
## other_vegetables} => {root_vegetables} 0.002846975 0.4375000 0.006507372 4.0138176 28
## [2659] {cat_food,
## root_vegetables} => {whole_milk} 0.002135231 0.4565217 0.004677173 1.7866659 21
## [2660] {cat_food,
## whole_milk} => {root_vegetables} 0.002135231 0.2413793 0.008845958 2.2145201 21
## [2661] {cat_food,
## soda} => {yogurt} 0.001423488 0.3111111 0.004575496 2.2301587 14
## [2662] {cat_food,
## yogurt} => {soda} 0.001423488 0.2295082 0.006202339 1.3161593 14
## [2663] {cat_food,
## soda} => {whole_milk} 0.001830198 0.4000000 0.004575496 1.5654596 18
## [2664] {cat_food,
## whole_milk} => {soda} 0.001830198 0.2068966 0.008845958 1.1864884 18
## [2665] {cat_food,
## rolls/buns} => {yogurt} 0.001220132 0.3076923 0.003965430 2.2056515 12
## [2666] {cat_food,
## yogurt} => {other_vegetables} 0.002745297 0.4426230 0.006202339 2.2875443 27
## [2667] {cat_food,
## other_vegetables} => {yogurt} 0.002745297 0.4218750 0.006507372 3.0241550 27
## [2668] {cat_food,
## yogurt} => {whole_milk} 0.002745297 0.4426230 0.006202339 1.7322709 27
## [2669] {cat_food,
## whole_milk} => {yogurt} 0.002745297 0.3103448 0.008845958 2.2246657 27
## [2670] {cat_food,
## rolls/buns} => {other_vegetables} 0.001220132 0.3076923 0.003965430 1.5902017 12
## [2671] {cat_food,
## rolls/buns} => {whole_milk} 0.001728521 0.4358974 0.003965430 1.7059496 17
## [2672] {cat_food,
## other_vegetables} => {whole_milk} 0.003050330 0.4687500 0.006507372 1.8345230 30
## [2673] {cat_food,
## whole_milk} => {other_vegetables} 0.003050330 0.3448276 0.008845958 1.7821226 30
## [2674] {candy,
## specialty_chocolate} => {whole_milk} 0.001220132 0.5217391 0.002338587 2.0419038 12
## [2675] {long_life_bakery_product,
## specialty_chocolate} => {whole_milk} 0.001016777 0.4166667 0.002440264 1.6306871 10
## [2676] {chocolate,
## specialty_chocolate} => {soda} 0.001423488 0.4516129 0.003152008 2.5898618 14
## [2677] {soda,
## specialty_chocolate} => {chocolate} 0.001423488 0.2258065 0.006304016 4.5508329 14
## [2678] {frozen_vegetables,
## specialty_chocolate} => {fruit/vegetable_juice} 0.001016777 0.6250000 0.001626843 8.6453938 10
## [2679] {fruit/vegetable_juice,
## specialty_chocolate} => {frozen_vegetables} 0.001016777 0.3846154 0.002643620 7.9972353 10
## [2680] {beef,
## specialty_chocolate} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [2681] {napkins,
## specialty_chocolate} => {soda} 0.001016777 0.4166667 0.002440264 2.3894558 10
## [2682] {napkins,
## specialty_chocolate} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [2683] {bottled_beer,
## specialty_chocolate} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [2684] {brown_bread,
## specialty_chocolate} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [2685] {specialty_chocolate,
## yogurt} => {brown_bread} 0.001016777 0.2127660 0.004778851 3.2798639 10
## [2686] {brown_bread,
## specialty_chocolate} => {whole_milk} 0.001525165 0.6250000 0.002440264 2.4460306 15
## [2687] {butter,
## specialty_chocolate} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [2688] {domestic_eggs,
## specialty_chocolate} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [2689] {fruit/vegetable_juice,
## specialty_chocolate} => {other_vegetables} 0.001016777 0.3846154 0.002643620 1.9877521 10
## [2690] {fruit/vegetable_juice,
## specialty_chocolate} => {whole_milk} 0.001321810 0.5000000 0.002643620 1.9568245 13
## [2691] {specialty_chocolate,
## whipped/sour_cream} => {yogurt} 0.001016777 0.3703704 0.002745297 2.6549509 10
## [2692] {specialty_chocolate,
## yogurt} => {whipped/sour_cream} 0.001016777 0.2127660 0.004778851 2.9681606 10
## [2693] {specialty_chocolate,
## whipped/sour_cream} => {other_vegetables} 0.001321810 0.4814815 0.002745297 2.4883712 13
## [2694] {other_vegetables,
## specialty_chocolate} => {whipped/sour_cream} 0.001321810 0.2166667 0.006100661 3.0225768 13
## [2695] {specialty_chocolate,
## whipped/sour_cream} => {whole_milk} 0.001728521 0.6296296 0.002745297 2.4641494 17
## [2696] {specialty_chocolate,
## whole_milk} => {whipped/sour_cream} 0.001728521 0.2151899 0.008032537 3.0019750 17
## [2697] {pastry,
## specialty_chocolate} => {tropical_fruit} 0.001016777 0.2702703 0.003762074 2.5756862 10
## [2698] {specialty_chocolate,
## tropical_fruit} => {pastry} 0.001016777 0.3030303 0.003355363 3.4060606 10
## [2699] {pastry,
## specialty_chocolate} => {soda} 0.001423488 0.3783784 0.003762074 2.1698842 14
## [2700] {soda,
## specialty_chocolate} => {pastry} 0.001423488 0.2258065 0.006304016 2.5380645 14
## [2701] {pastry,
## specialty_chocolate} => {rolls/buns} 0.001016777 0.2702703 0.003762074 1.4693798 10
## [2702] {pastry,
## specialty_chocolate} => {other_vegetables} 0.001321810 0.3513514 0.003762074 1.8158384 13
## [2703] {other_vegetables,
## specialty_chocolate} => {pastry} 0.001321810 0.2166667 0.006100661 2.4353333 13
## [2704] {pastry,
## specialty_chocolate} => {whole_milk} 0.001728521 0.4594595 0.003762074 1.7981631 17
## [2705] {specialty_chocolate,
## whole_milk} => {pastry} 0.001728521 0.2151899 0.008032537 2.4187342 17
## [2706] {citrus_fruit,
## specialty_chocolate} => {whole_milk} 0.001525165 0.6521739 0.002338587 2.5523798 15
## [2707] {shopping_bags,
## specialty_chocolate} => {soda} 0.001423488 0.2978723 0.004778851 1.7082067 14
## [2708] {soda,
## specialty_chocolate} => {shopping_bags} 0.001423488 0.2258065 0.006304016 2.2918539 14
## [2709] {shopping_bags,
## specialty_chocolate} => {yogurt} 0.001016777 0.2127660 0.004778851 1.5251845 10
## [2710] {specialty_chocolate,
## yogurt} => {shopping_bags} 0.001016777 0.2127660 0.004778851 2.1594976 10
## [2711] {shopping_bags,
## specialty_chocolate} => {rolls/buns} 0.001220132 0.2553191 0.004778851 1.3880950 12
## [2712] {rolls/buns,
## specialty_chocolate} => {shopping_bags} 0.001220132 0.2181818 0.005592272 2.2144666 12
## [2713] {shopping_bags,
## specialty_chocolate} => {other_vegetables} 0.001423488 0.2978723 0.004778851 1.5394506 14
## [2714] {other_vegetables,
## specialty_chocolate} => {shopping_bags} 0.001423488 0.2333333 0.006100661 2.3682491 14
## [2715] {shopping_bags,
## specialty_chocolate} => {whole_milk} 0.001016777 0.2127660 0.004778851 0.8326913 10
## [2716] {sausage,
## specialty_chocolate} => {whole_milk} 0.001220132 0.5000000 0.002440264 1.9568245 12
## [2717] {bottled_water,
## specialty_chocolate} => {tropical_fruit} 0.001118454 0.2820513 0.003965430 2.6879597 11
## [2718] {specialty_chocolate,
## tropical_fruit} => {bottled_water} 0.001118454 0.3333333 0.003355363 3.0159460 11
## [2719] {bottled_water,
## specialty_chocolate} => {yogurt} 0.001423488 0.3589744 0.003965430 2.5732601 14
## [2720] {specialty_chocolate,
## yogurt} => {bottled_water} 0.001423488 0.2978723 0.004778851 2.6951007 14
## [2721] {bottled_water,
## specialty_chocolate} => {whole_milk} 0.001626843 0.4102564 0.003965430 1.6055996 16
## [2722] {specialty_chocolate,
## whole_milk} => {bottled_water} 0.001626843 0.2025316 0.008032537 1.8324735 16
## [2723] {specialty_chocolate,
## tropical_fruit} => {yogurt} 0.001525165 0.4545455 0.003355363 3.2583488 15
## [2724] {specialty_chocolate,
## yogurt} => {tropical_fruit} 0.001525165 0.3191489 0.004778851 3.0415017 15
## [2725] {specialty_chocolate,
## tropical_fruit} => {rolls/buns} 0.001220132 0.3636364 0.003355363 1.9769838 12
## [2726] {rolls/buns,
## specialty_chocolate} => {tropical_fruit} 0.001220132 0.2181818 0.005592272 2.0792812 12
## [2727] {specialty_chocolate,
## tropical_fruit} => {whole_milk} 0.001423488 0.4242424 0.003355363 1.6603360 14
## [2728] {root_vegetables,
## specialty_chocolate} => {soda} 0.001016777 0.3030303 0.003355363 1.7377860 10
## [2729] {root_vegetables,
## specialty_chocolate} => {other_vegetables} 0.001525165 0.4545455 0.003355363 2.3491616 15
## [2730] {other_vegetables,
## specialty_chocolate} => {root_vegetables} 0.001525165 0.2500000 0.006100661 2.2936101 15
## [2731] {root_vegetables,
## specialty_chocolate} => {whole_milk} 0.001728521 0.5151515 0.003355363 2.0161222 17
## [2732] {specialty_chocolate,
## whole_milk} => {root_vegetables} 0.001728521 0.2151899 0.008032537 1.9742466 17
## [2733] {soda,
## specialty_chocolate} => {rolls/buns} 0.001626843 0.2580645 0.006304016 1.4030207 16
## [2734] {rolls/buns,
## specialty_chocolate} => {soda} 0.001626843 0.2909091 0.005592272 1.6682746 16
## [2735] {other_vegetables,
## specialty_chocolate} => {soda} 0.001220132 0.2000000 0.006100661 1.1469388 12
## [2736] {soda,
## specialty_chocolate} => {whole_milk} 0.001423488 0.2258065 0.006304016 0.8837272 14
## [2737] {specialty_chocolate,
## yogurt} => {rolls/buns} 0.001321810 0.2765957 0.004778851 1.5037696 13
## [2738] {rolls/buns,
## specialty_chocolate} => {yogurt} 0.001321810 0.2363636 0.005592272 1.6943414 13
## [2739] {specialty_chocolate,
## yogurt} => {other_vegetables} 0.001321810 0.2765957 0.004778851 1.4294898 13
## [2740] {other_vegetables,
## specialty_chocolate} => {yogurt} 0.001321810 0.2166667 0.006100661 1.5531463 13
## [2741] {specialty_chocolate,
## yogurt} => {whole_milk} 0.002541942 0.5319149 0.004778851 2.0817282 25
## [2742] {specialty_chocolate,
## whole_milk} => {yogurt} 0.002541942 0.3164557 0.008032537 2.2684707 25
## [2743] {rolls/buns,
## specialty_chocolate} => {other_vegetables} 0.001423488 0.2545455 0.005592272 1.3155305 14
## [2744] {other_vegetables,
## specialty_chocolate} => {rolls/buns} 0.001423488 0.2333333 0.006100661 1.2685646 14
## [2745] {rolls/buns,
## specialty_chocolate} => {whole_milk} 0.002135231 0.3818182 0.005592272 1.4943024 21
## [2746] {specialty_chocolate,
## whole_milk} => {rolls/buns} 0.002135231 0.2658228 0.008032537 1.4452002 21
## [2747] {other_vegetables,
## specialty_chocolate} => {whole_milk} 0.002135231 0.3500000 0.006100661 1.3697772 21
## [2748] {specialty_chocolate,
## whole_milk} => {other_vegetables} 0.002135231 0.2658228 0.008032537 1.3738135 21
## [2749] {frozen_meals,
## meat} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [2750] {meat,
## sliced_cheese} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [2751] {hamburger_meat,
## meat} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [2752] {chicken,
## meat} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [2753] {chicken,
## meat} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [2754] {meat,
## white_bread} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [2755] {coffee,
## meat} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [2756] {coffee,
## meat} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [2757] {frozen_vegetables,
## meat} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [2758] {frozen_vegetables,
## meat} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [2759] {beef,
## meat} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [2760] {meat,
## napkins} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [2761] {meat,
## napkins} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [2762] {meat,
## pork} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [2763] {meat,
## root_vegetables} => {pork} 0.001016777 0.2000000 0.005083884 3.4691358 10
## [2764] {meat,
## pork} => {other_vegetables} 0.001525165 0.5555556 0.002745297 2.8711975 15
## [2765] {meat,
## pork} => {whole_milk} 0.001220132 0.4444444 0.002745297 1.7393996 12
## [2766] {frankfurter,
## meat} => {whole_milk} 0.001525165 0.4687500 0.003253686 1.8345230 15
## [2767] {brown_bread,
## meat} => {newspapers} 0.001016777 0.2631579 0.003863752 3.2970164 10
## [2768] {meat,
## newspapers} => {brown_bread} 0.001016777 0.3333333 0.003050330 5.1384535 10
## [2769] {brown_bread,
## meat} => {sausage} 0.001321810 0.3421053 0.003863752 3.6413477 13
## [2770] {meat,
## sausage} => {brown_bread} 0.001321810 0.2500000 0.005287239 3.8538401 13
## [2771] {brown_bread,
## meat} => {yogurt} 0.001016777 0.2631579 0.003863752 1.8864125 10
## [2772] {brown_bread,
## meat} => {other_vegetables} 0.001525165 0.3947368 0.003863752 2.0400614 15
## [2773] {brown_bread,
## meat} => {whole_milk} 0.001016777 0.2631579 0.003863752 1.0299076 10
## [2774] {margarine,
## meat} => {other_vegetables} 0.001728521 0.8500000 0.002033554 4.3929322 17
## [2775] {margarine,
## meat} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [2776] {butter,
## meat} => {yogurt} 0.001016777 0.3333333 0.003050330 2.3894558 10
## [2777] {butter,
## meat} => {rolls/buns} 0.001118454 0.3666667 0.003050330 1.9934586 11
## [2778] {butter,
## meat} => {other_vegetables} 0.001220132 0.4000000 0.003050330 2.0672622 12
## [2779] {butter,
## meat} => {whole_milk} 0.001830198 0.6000000 0.003050330 2.3481894 18
## [2780] {meat,
## newspapers} => {sausage} 0.001016777 0.3333333 0.003050330 3.5479798 10
## [2781] {meat,
## newspapers} => {soda} 0.001016777 0.3333333 0.003050330 1.9115646 10
## [2782] {meat,
## newspapers} => {yogurt} 0.001220132 0.4000000 0.003050330 2.8673469 12
## [2783] {meat,
## yogurt} => {newspapers} 0.001220132 0.2307692 0.005287239 2.8912298 12
## [2784] {meat,
## newspapers} => {rolls/buns} 0.001118454 0.3666667 0.003050330 1.9934586 11
## [2785] {meat,
## newspapers} => {other_vegetables} 0.001423488 0.4666667 0.003050330 2.4118059 14
## [2786] {meat,
## newspapers} => {whole_milk} 0.001423488 0.4666667 0.003050330 1.8263695 14
## [2787] {domestic_eggs,
## meat} => {whipped/sour_cream} 0.001118454 0.3333333 0.003355363 4.6501182 11
## [2788] {meat,
## whipped/sour_cream} => {domestic_eggs} 0.001118454 0.3142857 0.003558719 4.9535256 11
## [2789] {domestic_eggs,
## meat} => {yogurt} 0.001118454 0.3333333 0.003355363 2.3894558 11
## [2790] {meat,
## yogurt} => {domestic_eggs} 0.001118454 0.2115385 0.005287239 3.3341038 11
## [2791] {domestic_eggs,
## meat} => {rolls/buns} 0.001118454 0.3333333 0.003355363 1.8122351 11
## [2792] {domestic_eggs,
## meat} => {other_vegetables} 0.001525165 0.4545455 0.003355363 2.3491616 15
## [2793] {domestic_eggs,
## meat} => {whole_milk} 0.001728521 0.5151515 0.003355363 2.0161222 17
## [2794] {fruit/vegetable_juice,
## meat} => {yogurt} 0.001016777 0.3333333 0.003050330 2.3894558 10
## [2795] {fruit/vegetable_juice,
## meat} => {rolls/buns} 0.001016777 0.3333333 0.003050330 1.8122351 10
## [2796] {fruit/vegetable_juice,
## meat} => {whole_milk} 0.001220132 0.4000000 0.003050330 1.5654596 12
## [2797] {meat,
## whipped/sour_cream} => {root_vegetables} 0.001423488 0.4000000 0.003558719 3.6697761 14
## [2798] {meat,
## root_vegetables} => {whipped/sour_cream} 0.001423488 0.2800000 0.005083884 3.9060993 14
## [2799] {meat,
## whipped/sour_cream} => {yogurt} 0.001016777 0.2857143 0.003558719 2.0481050 10
## [2800] {meat,
## whipped/sour_cream} => {other_vegetables} 0.001626843 0.4571429 0.003558719 2.3625854 16
## [2801] {meat,
## whipped/sour_cream} => {whole_milk} 0.001728521 0.4857143 0.003558719 1.9009152 17
## [2802] {meat,
## pip_fruit} => {other_vegetables} 0.001220132 0.4444444 0.002745297 2.2969580 12
## [2803] {meat,
## pip_fruit} => {whole_milk} 0.001118454 0.4074074 0.002745297 1.5944496 11
## [2804] {meat,
## pastry} => {other_vegetables} 0.001016777 0.3846154 0.002643620 1.9877521 10
## [2805] {meat,
## pastry} => {whole_milk} 0.001525165 0.5769231 0.002643620 2.2578744 15
## [2806] {citrus_fruit,
## meat} => {root_vegetables} 0.001118454 0.3235294 0.003457041 2.9682013 11
## [2807] {meat,
## root_vegetables} => {citrus_fruit} 0.001118454 0.2200000 0.005083884 2.6581081 11
## [2808] {citrus_fruit,
## meat} => {yogurt} 0.001525165 0.4411765 0.003457041 3.1625150 15
## [2809] {meat,
## yogurt} => {citrus_fruit} 0.001525165 0.2884615 0.005287239 3.4852816 15
## [2810] {citrus_fruit,
## meat} => {other_vegetables} 0.001220132 0.3529412 0.003457041 1.8240549 12
## [2811] {citrus_fruit,
## meat} => {whole_milk} 0.001728521 0.5000000 0.003457041 1.9568245 17
## [2812] {meat,
## shopping_bags} => {sausage} 0.001321810 0.3939394 0.003355363 4.1930670 13
## [2813] {meat,
## sausage} => {shopping_bags} 0.001321810 0.2500000 0.005287239 2.5374097 13
## [2814] {meat,
## shopping_bags} => {rolls/buns} 0.001220132 0.3636364 0.003355363 1.9769838 12
## [2815] {meat,
## shopping_bags} => {other_vegetables} 0.001626843 0.4848485 0.003355363 2.5057724 16
## [2816] {meat,
## sausage} => {bottled_water} 0.001220132 0.2307692 0.005287239 2.0879626 12
## [2817] {bottled_water,
## meat} => {sausage} 0.001220132 0.4000000 0.003050330 4.2575758 12
## [2818] {meat,
## tropical_fruit} => {sausage} 0.001016777 0.3030303 0.003355363 3.2254362 10
## [2819] {meat,
## sausage} => {soda} 0.001830198 0.3461538 0.005287239 1.9850863 18
## [2820] {meat,
## soda} => {sausage} 0.001830198 0.3333333 0.005490595 3.5479798 18
## [2821] {meat,
## sausage} => {yogurt} 0.001321810 0.2500000 0.005287239 1.7920918 13
## [2822] {meat,
## yogurt} => {sausage} 0.001321810 0.2500000 0.005287239 2.6609848 13
## [2823] {meat,
## sausage} => {rolls/buns} 0.002033554 0.3846154 0.005287239 2.0910405 20
## [2824] {meat,
## rolls/buns} => {sausage} 0.002033554 0.2941176 0.006914082 3.1305704 20
## [2825] {meat,
## sausage} => {other_vegetables} 0.002338587 0.4423077 0.005287239 2.2859150 23
## [2826] {meat,
## other_vegetables} => {sausage} 0.002338587 0.2346939 0.009964413 2.4980674 23
## [2827] {meat,
## sausage} => {whole_milk} 0.001728521 0.3269231 0.005287239 1.2794622 17
## [2828] {bottled_water,
## meat} => {soda} 0.001118454 0.3666667 0.003050330 2.1027211 11
## [2829] {meat,
## soda} => {bottled_water} 0.001118454 0.2037037 0.005490595 1.8430781 11
## [2830] {bottled_water,
## meat} => {yogurt} 0.001118454 0.3666667 0.003050330 2.6284014 11
## [2831] {meat,
## yogurt} => {bottled_water} 0.001118454 0.2115385 0.005287239 1.9139657 11
## [2832] {bottled_water,
## meat} => {rolls/buns} 0.001220132 0.4000000 0.003050330 2.1746821 12
## [2833] {bottled_water,
## meat} => {other_vegetables} 0.001525165 0.5000000 0.003050330 2.5840778 15
## [2834] {meat,
## tropical_fruit} => {other_vegetables} 0.001830198 0.5454545 0.003355363 2.8189939 18
## [2835] {meat,
## tropical_fruit} => {whole_milk} 0.001220132 0.3636364 0.003355363 1.4231451 12
## [2836] {meat,
## root_vegetables} => {yogurt} 0.001423488 0.2800000 0.005083884 2.0071429 14
## [2837] {meat,
## yogurt} => {root_vegetables} 0.001423488 0.2692308 0.005287239 2.4700416 14
## [2838] {meat,
## root_vegetables} => {rolls/buns} 0.001118454 0.2200000 0.005083884 1.1960752 11
## [2839] {meat,
## root_vegetables} => {other_vegetables} 0.002745297 0.5400000 0.005083884 2.7908040 27
## [2840] {meat,
## other_vegetables} => {root_vegetables} 0.002745297 0.2755102 0.009964413 2.5276519 27
## [2841] {meat,
## root_vegetables} => {whole_milk} 0.003152008 0.6200000 0.005083884 2.4264624 31
## [2842] {meat,
## whole_milk} => {root_vegetables} 0.003152008 0.3163265 0.009964413 2.9021189 31
## [2843] {meat,
## soda} => {yogurt} 0.001525165 0.2777778 0.005490595 1.9912132 15
## [2844] {meat,
## yogurt} => {soda} 0.001525165 0.2884615 0.005287239 1.6542386 15
## [2845] {meat,
## soda} => {rolls/buns} 0.002338587 0.4259259 0.005490595 2.3156338 23
## [2846] {meat,
## rolls/buns} => {soda} 0.002338587 0.3382353 0.006914082 1.9396759 23
## [2847] {meat,
## soda} => {other_vegetables} 0.002033554 0.3703704 0.005490595 1.9141317 20
## [2848] {meat,
## other_vegetables} => {soda} 0.002033554 0.2040816 0.009964413 1.1703457 20
## [2849] {meat,
## soda} => {whole_milk} 0.001830198 0.3333333 0.005490595 1.3045497 18
## [2850] {meat,
## yogurt} => {rolls/buns} 0.001830198 0.3461538 0.005287239 1.8819365 18
## [2851] {meat,
## rolls/buns} => {yogurt} 0.001830198 0.2647059 0.006914082 1.8975090 18
## [2852] {meat,
## yogurt} => {other_vegetables} 0.002846975 0.5384615 0.005287239 2.7828530 28
## [2853] {meat,
## other_vegetables} => {yogurt} 0.002846975 0.2857143 0.009964413 2.0481050 28
## [2854] {meat,
## yogurt} => {whole_milk} 0.002440264 0.4615385 0.005287239 1.8062996 24
## [2855] {meat,
## whole_milk} => {yogurt} 0.002440264 0.2448980 0.009964413 1.7555185 24
## [2856] {meat,
## rolls/buns} => {other_vegetables} 0.003152008 0.4558824 0.006914082 2.3560709 31
## [2857] {meat,
## other_vegetables} => {rolls/buns} 0.003152008 0.3163265 0.009964413 1.7197741 31
## [2858] {meat,
## rolls/buns} => {whole_milk} 0.003253686 0.4705882 0.006914082 1.8417172 32
## [2859] {meat,
## whole_milk} => {rolls/buns} 0.003253686 0.3265306 0.009964413 1.7752507 32
## [2860] {meat,
## other_vegetables} => {whole_milk} 0.004168785 0.4183673 0.009964413 1.6373430 41
## [2861] {meat,
## whole_milk} => {other_vegetables} 0.004168785 0.4183673 0.009964413 2.1621875 41
## [2862] {frozen_meals,
## sliced_cheese} => {yogurt} 0.001118454 0.5789474 0.001931876 4.1501074 11
## [2863] {frozen_meals,
## sliced_cheese} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [2864] {frozen_meals,
## salty_snack} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [2865] {frozen_meals,
## long_life_bakery_product} => {fruit/vegetable_juice} 0.001016777 0.3846154 0.002643620 5.3202423 10
## [2866] {frozen_meals,
## fruit/vegetable_juice} => {long_life_bakery_product} 0.001016777 0.2564103 0.003965430 6.8527035 10
## [2867] {dessert,
## frozen_meals} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [2868] {cream_cheese_,
## frozen_meals} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [2869] {frozen_meals,
## white_bread} => {root_vegetables} 0.001016777 0.4000000 0.002541942 3.6697761 10
## [2870] {frozen_meals,
## root_vegetables} => {white_bread} 0.001016777 0.2631579 0.003863752 6.2515891 10
## [2871] {frozen_meals,
## white_bread} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [2872] {chocolate,
## frozen_meals} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [2873] {frozen_meals,
## frozen_vegetables} => {yogurt} 0.001118454 0.3055556 0.003660397 2.1903345 11
## [2874] {frozen_meals,
## frozen_vegetables} => {other_vegetables} 0.001118454 0.3055556 0.003660397 1.5791586 11
## [2875] {frozen_meals,
## frozen_vegetables} => {whole_milk} 0.001321810 0.3611111 0.003660397 1.4132621 13
## [2876] {curd,
## frozen_meals} => {tropical_fruit} 0.001016777 0.4347826 0.002338587 4.1434951 10
## [2877] {curd,
## frozen_meals} => {root_vegetables} 0.001118454 0.4782609 0.002338587 4.3877758 11
## [2878] {frozen_meals,
## root_vegetables} => {curd} 0.001118454 0.2894737 0.003863752 5.4331559 11
## [2879] {curd,
## frozen_meals} => {yogurt} 0.001321810 0.5652174 0.002338587 4.0516859 13
## [2880] {frozen_meals,
## yogurt} => {curd} 0.001321810 0.2131148 0.006202339 3.9999687 13
## [2881] {curd,
## frozen_meals} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [2882] {curd,
## frozen_meals} => {whole_milk} 0.001626843 0.6956522 0.002338587 2.7225385 16
## [2883] {frozen_meals,
## napkins} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [2884] {frozen_meals,
## pork} => {whole_milk} 0.001321810 0.5909091 0.002236909 2.3126108 13
## [2885] {frankfurter,
## frozen_meals} => {pip_fruit} 0.001220132 0.4137931 0.002948653 5.4699666 12
## [2886] {frozen_meals,
## pip_fruit} => {frankfurter} 0.001220132 0.2666667 0.004575496 4.5218391 12
## [2887] {frankfurter,
## frozen_meals} => {tropical_fruit} 0.001118454 0.3793103 0.002948653 3.6148423 11
## [2888] {frozen_meals,
## tropical_fruit} => {frankfurter} 0.001118454 0.2037037 0.005490595 3.4541826 11
## [2889] {frankfurter,
## frozen_meals} => {root_vegetables} 0.001016777 0.3448276 0.002948653 3.1636001 10
## [2890] {frozen_meals,
## root_vegetables} => {frankfurter} 0.001016777 0.2631579 0.003863752 4.4623412 10
## [2891] {frankfurter,
## frozen_meals} => {other_vegetables} 0.001525165 0.5172414 0.002948653 2.6731839 15
## [2892] {frozen_meals,
## other_vegetables} => {frankfurter} 0.001525165 0.2027027 0.007524148 3.4372088 15
## [2893] {frankfurter,
## frozen_meals} => {whole_milk} 0.001830198 0.6206897 0.002948653 2.4291615 18
## [2894] {bottled_beer,
## frozen_meals} => {whole_milk} 0.001525165 0.5769231 0.002643620 2.2578744 15
## [2895] {brown_bread,
## frozen_meals} => {pip_fruit} 0.001016777 0.3571429 0.002846975 4.7211022 10
## [2896] {frozen_meals,
## pip_fruit} => {brown_bread} 0.001016777 0.2222222 0.004575496 3.4256357 10
## [2897] {brown_bread,
## frozen_meals} => {tropical_fruit} 0.001016777 0.3571429 0.002846975 3.4035853 10
## [2898] {brown_bread,
## frozen_meals} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [2899] {brown_bread,
## frozen_meals} => {other_vegetables} 0.001118454 0.3928571 0.002846975 2.0303468 11
## [2900] {brown_bread,
## frozen_meals} => {whole_milk} 0.001423488 0.5000000 0.002846975 1.9568245 14
## [2901] {butter,
## frozen_meals} => {fruit/vegetable_juice} 0.001118454 0.4074074 0.002745297 5.6355160 11
## [2902] {frozen_meals,
## fruit/vegetable_juice} => {butter} 0.001118454 0.2820513 0.003965430 5.0898612 11
## [2903] {butter,
## frozen_meals} => {whipped/sour_cream} 0.001016777 0.3703704 0.002745297 5.1667980 10
## [2904] {frozen_meals,
## whipped/sour_cream} => {butter} 0.001016777 0.3571429 0.002846975 6.4449541 10
## [2905] {butter,
## frozen_meals} => {tropical_fruit} 0.001118454 0.4074074 0.002745297 3.8826084 11
## [2906] {frozen_meals,
## tropical_fruit} => {butter} 0.001118454 0.2037037 0.005490595 3.6760109 11
## [2907] {butter,
## frozen_meals} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [2908] {frozen_meals,
## root_vegetables} => {butter} 0.001016777 0.2631579 0.003863752 4.7489136 10
## [2909] {butter,
## frozen_meals} => {yogurt} 0.001525165 0.5555556 0.002745297 3.9824263 15
## [2910] {frozen_meals,
## yogurt} => {butter} 0.001525165 0.2459016 0.006202339 4.4375094 15
## [2911] {butter,
## frozen_meals} => {other_vegetables} 0.001220132 0.4444444 0.002745297 2.2969580 12
## [2912] {butter,
## frozen_meals} => {whole_milk} 0.001626843 0.5925926 0.002745297 2.3191994 16
## [2913] {frozen_meals,
## newspapers} => {tropical_fruit} 0.001118454 0.4400000 0.002541942 4.1932171 11
## [2914] {frozen_meals,
## tropical_fruit} => {newspapers} 0.001118454 0.2037037 0.005490595 2.5521349 11
## [2915] {frozen_meals,
## newspapers} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [2916] {frozen_meals,
## newspapers} => {whole_milk} 0.001220132 0.4800000 0.002541942 1.8785515 12
## [2917] {domestic_eggs,
## frozen_meals} => {sausage} 0.001118454 0.3548387 0.003152008 3.7768817 11
## [2918] {frozen_meals,
## sausage} => {domestic_eggs} 0.001118454 0.2972973 0.003762074 4.6857675 11
## [2919] {domestic_eggs,
## frozen_meals} => {tropical_fruit} 0.001118454 0.3548387 0.003152008 3.3816267 11
## [2920] {frozen_meals,
## tropical_fruit} => {domestic_eggs} 0.001118454 0.2037037 0.005490595 3.2106185 11
## [2921] {domestic_eggs,
## frozen_meals} => {other_vegetables} 0.001220132 0.3870968 0.003152008 2.0005763 12
## [2922] {domestic_eggs,
## frozen_meals} => {whole_milk} 0.001728521 0.5483871 0.003152008 2.1461946 17
## [2923] {frozen_meals,
## fruit/vegetable_juice} => {tropical_fruit} 0.001118454 0.2820513 0.003965430 2.6879597 11
## [2924] {frozen_meals,
## tropical_fruit} => {fruit/vegetable_juice} 0.001118454 0.2037037 0.005490595 2.8177580 11
## [2925] {frozen_meals,
## fruit/vegetable_juice} => {root_vegetables} 0.001016777 0.2564103 0.003965430 2.3524206 10
## [2926] {frozen_meals,
## root_vegetables} => {fruit/vegetable_juice} 0.001016777 0.2631579 0.003863752 3.6401658 10
## [2927] {frozen_meals,
## fruit/vegetable_juice} => {soda} 0.001016777 0.2564103 0.003965430 1.4704343 10
## [2928] {frozen_meals,
## fruit/vegetable_juice} => {yogurt} 0.001423488 0.3589744 0.003965430 2.5732601 14
## [2929] {frozen_meals,
## yogurt} => {fruit/vegetable_juice} 0.001423488 0.2295082 0.006202339 3.1747020 14
## [2930] {frozen_meals,
## fruit/vegetable_juice} => {other_vegetables} 0.001728521 0.4358974 0.003965430 2.2527857 17
## [2931] {frozen_meals,
## other_vegetables} => {fruit/vegetable_juice} 0.001728521 0.2297297 0.007524148 3.1777664 17
## [2932] {frozen_meals,
## fruit/vegetable_juice} => {whole_milk} 0.001931876 0.4871795 0.003965430 1.9066495 19
## [2933] {frozen_meals,
## whipped/sour_cream} => {tropical_fruit} 0.001016777 0.3571429 0.002846975 3.4035853 10
## [2934] {frozen_meals,
## whipped/sour_cream} => {root_vegetables} 0.001321810 0.4642857 0.002846975 4.2595616 13
## [2935] {frozen_meals,
## root_vegetables} => {whipped/sour_cream} 0.001321810 0.3421053 0.003863752 4.7724897 13
## [2936] {frozen_meals,
## whipped/sour_cream} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [2937] {frozen_meals,
## whipped/sour_cream} => {other_vegetables} 0.001931876 0.6785714 0.002846975 3.5069627 19
## [2938] {frozen_meals,
## other_vegetables} => {whipped/sour_cream} 0.001931876 0.2567568 0.007524148 3.5818478 19
## [2939] {frozen_meals,
## whipped/sour_cream} => {whole_milk} 0.001626843 0.5714286 0.002846975 2.2363709 16
## [2940] {frozen_meals,
## pip_fruit} => {sausage} 0.001016777 0.2222222 0.004575496 2.3653199 10
## [2941] {frozen_meals,
## sausage} => {pip_fruit} 0.001016777 0.2702703 0.003762074 3.5727260 10
## [2942] {frozen_meals,
## pip_fruit} => {tropical_fruit} 0.002135231 0.4666667 0.004575496 4.4473514 21
## [2943] {frozen_meals,
## tropical_fruit} => {pip_fruit} 0.002135231 0.3888889 0.005490595 5.1407557 21
## [2944] {frozen_meals,
## pip_fruit} => {soda} 0.001423488 0.3111111 0.004575496 1.7841270 14
## [2945] {frozen_meals,
## soda} => {pip_fruit} 0.001423488 0.2295082 0.006202339 3.0338886 14
## [2946] {frozen_meals,
## pip_fruit} => {yogurt} 0.002033554 0.4444444 0.004575496 3.1859410 20
## [2947] {frozen_meals,
## yogurt} => {pip_fruit} 0.002033554 0.3278689 0.006202339 4.3341266 20
## [2948] {frozen_meals,
## pip_fruit} => {other_vegetables} 0.001931876 0.4222222 0.004575496 2.1821101 19
## [2949] {frozen_meals,
## other_vegetables} => {pip_fruit} 0.001931876 0.2567568 0.007524148 3.3940897 19
## [2950] {frozen_meals,
## pip_fruit} => {whole_milk} 0.002236909 0.4888889 0.004575496 1.9133395 22
## [2951] {frozen_meals,
## whole_milk} => {pip_fruit} 0.002236909 0.2268041 0.009862735 2.9981432 22
## [2952] {frozen_meals,
## pastry} => {soda} 0.001118454 0.4074074 0.002745297 2.3363568 11
## [2953] {frozen_meals,
## pastry} => {other_vegetables} 0.001016777 0.3703704 0.002745297 1.9141317 10
## [2954] {frozen_meals,
## pastry} => {whole_milk} 0.001423488 0.5185185 0.002745297 2.0292995 14
## [2955] {citrus_fruit,
## frozen_meals} => {tropical_fruit} 0.001220132 0.3636364 0.003355363 3.4654686 12
## [2956] {frozen_meals,
## tropical_fruit} => {citrus_fruit} 0.001220132 0.2222222 0.005490595 2.6849577 12
## [2957] {citrus_fruit,
## frozen_meals} => {yogurt} 0.001016777 0.3030303 0.003355363 2.1722325 10
## [2958] {citrus_fruit,
## frozen_meals} => {other_vegetables} 0.001321810 0.3939394 0.003355363 2.0359401 13
## [2959] {citrus_fruit,
## frozen_meals} => {whole_milk} 0.001220132 0.3636364 0.003355363 1.4231451 12
## [2960] {frozen_meals,
## shopping_bags} => {soda} 0.001220132 0.2608696 0.004677173 1.4960071 12
## [2961] {frozen_meals,
## shopping_bags} => {whole_milk} 0.001525165 0.3260870 0.004677173 1.2761899 15
## [2962] {frozen_meals,
## sausage} => {tropical_fruit} 0.001118454 0.2972973 0.003762074 2.8332548 11
## [2963] {frozen_meals,
## tropical_fruit} => {sausage} 0.001118454 0.2037037 0.005490595 2.1682099 11
## [2964] {frozen_meals,
## sausage} => {yogurt} 0.001321810 0.3513514 0.003762074 2.5186156 13
## [2965] {frozen_meals,
## yogurt} => {sausage} 0.001321810 0.2131148 0.006202339 2.2683805 13
## [2966] {frozen_meals,
## sausage} => {other_vegetables} 0.001626843 0.4324324 0.003762074 2.2348781 16
## [2967] {frozen_meals,
## other_vegetables} => {sausage} 0.001626843 0.2162162 0.007524148 2.3013923 16
## [2968] {frozen_meals,
## sausage} => {whole_milk} 0.001626843 0.4324324 0.003762074 1.6923888 16
## [2969] {bottled_water,
## frozen_meals} => {soda} 0.001016777 0.3225806 0.003152008 1.8499013 10
## [2970] {bottled_water,
## frozen_meals} => {yogurt} 0.001118454 0.3548387 0.003152008 2.5436142 11
## [2971] {bottled_water,
## frozen_meals} => {other_vegetables} 0.001016777 0.3225806 0.003152008 1.6671469 10
## [2972] {bottled_water,
## frozen_meals} => {whole_milk} 0.001321810 0.4193548 0.003152008 1.6412077 13
## [2973] {frozen_meals,
## tropical_fruit} => {root_vegetables} 0.001321810 0.2407407 0.005490595 2.2086616 13
## [2974] {frozen_meals,
## root_vegetables} => {tropical_fruit} 0.001321810 0.3421053 0.003863752 3.2602764 13
## [2975] {frozen_meals,
## tropical_fruit} => {soda} 0.001525165 0.2777778 0.005490595 1.5929705 15
## [2976] {frozen_meals,
## soda} => {tropical_fruit} 0.001525165 0.2459016 0.006202339 2.3434522 15
## [2977] {frozen_meals,
## tropical_fruit} => {yogurt} 0.002033554 0.3703704 0.005490595 2.6549509 20
## [2978] {frozen_meals,
## yogurt} => {tropical_fruit} 0.002033554 0.3278689 0.006202339 3.1246029 20
## [2979] {frozen_meals,
## tropical_fruit} => {rolls/buns} 0.001321810 0.2407407 0.005490595 1.3088365 13
## [2980] {frozen_meals,
## rolls/buns} => {tropical_fruit} 0.001321810 0.2708333 0.004880529 2.5810522 13
## [2981] {frozen_meals,
## tropical_fruit} => {other_vegetables} 0.002338587 0.4259259 0.005490595 2.2012514 23
## [2982] {frozen_meals,
## other_vegetables} => {tropical_fruit} 0.002338587 0.3108108 0.007524148 2.9620391 23
## [2983] {frozen_meals,
## tropical_fruit} => {whole_milk} 0.003558719 0.6481481 0.005490595 2.5366244 35
## [2984] {frozen_meals,
## whole_milk} => {tropical_fruit} 0.003558719 0.3608247 0.009862735 3.4386738 35
## [2985] {frozen_meals,
## root_vegetables} => {yogurt} 0.001830198 0.4736842 0.003863752 3.3955424 18
## [2986] {frozen_meals,
## yogurt} => {root_vegetables} 0.001830198 0.2950820 0.006202339 2.7072119 18
## [2987] {frozen_meals,
## root_vegetables} => {other_vegetables} 0.002541942 0.6578947 0.003863752 3.4001023 25
## [2988] {frozen_meals,
## other_vegetables} => {root_vegetables} 0.002541942 0.3378378 0.007524148 3.0994731 25
## [2989] {frozen_meals,
## root_vegetables} => {whole_milk} 0.002643620 0.6842105 0.003863752 2.6777599 26
## [2990] {frozen_meals,
## whole_milk} => {root_vegetables} 0.002643620 0.2680412 0.009862735 2.4591283 26
## [2991] {frozen_meals,
## soda} => {yogurt} 0.001830198 0.2950820 0.006202339 2.1152559 18
## [2992] {frozen_meals,
## yogurt} => {soda} 0.001830198 0.2950820 0.006202339 1.6922048 18
## [2993] {frozen_meals,
## soda} => {other_vegetables} 0.001728521 0.2786885 0.006202339 1.4403056 17
## [2994] {frozen_meals,
## other_vegetables} => {soda} 0.001728521 0.2297297 0.007524148 1.3174297 17
## [2995] {frozen_meals,
## soda} => {whole_milk} 0.002135231 0.3442623 0.006202339 1.3473218 21
## [2996] {frozen_meals,
## whole_milk} => {soda} 0.002135231 0.2164948 0.009862735 1.2415317 21
## [2997] {frozen_meals,
## rolls/buns} => {yogurt} 0.001118454 0.2291667 0.004880529 1.6427509 11
## [2998] {frozen_meals,
## yogurt} => {other_vegetables} 0.002033554 0.3278689 0.006202339 1.6944772 20
## [2999] {frozen_meals,
## other_vegetables} => {yogurt} 0.002033554 0.2702703 0.007524148 1.9373966 20
## [3000] {frozen_meals,
## yogurt} => {whole_milk} 0.003355363 0.5409836 0.006202339 2.1172200 33
## [3001] {frozen_meals,
## whole_milk} => {yogurt} 0.003355363 0.3402062 0.009862735 2.4387229 33
## [3002] {frozen_meals,
## rolls/buns} => {other_vegetables} 0.001118454 0.2291667 0.004880529 1.1843690 11
## [3003] {frozen_meals,
## rolls/buns} => {whole_milk} 0.002338587 0.4791667 0.004880529 1.8752902 23
## [3004] {frozen_meals,
## whole_milk} => {rolls/buns} 0.002338587 0.2371134 0.009862735 1.2891157 23
## [3005] {frozen_meals,
## other_vegetables} => {whole_milk} 0.003660397 0.4864865 0.007524148 1.9039374 36
## [3006] {frozen_meals,
## whole_milk} => {other_vegetables} 0.003660397 0.3711340 0.009862735 1.9180783 36
## [3007] {candy,
## hard_cheese} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [3008] {ham,
## hard_cheese} => {whole_milk} 0.001321810 0.4814815 0.002745297 1.8843495 13
## [3009] {hard_cheese,
## sliced_cheese} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [3010] {hard_cheese,
## sliced_cheese} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [3011] {hard_cheese,
## sliced_cheese} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [3012] {hard_cheese,
## oil} => {other_vegetables} 0.001118454 0.9166667 0.001220132 4.7374759 11
## [3013] {hard_cheese,
## onions} => {root_vegetables} 0.001016777 0.5000000 0.002033554 4.5872201 10
## [3014] {hard_cheese,
## onions} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [3015] {hard_cheese,
## sugar} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [3016] {hard_cheese,
## long_life_bakery_product} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [3017] {cream_cheese_,
## hard_cheese} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [3018] {cream_cheese_,
## hard_cheese} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [3019] {hard_cheese,
## white_bread} => {yogurt} 0.001118454 0.5500000 0.002033554 3.9426020 11
## [3020] {hard_cheese,
## white_bread} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [3021] {chocolate,
## hard_cheese} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [3022] {coffee,
## hard_cheese} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [3023] {frozen_vegetables,
## hard_cheese} => {other_vegetables} 0.001423488 0.6086957 0.002338587 3.1458338 14
## [3024] {frozen_vegetables,
## hard_cheese} => {whole_milk} 0.001016777 0.4347826 0.002338587 1.7015865 10
## [3025] {curd,
## hard_cheese} => {root_vegetables} 0.001118454 0.5238095 0.002135231 4.8056592 11
## [3026] {hard_cheese,
## root_vegetables} => {curd} 0.001118454 0.2000000 0.005592272 3.7538168 11
## [3027] {curd,
## hard_cheese} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [3028] {curd,
## hard_cheese} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [3029] {hard_cheese,
## napkins} => {fruit/vegetable_juice} 0.001016777 0.3030303 0.003355363 4.1917061 10
## [3030] {fruit/vegetable_juice,
## hard_cheese} => {napkins} 0.001016777 0.2439024 0.004168785 4.6578262 10
## [3031] {hard_cheese,
## napkins} => {tropical_fruit} 0.001016777 0.3030303 0.003355363 2.8878905 10
## [3032] {hard_cheese,
## tropical_fruit} => {napkins} 0.001016777 0.2500000 0.004067107 4.7742718 10
## [3033] {hard_cheese,
## napkins} => {root_vegetables} 0.001016777 0.3030303 0.003355363 2.7801334 10
## [3034] {hard_cheese,
## napkins} => {yogurt} 0.001321810 0.3939394 0.003355363 2.8239023 13
## [3035] {hard_cheese,
## yogurt} => {napkins} 0.001321810 0.2063492 0.006405694 3.9406688 13
## [3036] {hard_cheese,
## napkins} => {rolls/buns} 0.001016777 0.3030303 0.003355363 1.6474865 10
## [3037] {hard_cheese,
## napkins} => {other_vegetables} 0.001220132 0.3636364 0.003355363 1.8793293 12
## [3038] {hard_cheese,
## napkins} => {whole_milk} 0.001626843 0.4848485 0.003355363 1.8975268 16
## [3039] {frankfurter,
## hard_cheese} => {sausage} 0.001016777 0.4545455 0.002236909 4.8381543 10
## [3040] {frankfurter,
## hard_cheese} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [3041] {brown_bread,
## hard_cheese} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [3042] {hard_cheese,
## margarine} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [3043] {hard_cheese,
## margarine} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [3044] {butter,
## hard_cheese} => {domestic_eggs} 0.001423488 0.3589744 0.003965430 5.6578731 14
## [3045] {domestic_eggs,
## hard_cheese} => {butter} 0.001423488 0.3684211 0.003863752 6.6484790 14
## [3046] {butter,
## hard_cheese} => {fruit/vegetable_juice} 0.001016777 0.2564103 0.003965430 3.5468282 10
## [3047] {fruit/vegetable_juice,
## hard_cheese} => {butter} 0.001016777 0.2439024 0.004168785 4.4014321 10
## [3048] {butter,
## hard_cheese} => {whipped/sour_cream} 0.002033554 0.5128205 0.003965430 7.1540280 20
## [3049] {hard_cheese,
## whipped/sour_cream} => {butter} 0.002033554 0.4545455 0.004473818 8.2026689 20
## [3050] {butter,
## whipped/sour_cream} => {hard_cheese} 0.002033554 0.2000000 0.010167768 8.1618257 20
## [3051] {butter,
## hard_cheese} => {sausage} 0.001016777 0.2564103 0.003965430 2.7292152 10
## [3052] {butter,
## hard_cheese} => {tropical_fruit} 0.001321810 0.3333333 0.003965430 3.1766796 13
## [3053] {hard_cheese,
## tropical_fruit} => {butter} 0.001321810 0.3250000 0.004067107 5.8649083 13
## [3054] {butter,
## hard_cheese} => {root_vegetables} 0.001525165 0.3846154 0.003965430 3.5286309 15
## [3055] {hard_cheese,
## root_vegetables} => {butter} 0.001525165 0.2727273 0.005592272 4.9216013 15
## [3056] {butter,
## hard_cheese} => {yogurt} 0.001626843 0.4102564 0.003965430 2.9408687 16
## [3057] {hard_cheese,
## yogurt} => {butter} 0.001626843 0.2539683 0.006405694 4.5830785 16
## [3058] {butter,
## hard_cheese} => {other_vegetables} 0.002033554 0.5128205 0.003965430 2.6503362 20
## [3059] {hard_cheese,
## other_vegetables} => {butter} 0.002033554 0.2150538 0.009456024 3.8808326 20
## [3060] {butter,
## hard_cheese} => {whole_milk} 0.002135231 0.5384615 0.003965430 2.1073495 21
## [3061] {hard_cheese,
## whole_milk} => {butter} 0.002135231 0.2121212 0.010066090 3.8279121 21
## [3062] {hard_cheese,
## newspapers} => {other_vegetables} 0.001220132 0.4800000 0.002541942 2.4807147 12
## [3063] {hard_cheese,
## newspapers} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [3064] {domestic_eggs,
## hard_cheese} => {fruit/vegetable_juice} 0.001118454 0.2894737 0.003863752 4.0041824 11
## [3065] {fruit/vegetable_juice,
## hard_cheese} => {domestic_eggs} 0.001118454 0.2682927 0.004168785 4.2286194 11
## [3066] {domestic_eggs,
## hard_cheese} => {sausage} 0.001016777 0.2631579 0.003863752 2.8010367 10
## [3067] {domestic_eggs,
## hard_cheese} => {tropical_fruit} 0.001423488 0.3684211 0.003863752 3.5110669 14
## [3068] {hard_cheese,
## tropical_fruit} => {domestic_eggs} 0.001423488 0.3500000 0.004067107 5.5164263 14
## [3069] {domestic_eggs,
## hard_cheese} => {root_vegetables} 0.001626843 0.4210526 0.003863752 3.8629222 16
## [3070] {hard_cheese,
## root_vegetables} => {domestic_eggs} 0.001626843 0.2909091 0.005592272 4.5850816 16
## [3071] {domestic_eggs,
## hard_cheese} => {yogurt} 0.001728521 0.4473684 0.003863752 3.2069012 17
## [3072] {hard_cheese,
## yogurt} => {domestic_eggs} 0.001728521 0.2698413 0.006405694 4.2530271 17
## [3073] {domestic_eggs,
## hard_cheese} => {rolls/buns} 0.001220132 0.3157895 0.003863752 1.7168543 12
## [3074] {hard_cheese,
## rolls/buns} => {domestic_eggs} 0.001220132 0.2068966 0.005897306 3.2609416 12
## [3075] {domestic_eggs,
## hard_cheese} => {other_vegetables} 0.001931876 0.5000000 0.003863752 2.5840778 19
## [3076] {hard_cheese,
## other_vegetables} => {domestic_eggs} 0.001931876 0.2043011 0.009456024 3.2200338 19
## [3077] {domestic_eggs,
## hard_cheese} => {whole_milk} 0.002135231 0.5526316 0.003863752 2.1628060 21
## [3078] {hard_cheese,
## whole_milk} => {domestic_eggs} 0.002135231 0.2121212 0.010066090 3.3432887 21
## [3079] {fruit/vegetable_juice,
## hard_cheese} => {whipped/sour_cream} 0.001118454 0.2682927 0.004168785 3.7427781 11
## [3080] {hard_cheese,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001118454 0.2500000 0.004473818 3.4581575 11
## [3081] {fruit/vegetable_juice,
## hard_cheese} => {citrus_fruit} 0.001321810 0.3170732 0.004168785 3.8309762 13
## [3082] {citrus_fruit,
## hard_cheese} => {fruit/vegetable_juice} 0.001321810 0.4193548 0.003152008 5.8007804 13
## [3083] {fruit/vegetable_juice,
## hard_cheese} => {sausage} 0.001016777 0.2439024 0.004168785 2.5960828 10
## [3084] {fruit/vegetable_juice,
## hard_cheese} => {bottled_water} 0.001016777 0.2439024 0.004168785 2.2067898 10
## [3085] {bottled_water,
## hard_cheese} => {fruit/vegetable_juice} 0.001016777 0.2857143 0.003558719 3.9521800 10
## [3086] {fruit/vegetable_juice,
## hard_cheese} => {tropical_fruit} 0.001321810 0.3170732 0.004168785 3.0217196 13
## [3087] {hard_cheese,
## tropical_fruit} => {fruit/vegetable_juice} 0.001321810 0.3250000 0.004067107 4.4956048 13
## [3088] {fruit/vegetable_juice,
## hard_cheese} => {root_vegetables} 0.001626843 0.3902439 0.004168785 3.5802694 16
## [3089] {hard_cheese,
## root_vegetables} => {fruit/vegetable_juice} 0.001626843 0.2909091 0.005592272 4.0240378 16
## [3090] {fruit/vegetable_juice,
## hard_cheese} => {yogurt} 0.001931876 0.4634146 0.004168785 3.3219263 19
## [3091] {hard_cheese,
## yogurt} => {fruit/vegetable_juice} 0.001931876 0.3015873 0.006405694 4.1717456 19
## [3092] {fruit/vegetable_juice,
## hard_cheese} => {other_vegetables} 0.002033554 0.4878049 0.004168785 2.5210515 20
## [3093] {hard_cheese,
## other_vegetables} => {fruit/vegetable_juice} 0.002033554 0.2150538 0.009456024 2.9747592 20
## [3094] {fruit/vegetable_juice,
## hard_cheese} => {whole_milk} 0.002135231 0.5121951 0.004168785 2.0045519 21
## [3095] {hard_cheese,
## whole_milk} => {fruit/vegetable_juice} 0.002135231 0.2121212 0.010066090 2.9341943 21
## [3096] {hard_cheese,
## whipped/sour_cream} => {citrus_fruit} 0.001016777 0.2272727 0.004473818 2.7459795 10
## [3097] {citrus_fruit,
## hard_cheese} => {whipped/sour_cream} 0.001016777 0.3225806 0.003152008 4.5001144 10
## [3098] {hard_cheese,
## whipped/sour_cream} => {tropical_fruit} 0.001118454 0.2500000 0.004473818 2.3825097 11
## [3099] {hard_cheese,
## tropical_fruit} => {whipped/sour_cream} 0.001118454 0.2750000 0.004067107 3.8363475 11
## [3100] {hard_cheese,
## whipped/sour_cream} => {root_vegetables} 0.001626843 0.3636364 0.004473818 3.3361601 16
## [3101] {hard_cheese,
## root_vegetables} => {whipped/sour_cream} 0.001626843 0.2909091 0.005592272 4.0582850 16
## [3102] {hard_cheese,
## whipped/sour_cream} => {yogurt} 0.001728521 0.3863636 0.004473818 2.7695965 17
## [3103] {hard_cheese,
## yogurt} => {whipped/sour_cream} 0.001728521 0.2698413 0.006405694 3.7643814 17
## [3104] {hard_cheese,
## whipped/sour_cream} => {rolls/buns} 0.001016777 0.2272727 0.004473818 1.2356149 10
## [3105] {hard_cheese,
## whipped/sour_cream} => {other_vegetables} 0.002745297 0.6136364 0.004473818 3.1713682 27
## [3106] {hard_cheese,
## other_vegetables} => {whipped/sour_cream} 0.002745297 0.2903226 0.009456024 4.0501030 27
## [3107] {hard_cheese,
## whipped/sour_cream} => {whole_milk} 0.002643620 0.5909091 0.004473818 2.3126108 26
## [3108] {hard_cheese,
## whole_milk} => {whipped/sour_cream} 0.002643620 0.2626263 0.010066090 3.6637295 26
## [3109] {hard_cheese,
## pip_fruit} => {sausage} 0.001220132 0.4000000 0.003050330 4.2575758 12
## [3110] {hard_cheese,
## sausage} => {pip_fruit} 0.001220132 0.2352941 0.005185562 3.1103732 12
## [3111] {hard_cheese,
## pip_fruit} => {other_vegetables} 0.001423488 0.4666667 0.003050330 2.4118059 14
## [3112] {hard_cheese,
## pip_fruit} => {whole_milk} 0.001423488 0.4666667 0.003050330 1.8263695 14
## [3113] {hard_cheese,
## pastry} => {rolls/buns} 0.001016777 0.3571429 0.002846975 1.9416805 10
## [3114] {hard_cheese,
## pastry} => {other_vegetables} 0.001423488 0.5000000 0.002846975 2.5840778 14
## [3115] {hard_cheese,
## pastry} => {whole_milk} 0.001321810 0.4642857 0.002846975 1.8170513 13
## [3116] {citrus_fruit,
## hard_cheese} => {sausage} 0.001423488 0.4516129 0.003152008 4.8069404 14
## [3117] {hard_cheese,
## sausage} => {citrus_fruit} 0.001423488 0.2745098 0.005185562 3.3167124 14
## [3118] {citrus_fruit,
## hard_cheese} => {root_vegetables} 0.001016777 0.3225806 0.003152008 2.9594969 10
## [3119] {citrus_fruit,
## hard_cheese} => {yogurt} 0.001423488 0.4516129 0.003152008 3.2373272 14
## [3120] {hard_cheese,
## yogurt} => {citrus_fruit} 0.001423488 0.2222222 0.006405694 2.6849577 14
## [3121] {citrus_fruit,
## hard_cheese} => {other_vegetables} 0.001728521 0.5483871 0.003152008 2.8341498 17
## [3122] {citrus_fruit,
## hard_cheese} => {whole_milk} 0.001423488 0.4516129 0.003152008 1.7674544 14
## [3123] {hard_cheese,
## shopping_bags} => {yogurt} 0.001016777 0.3333333 0.003050330 2.3894558 10
## [3124] {hard_cheese,
## shopping_bags} => {rolls/buns} 0.001016777 0.3333333 0.003050330 1.8122351 10
## [3125] {hard_cheese,
## shopping_bags} => {other_vegetables} 0.001220132 0.4000000 0.003050330 2.0672622 12
## [3126] {hard_cheese,
## soda} => {sausage} 0.001016777 0.2500000 0.004067107 2.6609848 10
## [3127] {hard_cheese,
## sausage} => {yogurt} 0.001525165 0.2941176 0.005185562 2.1083433 15
## [3128] {hard_cheese,
## yogurt} => {sausage} 0.001525165 0.2380952 0.006405694 2.5342713 15
## [3129] {hard_cheese,
## sausage} => {rolls/buns} 0.001830198 0.3529412 0.005185562 1.9188372 18
## [3130] {hard_cheese,
## rolls/buns} => {sausage} 0.001830198 0.3103448 0.005897306 3.3032915 18
## [3131] {hard_cheese,
## sausage} => {other_vegetables} 0.002948653 0.5686275 0.005185562 2.9387551 29
## [3132] {hard_cheese,
## other_vegetables} => {sausage} 0.002948653 0.3118280 0.009456024 3.3190779 29
## [3133] {hard_cheese,
## sausage} => {whole_milk} 0.001931876 0.3725490 0.005185562 1.4580261 19
## [3134] {bottled_water,
## hard_cheese} => {root_vegetables} 0.001118454 0.3142857 0.003558719 2.8833955 11
## [3135] {hard_cheese,
## root_vegetables} => {bottled_water} 0.001118454 0.2000000 0.005592272 1.8095676 11
## [3136] {bottled_water,
## hard_cheese} => {yogurt} 0.001321810 0.3714286 0.003558719 2.6625364 13
## [3137] {hard_cheese,
## yogurt} => {bottled_water} 0.001321810 0.2063492 0.006405694 1.8670142 13
## [3138] {bottled_water,
## hard_cheese} => {rolls/buns} 0.001016777 0.2857143 0.003558719 1.5533444 10
## [3139] {bottled_water,
## hard_cheese} => {other_vegetables} 0.001830198 0.5142857 0.003558719 2.6579086 18
## [3140] {bottled_water,
## hard_cheese} => {whole_milk} 0.001525165 0.4285714 0.003558719 1.6772782 15
## [3141] {hard_cheese,
## tropical_fruit} => {root_vegetables} 0.001423488 0.3500000 0.004067107 3.2110541 14
## [3142] {hard_cheese,
## root_vegetables} => {tropical_fruit} 0.001423488 0.2545455 0.005592272 2.4258280 14
## [3143] {hard_cheese,
## tropical_fruit} => {yogurt} 0.001728521 0.4250000 0.004067107 3.0465561 17
## [3144] {hard_cheese,
## yogurt} => {tropical_fruit} 0.001728521 0.2698413 0.006405694 2.5715978 17
## [3145] {hard_cheese,
## tropical_fruit} => {rolls/buns} 0.001118454 0.2750000 0.004067107 1.4950940 11
## [3146] {hard_cheese,
## tropical_fruit} => {other_vegetables} 0.002033554 0.5000000 0.004067107 2.5840778 20
## [3147] {hard_cheese,
## other_vegetables} => {tropical_fruit} 0.002033554 0.2150538 0.009456024 2.0494707 20
## [3148] {hard_cheese,
## tropical_fruit} => {whole_milk} 0.002338587 0.5750000 0.004067107 2.2503482 23
## [3149] {hard_cheese,
## whole_milk} => {tropical_fruit} 0.002338587 0.2323232 0.010066090 2.2140494 23
## [3150] {hard_cheese,
## root_vegetables} => {yogurt} 0.002236909 0.4000000 0.005592272 2.8673469 22
## [3151] {hard_cheese,
## yogurt} => {root_vegetables} 0.002236909 0.3492063 0.006405694 3.2037728 22
## [3152] {hard_cheese,
## root_vegetables} => {rolls/buns} 0.001321810 0.2363636 0.005592272 1.2850394 13
## [3153] {hard_cheese,
## rolls/buns} => {root_vegetables} 0.001321810 0.2241379 0.005897306 2.0563401 13
## [3154] {hard_cheese,
## root_vegetables} => {other_vegetables} 0.003457041 0.6181818 0.005592272 3.1948598 34
## [3155] {hard_cheese,
## other_vegetables} => {root_vegetables} 0.003457041 0.3655914 0.009456024 3.3540965 34
## [3156] {hard_cheese,
## root_vegetables} => {whole_milk} 0.003253686 0.5818182 0.005592272 2.2770322 32
## [3157] {hard_cheese,
## whole_milk} => {root_vegetables} 0.003253686 0.3232323 0.010066090 2.9654757 32
## [3158] {hard_cheese,
## soda} => {yogurt} 0.001220132 0.3000000 0.004067107 2.1505102 12
## [3159] {hard_cheese,
## soda} => {other_vegetables} 0.001525165 0.3750000 0.004067107 1.9380583 15
## [3160] {hard_cheese,
## yogurt} => {rolls/buns} 0.001525165 0.2380952 0.006405694 1.2944537 15
## [3161] {hard_cheese,
## rolls/buns} => {yogurt} 0.001525165 0.2586207 0.005897306 1.8538881 15
## [3162] {hard_cheese,
## yogurt} => {other_vegetables} 0.002846975 0.4444444 0.006405694 2.2969580 28
## [3163] {hard_cheese,
## other_vegetables} => {yogurt} 0.002846975 0.3010753 0.009456024 2.1582181 28
## [3164] {hard_cheese,
## yogurt} => {whole_milk} 0.004168785 0.6507937 0.006405694 2.5469779 41
## [3165] {hard_cheese,
## whole_milk} => {yogurt} 0.004168785 0.4141414 0.010066090 2.9687178 41
## [3166] {hard_cheese,
## rolls/buns} => {other_vegetables} 0.002948653 0.5000000 0.005897306 2.5840778 29
## [3167] {hard_cheese,
## other_vegetables} => {rolls/buns} 0.002948653 0.3118280 0.009456024 1.6953167 29
## [3168] {hard_cheese,
## rolls/buns} => {whole_milk} 0.002541942 0.4310345 0.005897306 1.6869177 25
## [3169] {hard_cheese,
## whole_milk} => {rolls/buns} 0.002541942 0.2525253 0.010066090 1.3729054 25
## [3170] {hard_cheese,
## other_vegetables} => {whole_milk} 0.004372140 0.4623656 0.009456024 1.8095366 43
## [3171] {hard_cheese,
## whole_milk} => {other_vegetables} 0.004372140 0.4343434 0.010066090 2.2447544 43
## [3172] {butter_milk,
## ham} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [3173] {butter_milk,
## sliced_cheese} => {yogurt} 0.001321810 0.5416667 0.002440264 3.8828656 13
## [3174] {butter_milk,
## sliced_cheese} => {other_vegetables} 0.001220132 0.5000000 0.002440264 2.5840778 12
## [3175] {butter_milk,
## sliced_cheese} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [3176] {butter_milk,
## uht_milk} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [3177] {butter_milk,
## onions} => {other_vegetables} 0.001321810 0.8125000 0.001626843 4.1991264 13
## [3178] {butter_milk,
## onions} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [3179] {berries,
## butter_milk} => {yogurt} 0.001321810 0.6500000 0.002033554 4.6594388 13
## [3180] {butter_milk,
## hamburger_meat} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [3181] {butter_milk,
## hamburger_meat} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [3182] {butter_milk,
## waffles} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [3183] {butter_milk,
## waffles} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [3184] {butter_milk,
## long_life_bakery_product} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [3185] {butter_milk,
## dessert} => {pip_fruit} 0.001423488 0.5000000 0.002846975 6.6095430 14
## [3186] {butter_milk,
## pip_fruit} => {dessert} 0.001423488 0.2800000 0.005083884 7.5446575 14
## [3187] {dessert,
## pip_fruit} => {butter_milk} 0.001423488 0.2857143 0.004982206 10.2181818 14
## [3188] {butter_milk,
## dessert} => {yogurt} 0.001626843 0.5714286 0.002846975 4.0962099 16
## [3189] {butter_milk,
## dessert} => {other_vegetables} 0.001321810 0.4642857 0.002846975 2.3995008 13
## [3190] {butter_milk,
## dessert} => {whole_milk} 0.002033554 0.7142857 0.002846975 2.7954636 20
## [3191] {butter_milk,
## cream_cheese_} => {pip_fruit} 0.001016777 0.3125000 0.003253686 4.1309644 10
## [3192] {butter_milk,
## pip_fruit} => {cream_cheese_} 0.001016777 0.2000000 0.005083884 5.0435897 10
## [3193] {butter_milk,
## cream_cheese_} => {yogurt} 0.001525165 0.4687500 0.003253686 3.3601722 15
## [3194] {butter_milk,
## cream_cheese_} => {rolls/buns} 0.001423488 0.4375000 0.003253686 2.3785586 14
## [3195] {butter_milk,
## cream_cheese_} => {other_vegetables} 0.001626843 0.5000000 0.003253686 2.5840778 16
## [3196] {butter_milk,
## cream_cheese_} => {whole_milk} 0.001830198 0.5625000 0.003253686 2.2014276 18
## [3197] {butter_milk,
## chicken} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [3198] {butter_milk,
## chicken} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [3199] {butter_milk,
## white_bread} => {yogurt} 0.001118454 0.5500000 0.002033554 3.9426020 11
## [3200] {butter_milk,
## white_bread} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [3201] {butter_milk,
## white_bread} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [3202] {butter_milk,
## chocolate} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [3203] {butter_milk,
## chocolate} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [3204] {butter_milk,
## chocolate} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [3205] {butter_milk,
## coffee} => {whole_milk} 0.001118454 0.4230769 0.002643620 1.6557746 11
## [3206] {butter_milk,
## frozen_vegetables} => {pip_fruit} 0.001016777 0.4761905 0.002135231 6.2948029 10
## [3207] {butter_milk,
## pip_fruit} => {frozen_vegetables} 0.001016777 0.2000000 0.005083884 4.1585624 10
## [3208] {butter_milk,
## frozen_vegetables} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [3209] {butter_milk,
## frozen_vegetables} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [3210] {beef,
## butter_milk} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [3211] {beef,
## butter_milk} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [3212] {beef,
## butter_milk} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [3213] {butter_milk,
## curd} => {pip_fruit} 0.001118454 0.3437500 0.003253686 4.5440608 11
## [3214] {butter_milk,
## pip_fruit} => {curd} 0.001118454 0.2200000 0.005083884 4.1291985 11
## [3215] {butter_milk,
## curd} => {tropical_fruit} 0.001016777 0.3125000 0.003253686 2.9781371 10
## [3216] {butter_milk,
## curd} => {root_vegetables} 0.001016777 0.3125000 0.003253686 2.8670126 10
## [3217] {butter_milk,
## root_vegetables} => {curd} 0.001016777 0.2000000 0.005083884 3.7538168 10
## [3218] {butter_milk,
## curd} => {yogurt} 0.001525165 0.4687500 0.003253686 3.3601722 15
## [3219] {butter_milk,
## curd} => {other_vegetables} 0.001728521 0.5312500 0.003253686 2.7455826 17
## [3220] {butter_milk,
## curd} => {whole_milk} 0.001830198 0.5625000 0.003253686 2.2014276 18
## [3221] {butter_milk,
## napkins} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [3222] {butter_milk,
## pork} => {other_vegetables} 0.001830198 0.8571429 0.002135231 4.4298476 18
## [3223] {butter_milk,
## pork} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [3224] {butter_milk,
## frankfurter} => {root_vegetables} 0.001220132 0.3750000 0.003253686 3.4404151 12
## [3225] {butter_milk,
## root_vegetables} => {frankfurter} 0.001220132 0.2400000 0.005083884 4.0696552 12
## [3226] {butter_milk,
## frankfurter} => {rolls/buns} 0.001016777 0.3125000 0.003253686 1.6989704 10
## [3227] {butter_milk,
## frankfurter} => {other_vegetables} 0.001423488 0.4375000 0.003253686 2.2610681 14
## [3228] {butter_milk,
## frankfurter} => {whole_milk} 0.001220132 0.3750000 0.003253686 1.4676184 12
## [3229] {brown_bread,
## butter_milk} => {shopping_bags} 0.001118454 0.2972973 0.003762074 3.0174602 11
## [3230] {butter_milk,
## shopping_bags} => {brown_bread} 0.001118454 0.2894737 0.003863752 4.4623412 11
## [3231] {brown_bread,
## butter_milk} => {tropical_fruit} 0.001423488 0.3783784 0.003762074 3.6059606 14
## [3232] {butter_milk,
## tropical_fruit} => {brown_bread} 0.001423488 0.2592593 0.005490595 3.9965749 14
## [3233] {brown_bread,
## butter_milk} => {other_vegetables} 0.001525165 0.4054054 0.003762074 2.0951982 15
## [3234] {brown_bread,
## butter_milk} => {whole_milk} 0.001626843 0.4324324 0.003762074 1.6923888 16
## [3235] {butter_milk,
## margarine} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [3236] {butter,
## butter_milk} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [3237] {butter,
## butter_milk} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [3238] {butter,
## butter_milk} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [3239] {butter_milk,
## newspapers} => {rolls/buns} 0.001220132 0.5454545 0.002236909 2.9654757 12
## [3240] {butter_milk,
## newspapers} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [3241] {butter_milk,
## domestic_eggs} => {rolls/buns} 0.001016777 0.4545455 0.002236909 2.4712297 10
## [3242] {butter_milk,
## domestic_eggs} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [3243] {butter_milk,
## domestic_eggs} => {whole_milk} 0.001525165 0.6818182 0.002236909 2.6683971 15
## [3244] {butter_milk,
## fruit/vegetable_juice} => {pip_fruit} 0.001118454 0.2391304 0.004677173 3.1610858 11
## [3245] {butter_milk,
## pip_fruit} => {fruit/vegetable_juice} 0.001118454 0.2200000 0.005083884 3.0431786 11
## [3246] {butter_milk,
## fruit/vegetable_juice} => {shopping_bags} 0.001220132 0.2608696 0.004677173 2.6477319 12
## [3247] {butter_milk,
## shopping_bags} => {fruit/vegetable_juice} 0.001220132 0.3157895 0.003863752 4.3681990 12
## [3248] {butter_milk,
## fruit/vegetable_juice} => {bottled_water} 0.001118454 0.2391304 0.004677173 2.1636135 11
## [3249] {bottled_water,
## butter_milk} => {fruit/vegetable_juice} 0.001118454 0.2972973 0.003762074 4.1124035 11
## [3250] {butter_milk,
## fruit/vegetable_juice} => {tropical_fruit} 0.001626843 0.3478261 0.004677173 3.3147961 16
## [3251] {butter_milk,
## tropical_fruit} => {fruit/vegetable_juice} 0.001626843 0.2962963 0.005490595 4.0985571 16
## [3252] {butter_milk,
## fruit/vegetable_juice} => {root_vegetables} 0.001016777 0.2173913 0.004677173 1.9944435 10
## [3253] {butter_milk,
## root_vegetables} => {fruit/vegetable_juice} 0.001016777 0.2000000 0.005083884 2.7665260 10
## [3254] {butter_milk,
## fruit/vegetable_juice} => {soda} 0.001118454 0.2391304 0.004677173 1.3713398 11
## [3255] {butter_milk,
## soda} => {fruit/vegetable_juice} 0.001118454 0.2444444 0.004575496 3.3813096 11
## [3256] {butter_milk,
## fruit/vegetable_juice} => {yogurt} 0.001830198 0.3913043 0.004677173 2.8050133 18
## [3257] {butter_milk,
## yogurt} => {fruit/vegetable_juice} 0.001830198 0.2142857 0.008540925 2.9641350 18
## [3258] {butter_milk,
## fruit/vegetable_juice} => {rolls/buns} 0.001728521 0.3695652 0.004677173 2.0092172 17
## [3259] {butter_milk,
## rolls/buns} => {fruit/vegetable_juice} 0.001728521 0.2266667 0.007625826 3.1353962 17
## [3260] {butter_milk,
## fruit/vegetable_juice} => {other_vegetables} 0.002338587 0.5000000 0.004677173 2.5840778 23
## [3261] {butter_milk,
## other_vegetables} => {fruit/vegetable_juice} 0.002338587 0.2254902 0.010371124 3.1191225 23
## [3262] {butter_milk,
## fruit/vegetable_juice} => {whole_milk} 0.002135231 0.4565217 0.004677173 1.7866659 21
## [3263] {butter_milk,
## whipped/sour_cream} => {sausage} 0.001016777 0.2631579 0.003863752 2.8010367 10
## [3264] {butter_milk,
## sausage} => {whipped/sour_cream} 0.001016777 0.2777778 0.003660397 3.8750985 10
## [3265] {butter_milk,
## whipped/sour_cream} => {yogurt} 0.001728521 0.4473684 0.003863752 3.2069012 17
## [3266] {butter_milk,
## yogurt} => {whipped/sour_cream} 0.001728521 0.2023810 0.008540925 2.8232861 17
## [3267] {butter_milk,
## whipped/sour_cream} => {rolls/buns} 0.001423488 0.3684211 0.003863752 2.0029967 14
## [3268] {butter_milk,
## whipped/sour_cream} => {other_vegetables} 0.002338587 0.6052632 0.003863752 3.1280941 23
## [3269] {butter_milk,
## other_vegetables} => {whipped/sour_cream} 0.002338587 0.2254902 0.010371124 3.1456682 23
## [3270] {butter_milk,
## whipped/sour_cream} => {whole_milk} 0.002948653 0.7631579 0.003863752 2.9867322 29
## [3271] {butter_milk,
## whole_milk} => {whipped/sour_cream} 0.002948653 0.2543860 0.011591256 3.5487744 29
## [3272] {butter_milk,
## pip_fruit} => {citrus_fruit} 0.001016777 0.2000000 0.005083884 2.4164619 10
## [3273] {butter_milk,
## citrus_fruit} => {pip_fruit} 0.001016777 0.2272727 0.004473818 3.0043377 10
## [3274] {butter_milk,
## pip_fruit} => {root_vegetables} 0.001423488 0.2800000 0.005083884 2.5688433 14
## [3275] {butter_milk,
## root_vegetables} => {pip_fruit} 0.001423488 0.2800000 0.005083884 3.7013441 14
## [3276] {butter_milk,
## pip_fruit} => {yogurt} 0.002033554 0.4000000 0.005083884 2.8673469 20
## [3277] {butter_milk,
## yogurt} => {pip_fruit} 0.002033554 0.2380952 0.008540925 3.1474014 20
## [3278] {butter_milk,
## pip_fruit} => {rolls/buns} 0.001728521 0.3400000 0.005083884 1.8484798 17
## [3279] {butter_milk,
## rolls/buns} => {pip_fruit} 0.001728521 0.2266667 0.007625826 2.9963262 17
## [3280] {butter_milk,
## pip_fruit} => {other_vegetables} 0.003253686 0.6400000 0.005083884 3.3076195 32
## [3281] {butter_milk,
## other_vegetables} => {pip_fruit} 0.003253686 0.3137255 0.010371124 4.1471642 32
## [3282] {butter_milk,
## pip_fruit} => {whole_milk} 0.002643620 0.5200000 0.005083884 2.0350975 26
## [3283] {butter_milk,
## whole_milk} => {pip_fruit} 0.002643620 0.2280702 0.011591256 3.0148793 26
## [3284] {butter_milk,
## pastry} => {tropical_fruit} 0.001016777 0.3030303 0.003355363 2.8878905 10
## [3285] {butter_milk,
## pastry} => {yogurt} 0.001931876 0.5757576 0.003355363 4.1272418 19
## [3286] {butter_milk,
## yogurt} => {pastry} 0.001931876 0.2261905 0.008540925 2.5423810 19
## [3287] {butter_milk,
## pastry} => {other_vegetables} 0.001525165 0.4545455 0.003355363 2.3491616 15
## [3288] {butter_milk,
## pastry} => {whole_milk} 0.001931876 0.5757576 0.003355363 2.2533131 19
## [3289] {butter_milk,
## citrus_fruit} => {tropical_fruit} 0.001220132 0.2727273 0.004473818 2.5991015 12
## [3290] {butter_milk,
## tropical_fruit} => {citrus_fruit} 0.001220132 0.2222222 0.005490595 2.6849577 12
## [3291] {butter_milk,
## citrus_fruit} => {yogurt} 0.001321810 0.2954545 0.004473818 2.1179267 13
## [3292] {butter_milk,
## citrus_fruit} => {rolls/buns} 0.001321810 0.2954545 0.004473818 1.6062993 13
## [3293] {butter_milk,
## citrus_fruit} => {other_vegetables} 0.001626843 0.3636364 0.004473818 1.8793293 16
## [3294] {butter_milk,
## citrus_fruit} => {whole_milk} 0.001830198 0.4090909 0.004473818 1.6010382 18
## [3295] {butter_milk,
## shopping_bags} => {tropical_fruit} 0.001118454 0.2894737 0.003863752 2.7586954 11
## [3296] {butter_milk,
## tropical_fruit} => {shopping_bags} 0.001118454 0.2037037 0.005490595 2.0675190 11
## [3297] {butter_milk,
## shopping_bags} => {soda} 0.001220132 0.3157895 0.003863752 1.8109560 12
## [3298] {butter_milk,
## soda} => {shopping_bags} 0.001220132 0.2666667 0.004575496 2.7065703 12
## [3299] {butter_milk,
## shopping_bags} => {yogurt} 0.001321810 0.3421053 0.003863752 2.4523362 13
## [3300] {butter_milk,
## shopping_bags} => {rolls/buns} 0.001118454 0.2894737 0.003863752 1.5737831 11
## [3301] {butter_milk,
## shopping_bags} => {whole_milk} 0.001728521 0.4473684 0.003863752 1.7508430 17
## [3302] {butter_milk,
## sausage} => {tropical_fruit} 0.001118454 0.3055556 0.003660397 2.9119563 11
## [3303] {butter_milk,
## tropical_fruit} => {sausage} 0.001118454 0.2037037 0.005490595 2.1682099 11
## [3304] {butter_milk,
## sausage} => {yogurt} 0.001321810 0.3611111 0.003660397 2.5885771 13
## [3305] {butter_milk,
## sausage} => {rolls/buns} 0.001525165 0.4166667 0.003660397 2.2652939 15
## [3306] {butter_milk,
## rolls/buns} => {sausage} 0.001525165 0.2000000 0.007625826 2.1287879 15
## [3307] {butter_milk,
## sausage} => {other_vegetables} 0.001626843 0.4444444 0.003660397 2.2969580 16
## [3308] {butter_milk,
## sausage} => {whole_milk} 0.001931876 0.5277778 0.003660397 2.0655370 19
## [3309] {bottled_water,
## butter_milk} => {tropical_fruit} 0.001118454 0.2972973 0.003762074 2.8332548 11
## [3310] {butter_milk,
## tropical_fruit} => {bottled_water} 0.001118454 0.2037037 0.005490595 1.8430781 11
## [3311] {bottled_water,
## butter_milk} => {soda} 0.001016777 0.2702703 0.003762074 1.5499173 10
## [3312] {butter_milk,
## soda} => {bottled_water} 0.001016777 0.2222222 0.004575496 2.0106307 10
## [3313] {bottled_water,
## butter_milk} => {rolls/buns} 0.001525165 0.4054054 0.003762074 2.2040697 15
## [3314] {butter_milk,
## rolls/buns} => {bottled_water} 0.001525165 0.2000000 0.007625826 1.8095676 15
## [3315] {bottled_water,
## butter_milk} => {other_vegetables} 0.001423488 0.3783784 0.003762074 1.9555183 14
## [3316] {bottled_water,
## butter_milk} => {whole_milk} 0.001321810 0.3513514 0.003762074 1.3750659 13
## [3317] {butter_milk,
## tropical_fruit} => {root_vegetables} 0.001118454 0.2037037 0.005490595 1.8688675 11
## [3318] {butter_milk,
## root_vegetables} => {tropical_fruit} 0.001118454 0.2200000 0.005083884 2.0966085 11
## [3319] {butter_milk,
## tropical_fruit} => {yogurt} 0.002033554 0.3703704 0.005490595 2.6549509 20
## [3320] {butter_milk,
## yogurt} => {tropical_fruit} 0.002033554 0.2380952 0.008540925 2.2690568 20
## [3321] {butter_milk,
## tropical_fruit} => {rolls/buns} 0.001525165 0.2777778 0.005490595 1.5101959 15
## [3322] {butter_milk,
## rolls/buns} => {tropical_fruit} 0.001525165 0.2000000 0.007625826 1.9060078 15
## [3323] {butter_milk,
## tropical_fruit} => {other_vegetables} 0.002440264 0.4444444 0.005490595 2.2969580 24
## [3324] {butter_milk,
## other_vegetables} => {tropical_fruit} 0.002440264 0.2352941 0.010371124 2.2423621 24
## [3325] {butter_milk,
## tropical_fruit} => {whole_milk} 0.002846975 0.5185185 0.005490595 2.0292995 28
## [3326] {butter_milk,
## whole_milk} => {tropical_fruit} 0.002846975 0.2456140 0.011591256 2.3407113 28
## [3327] {butter_milk,
## root_vegetables} => {yogurt} 0.001728521 0.3400000 0.005083884 2.4372449 17
## [3328] {butter_milk,
## yogurt} => {root_vegetables} 0.001728521 0.2023810 0.008540925 1.8567320 17
## [3329] {butter_milk,
## root_vegetables} => {rolls/buns} 0.001321810 0.2600000 0.005083884 1.4135434 13
## [3330] {butter_milk,
## root_vegetables} => {other_vegetables} 0.002846975 0.5600000 0.005083884 2.8941671 28
## [3331] {butter_milk,
## other_vegetables} => {root_vegetables} 0.002846975 0.2745098 0.010371124 2.5184738 28
## [3332] {butter_milk,
## root_vegetables} => {whole_milk} 0.003152008 0.6200000 0.005083884 2.4264624 31
## [3333] {butter_milk,
## whole_milk} => {root_vegetables} 0.003152008 0.2719298 0.011591256 2.4948039 31
## [3334] {butter_milk,
## soda} => {yogurt} 0.001830198 0.4000000 0.004575496 2.8673469 18
## [3335] {butter_milk,
## yogurt} => {soda} 0.001830198 0.2142857 0.008540925 1.2288630 18
## [3336] {butter_milk,
## soda} => {rolls/buns} 0.001220132 0.2666667 0.004575496 1.4497881 12
## [3337] {butter_milk,
## soda} => {other_vegetables} 0.001423488 0.3111111 0.004575496 1.6078706 14
## [3338] {butter_milk,
## soda} => {whole_milk} 0.001931876 0.4222222 0.004575496 1.6524296 19
## [3339] {butter_milk,
## yogurt} => {rolls/buns} 0.002745297 0.3214286 0.008540925 1.7475124 27
## [3340] {butter_milk,
## rolls/buns} => {yogurt} 0.002745297 0.3600000 0.007625826 2.5806122 27
## [3341] {butter_milk,
## yogurt} => {other_vegetables} 0.004168785 0.4880952 0.008540925 2.5225521 41
## [3342] {butter_milk,
## other_vegetables} => {yogurt} 0.004168785 0.4019608 0.010371124 2.8814026 41
## [3343] {butter_milk,
## yogurt} => {whole_milk} 0.004575496 0.5357143 0.008540925 2.0965977 45
## [3344] {butter_milk,
## whole_milk} => {yogurt} 0.004575496 0.3947368 0.011591256 2.8296187 45
## [3345] {butter_milk,
## rolls/buns} => {other_vegetables} 0.002948653 0.3866667 0.007625826 1.9983535 29
## [3346] {butter_milk,
## other_vegetables} => {rolls/buns} 0.002948653 0.2843137 0.010371124 1.5457300 29
## [3347] {butter_milk,
## rolls/buns} => {whole_milk} 0.003457041 0.4533333 0.007625826 1.7741876 34
## [3348] {butter_milk,
## whole_milk} => {rolls/buns} 0.003457041 0.2982456 0.011591256 1.6214735 34
## [3349] {butter_milk,
## other_vegetables} => {whole_milk} 0.004677173 0.4509804 0.010371124 1.7649790 46
## [3350] {butter_milk,
## whole_milk} => {other_vegetables} 0.004677173 0.4035088 0.011591256 2.0853961 46
## [3351] {candy,
## salty_snack} => {soda} 0.001118454 0.4230769 0.002643620 2.4262166 11
## [3352] {candy,
## waffles} => {soda} 0.001525165 0.5172414 0.002948653 2.9662210 15
## [3353] {candy,
## waffles} => {yogurt} 0.001118454 0.3793103 0.002948653 2.7190359 11
## [3354] {candy,
## yogurt} => {waffles} 0.001118454 0.2037037 0.005490595 5.3000686 11
## [3355] {candy,
## waffles} => {rolls/buns} 0.001118454 0.3793103 0.002948653 2.0621986 11
## [3356] {candy,
## waffles} => {other_vegetables} 0.001728521 0.5862069 0.002948653 3.0296084 17
## [3357] {candy,
## other_vegetables} => {waffles} 0.001728521 0.2500000 0.006914082 6.5046296 17
## [3358] {candy,
## waffles} => {whole_milk} 0.001321810 0.4482759 0.002948653 1.7543944 13
## [3359] {candy,
## long_life_bakery_product} => {soda} 0.001016777 0.3846154 0.002643620 2.2056515 10
## [3360] {candy,
## long_life_bakery_product} => {other_vegetables} 0.001118454 0.4230769 0.002643620 2.1865273 11
## [3361] {candy,
## canned_beer} => {soda} 0.001016777 0.4761905 0.002135231 2.7308066 10
## [3362] {candy,
## chicken} => {soda} 0.001016777 0.4761905 0.002135231 2.7308066 10
## [3363] {candy,
## chicken} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [3364] {candy,
## chicken} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [3365] {candy,
## white_bread} => {soda} 0.001118454 0.4230769 0.002643620 2.4262166 11
## [3366] {candy,
## white_bread} => {yogurt} 0.001016777 0.3846154 0.002643620 2.7570644 10
## [3367] {candy,
## chocolate} => {citrus_fruit} 0.001423488 0.2857143 0.004982206 3.4520885 14
## [3368] {candy,
## citrus_fruit} => {chocolate} 0.001423488 0.3684211 0.003863752 7.4250431 14
## [3369] {chocolate,
## citrus_fruit} => {candy} 0.001423488 0.2222222 0.006405694 7.4338624 14
## [3370] {candy,
## chocolate} => {shopping_bags} 0.001626843 0.3265306 0.004982206 3.3141678 16
## [3371] {candy,
## shopping_bags} => {chocolate} 0.001626843 0.3636364 0.004473818 7.3286140 16
## [3372] {chocolate,
## shopping_bags} => {candy} 0.001626843 0.2000000 0.008134215 6.6904762 16
## [3373] {candy,
## chocolate} => {sausage} 0.001016777 0.2040816 0.004982206 2.1722325 10
## [3374] {candy,
## sausage} => {chocolate} 0.001016777 0.2777778 0.003660397 5.5982468 10
## [3375] {candy,
## chocolate} => {soda} 0.001931876 0.3877551 0.004982206 2.2236568 19
## [3376] {candy,
## soda} => {chocolate} 0.001931876 0.2235294 0.008642603 4.5049421 19
## [3377] {candy,
## chocolate} => {rolls/buns} 0.001931876 0.3877551 0.004982206 2.1081102 19
## [3378] {candy,
## rolls/buns} => {chocolate} 0.001931876 0.2714286 0.007117438 5.4702869 19
## [3379] {candy,
## chocolate} => {other_vegetables} 0.002033554 0.4081633 0.004982206 2.1094512 20
## [3380] {candy,
## other_vegetables} => {chocolate} 0.002033554 0.2941176 0.006914082 5.9275554 20
## [3381] {candy,
## chocolate} => {whole_milk} 0.001220132 0.2448980 0.004982206 0.9584447 12
## [3382] {candy,
## coffee} => {whole_milk} 0.001016777 0.3703704 0.002745297 1.4494996 10
## [3383] {candy,
## frozen_vegetables} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [3384] {candy,
## frozen_vegetables} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [3385] {candy,
## curd} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [3386] {candy,
## curd} => {whole_milk} 0.001220132 0.5000000 0.002440264 1.9568245 12
## [3387] {candy,
## pork} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [3388] {brown_bread,
## candy} => {soda} 0.001016777 0.4545455 0.002236909 2.6066790 10
## [3389] {brown_bread,
## candy} => {yogurt} 0.001220132 0.5454545 0.002236909 3.9100186 12
## [3390] {candy,
## yogurt} => {brown_bread} 0.001220132 0.2222222 0.005490595 3.4256357 12
## [3391] {candy,
## margarine} => {soda} 0.001321810 0.4482759 0.002948653 2.5707248 13
## [3392] {candy,
## margarine} => {yogurt} 0.001016777 0.3448276 0.002948653 2.4718508 10
## [3393] {candy,
## margarine} => {rolls/buns} 0.001016777 0.3448276 0.002948653 1.8747260 10
## [3394] {candy,
## margarine} => {whole_milk} 0.001016777 0.3448276 0.002948653 1.3495341 10
## [3395] {butter,
## candy} => {rolls/buns} 0.001016777 0.3571429 0.002846975 1.9416805 10
## [3396] {butter,
## candy} => {other_vegetables} 0.001728521 0.6071429 0.002846975 3.1378087 17
## [3397] {candy,
## other_vegetables} => {butter} 0.001728521 0.2500000 0.006914082 4.5114679 17
## [3398] {butter,
## candy} => {whole_milk} 0.001220132 0.4285714 0.002846975 1.6772782 12
## [3399] {candy,
## newspapers} => {soda} 0.001016777 0.4545455 0.002236909 2.6066790 10
## [3400] {candy,
## newspapers} => {rolls/buns} 0.001016777 0.4545455 0.002236909 2.4712297 10
## [3401] {candy,
## domestic_eggs} => {soda} 0.001016777 0.3846154 0.002643620 2.2056515 10
## [3402] {candy,
## domestic_eggs} => {yogurt} 0.001016777 0.3846154 0.002643620 2.7570644 10
## [3403] {candy,
## domestic_eggs} => {other_vegetables} 0.001220132 0.4615385 0.002643620 2.3853026 12
## [3404] {candy,
## domestic_eggs} => {whole_milk} 0.001321810 0.5000000 0.002643620 1.9568245 13
## [3405] {candy,
## fruit/vegetable_juice} => {citrus_fruit} 0.001321810 0.3333333 0.003965430 4.0274365 13
## [3406] {candy,
## citrus_fruit} => {fruit/vegetable_juice} 0.001321810 0.3421053 0.003863752 4.7322156 13
## [3407] {candy,
## fruit/vegetable_juice} => {shopping_bags} 0.001118454 0.2820513 0.003965430 2.8627186 11
## [3408] {candy,
## shopping_bags} => {fruit/vegetable_juice} 0.001118454 0.2500000 0.004473818 3.4581575 11
## [3409] {candy,
## fruit/vegetable_juice} => {tropical_fruit} 0.001220132 0.3076923 0.003965430 2.9323196 12
## [3410] {candy,
## tropical_fruit} => {fruit/vegetable_juice} 0.001220132 0.2264151 0.005388917 3.1319162 12
## [3411] {candy,
## fruit/vegetable_juice} => {soda} 0.001321810 0.3333333 0.003965430 1.9115646 13
## [3412] {candy,
## fruit/vegetable_juice} => {yogurt} 0.001423488 0.3589744 0.003965430 2.5732601 14
## [3413] {candy,
## yogurt} => {fruit/vegetable_juice} 0.001423488 0.2592593 0.005490595 3.5862374 14
## [3414] {candy,
## fruit/vegetable_juice} => {rolls/buns} 0.001118454 0.2820513 0.003965430 1.5334297 11
## [3415] {candy,
## fruit/vegetable_juice} => {other_vegetables} 0.001118454 0.2820513 0.003965430 1.4576849 11
## [3416] {candy,
## fruit/vegetable_juice} => {whole_milk} 0.001423488 0.3589744 0.003965430 1.4048997 14
## [3417] {candy,
## whipped/sour_cream} => {soda} 0.001118454 0.3142857 0.003558719 1.8023324 11
## [3418] {candy,
## whipped/sour_cream} => {yogurt} 0.001016777 0.2857143 0.003558719 2.0481050 10
## [3419] {candy,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.2857143 0.003558719 1.4766159 10
## [3420] {candy,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.4285714 0.003558719 1.6772782 15
## [3421] {candy,
## pip_fruit} => {tropical_fruit} 0.001016777 0.4347826 0.002338587 4.1434951 10
## [3422] {candy,
## pip_fruit} => {rolls/buns} 0.001016777 0.4347826 0.002338587 2.3637849 10
## [3423] {candy,
## pip_fruit} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [3424] {candy,
## pip_fruit} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [3425] {candy,
## pastry} => {root_vegetables} 0.001016777 0.2777778 0.003660397 2.5484556 10
## [3426] {candy,
## root_vegetables} => {pastry} 0.001016777 0.2380952 0.004270463 2.6761905 10
## [3427] {candy,
## pastry} => {soda} 0.001423488 0.3888889 0.003660397 2.2301587 14
## [3428] {candy,
## pastry} => {yogurt} 0.001220132 0.3333333 0.003660397 2.3894558 12
## [3429] {candy,
## yogurt} => {pastry} 0.001220132 0.2222222 0.005490595 2.4977778 12
## [3430] {candy,
## pastry} => {rolls/buns} 0.001118454 0.3055556 0.003660397 1.6612155 11
## [3431] {candy,
## pastry} => {other_vegetables} 0.001525165 0.4166667 0.003660397 2.1533981 15
## [3432] {candy,
## other_vegetables} => {pastry} 0.001525165 0.2205882 0.006914082 2.4794118 15
## [3433] {candy,
## pastry} => {whole_milk} 0.001728521 0.4722222 0.003660397 1.8481120 17
## [3434] {candy,
## whole_milk} => {pastry} 0.001728521 0.2098765 0.008235892 2.3590123 17
## [3435] {candy,
## citrus_fruit} => {shopping_bags} 0.001321810 0.3421053 0.003863752 3.4722449 13
## [3436] {candy,
## shopping_bags} => {citrus_fruit} 0.001321810 0.2954545 0.004473818 3.5697733 13
## [3437] {candy,
## citrus_fruit} => {tropical_fruit} 0.001220132 0.3157895 0.003863752 3.0094859 12
## [3438] {candy,
## tropical_fruit} => {citrus_fruit} 0.001220132 0.2264151 0.005388917 2.7356173 12
## [3439] {candy,
## citrus_fruit} => {soda} 0.001423488 0.3684211 0.003863752 2.1127820 14
## [3440] {candy,
## citrus_fruit} => {yogurt} 0.001321810 0.3421053 0.003863752 2.4523362 13
## [3441] {candy,
## yogurt} => {citrus_fruit} 0.001321810 0.2407407 0.005490595 2.9087042 13
## [3442] {candy,
## citrus_fruit} => {other_vegetables} 0.001626843 0.4210526 0.003863752 2.1760655 16
## [3443] {candy,
## other_vegetables} => {citrus_fruit} 0.001626843 0.2352941 0.006914082 2.8428964 16
## [3444] {candy,
## citrus_fruit} => {whole_milk} 0.001016777 0.2631579 0.003863752 1.0299076 10
## [3445] {candy,
## shopping_bags} => {tropical_fruit} 0.001118454 0.2500000 0.004473818 2.3825097 11
## [3446] {candy,
## tropical_fruit} => {shopping_bags} 0.001118454 0.2075472 0.005388917 2.1065288 11
## [3447] {candy,
## shopping_bags} => {soda} 0.001525165 0.3409091 0.004473818 1.9550093 15
## [3448] {candy,
## shopping_bags} => {rolls/buns} 0.001118454 0.2500000 0.004473818 1.3591763 11
## [3449] {candy,
## sausage} => {root_vegetables} 0.001016777 0.2777778 0.003660397 2.5484556 10
## [3450] {candy,
## root_vegetables} => {sausage} 0.001016777 0.2380952 0.004270463 2.5342713 10
## [3451] {candy,
## sausage} => {soda} 0.001220132 0.3333333 0.003660397 1.9115646 12
## [3452] {candy,
## sausage} => {yogurt} 0.001321810 0.3611111 0.003660397 2.5885771 13
## [3453] {candy,
## yogurt} => {sausage} 0.001321810 0.2407407 0.005490595 2.5624299 13
## [3454] {candy,
## sausage} => {rolls/buns} 0.001423488 0.3888889 0.003660397 2.1142743 14
## [3455] {candy,
## rolls/buns} => {sausage} 0.001423488 0.2000000 0.007117438 2.1287879 14
## [3456] {candy,
## sausage} => {other_vegetables} 0.001931876 0.5277778 0.003660397 2.7276376 19
## [3457] {candy,
## other_vegetables} => {sausage} 0.001931876 0.2794118 0.006914082 2.9740419 19
## [3458] {candy,
## sausage} => {whole_milk} 0.001728521 0.4722222 0.003660397 1.8481120 17
## [3459] {candy,
## whole_milk} => {sausage} 0.001728521 0.2098765 0.008235892 2.2339132 17
## [3460] {bottled_water,
## candy} => {soda} 0.001626843 0.4444444 0.003660397 2.5487528 16
## [3461] {bottled_water,
## candy} => {yogurt} 0.001016777 0.2777778 0.003660397 1.9912132 10
## [3462] {bottled_water,
## candy} => {rolls/buns} 0.001118454 0.3055556 0.003660397 1.6612155 11
## [3463] {bottled_water,
## candy} => {other_vegetables} 0.001118454 0.3055556 0.003660397 1.5791586 11
## [3464] {bottled_water,
## candy} => {whole_milk} 0.001118454 0.3055556 0.003660397 1.1958372 11
## [3465] {candy,
## tropical_fruit} => {root_vegetables} 0.001423488 0.2641509 0.005388917 2.4234371 14
## [3466] {candy,
## root_vegetables} => {tropical_fruit} 0.001423488 0.3333333 0.004270463 3.1766796 14
## [3467] {candy,
## tropical_fruit} => {soda} 0.001728521 0.3207547 0.005388917 1.8394301 17
## [3468] {candy,
## soda} => {tropical_fruit} 0.001728521 0.2000000 0.008642603 1.9060078 17
## [3469] {candy,
## tropical_fruit} => {yogurt} 0.002338587 0.4339623 0.005388917 3.1108009 23
## [3470] {candy,
## yogurt} => {tropical_fruit} 0.002338587 0.4259259 0.005490595 4.0590906 23
## [3471] {candy,
## tropical_fruit} => {rolls/buns} 0.002135231 0.3962264 0.005388917 2.1541663 21
## [3472] {candy,
## rolls/buns} => {tropical_fruit} 0.002135231 0.3000000 0.007117438 2.8590116 21
## [3473] {candy,
## tropical_fruit} => {other_vegetables} 0.001830198 0.3396226 0.005388917 1.7552226 18
## [3474] {candy,
## other_vegetables} => {tropical_fruit} 0.001830198 0.2647059 0.006914082 2.5226573 18
## [3475] {candy,
## tropical_fruit} => {whole_milk} 0.001321810 0.2452830 0.005388917 0.9599516 13
## [3476] {candy,
## root_vegetables} => {soda} 0.001423488 0.3333333 0.004270463 1.9115646 14
## [3477] {candy,
## root_vegetables} => {yogurt} 0.001830198 0.4285714 0.004270463 3.0721574 18
## [3478] {candy,
## yogurt} => {root_vegetables} 0.001830198 0.3333333 0.005490595 3.0581468 18
## [3479] {candy,
## root_vegetables} => {rolls/buns} 0.001220132 0.2857143 0.004270463 1.5533444 12
## [3480] {candy,
## root_vegetables} => {other_vegetables} 0.002236909 0.5238095 0.004270463 2.7071291 22
## [3481] {candy,
## other_vegetables} => {root_vegetables} 0.002236909 0.3235294 0.006914082 2.9682013 22
## [3482] {candy,
## root_vegetables} => {whole_milk} 0.002440264 0.5714286 0.004270463 2.2363709 24
## [3483] {candy,
## whole_milk} => {root_vegetables} 0.002440264 0.2962963 0.008235892 2.7183527 24
## [3484] {candy,
## soda} => {yogurt} 0.002135231 0.2470588 0.008642603 1.7710084 21
## [3485] {candy,
## yogurt} => {soda} 0.002135231 0.3888889 0.005490595 2.2301587 21
## [3486] {candy,
## soda} => {rolls/buns} 0.003050330 0.3529412 0.008642603 1.9188372 30
## [3487] {candy,
## rolls/buns} => {soda} 0.003050330 0.4285714 0.007117438 2.4577259 30
## [3488] {candy,
## soda} => {other_vegetables} 0.002541942 0.2941176 0.008642603 1.5200457 25
## [3489] {candy,
## other_vegetables} => {soda} 0.002541942 0.3676471 0.006914082 2.1083433 25
## [3490] {candy,
## soda} => {whole_milk} 0.002541942 0.2941176 0.008642603 1.1510732 25
## [3491] {candy,
## whole_milk} => {soda} 0.002541942 0.3086420 0.008235892 1.7699672 25
## [3492] {candy,
## yogurt} => {rolls/buns} 0.001728521 0.3148148 0.005490595 1.7115554 17
## [3493] {candy,
## rolls/buns} => {yogurt} 0.001728521 0.2428571 0.007117438 1.7408892 17
## [3494] {candy,
## yogurt} => {other_vegetables} 0.002236909 0.4074074 0.005490595 2.1055449 22
## [3495] {candy,
## other_vegetables} => {yogurt} 0.002236909 0.3235294 0.006914082 2.3191777 22
## [3496] {candy,
## yogurt} => {whole_milk} 0.002643620 0.4814815 0.005490595 1.8843495 26
## [3497] {candy,
## whole_milk} => {yogurt} 0.002643620 0.3209877 0.008235892 2.3009574 26
## [3498] {candy,
## rolls/buns} => {other_vegetables} 0.002643620 0.3714286 0.007117438 1.9196006 26
## [3499] {candy,
## other_vegetables} => {rolls/buns} 0.002643620 0.3823529 0.006914082 2.0787403 26
## [3500] {candy,
## rolls/buns} => {whole_milk} 0.002643620 0.3714286 0.007117438 1.4536411 26
## [3501] {candy,
## whole_milk} => {rolls/buns} 0.002643620 0.3209877 0.008235892 1.7451153 26
## [3502] {candy,
## other_vegetables} => {whole_milk} 0.002948653 0.4264706 0.006914082 1.6690562 29
## [3503] {candy,
## whole_milk} => {other_vegetables} 0.002948653 0.3580247 0.008235892 1.8503273 29
## [3504] {ham,
## sliced_cheese} => {whipped/sour_cream} 0.001016777 0.3846154 0.002643620 5.3655210 10
## [3505] {ham,
## whipped/sour_cream} => {sliced_cheese} 0.001016777 0.2439024 0.004168785 9.9534460 10
## [3506] {sliced_cheese,
## whipped/sour_cream} => {ham} 0.001016777 0.2631579 0.003863752 10.1099918 10
## [3507] {ham,
## sliced_cheese} => {pip_fruit} 0.001016777 0.3846154 0.002643620 5.0842639 10
## [3508] {ham,
## pip_fruit} => {sliced_cheese} 0.001016777 0.2564103 0.003965430 10.4638791 10
## [3509] {pip_fruit,
## sliced_cheese} => {ham} 0.001016777 0.2439024 0.004168785 9.3702363 10
## [3510] {ham,
## sliced_cheese} => {yogurt} 0.001220132 0.4615385 0.002643620 3.3084772 12
## [3511] {ham,
## sliced_cheese} => {other_vegetables} 0.001220132 0.4615385 0.002643620 2.3853026 12
## [3512] {ham,
## sliced_cheese} => {whole_milk} 0.001423488 0.5384615 0.002643620 2.1073495 14
## [3513] {ham,
## oil} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [3514] {ham,
## hygiene_articles} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [3515] {ham,
## sugar} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [3516] {dessert,
## ham} => {other_vegetables} 0.001118454 0.4074074 0.002745297 2.1055449 11
## [3517] {dessert,
## ham} => {whole_milk} 0.001728521 0.6296296 0.002745297 2.4641494 17
## [3518] {cream_cheese_,
## ham} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [3519] {chicken,
## ham} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [3520] {chicken,
## ham} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [3521] {ham,
## white_bread} => {fruit/vegetable_juice} 0.001626843 0.3200000 0.005083884 4.4264416 16
## [3522] {fruit/vegetable_juice,
## ham} => {white_bread} 0.001626843 0.4210526 0.003863752 10.0025426 16
## [3523] {fruit/vegetable_juice,
## white_bread} => {ham} 0.001626843 0.2191781 0.007422471 8.4203767 16
## [3524] {ham,
## white_bread} => {pip_fruit} 0.001220132 0.2400000 0.005083884 3.1725806 12
## [3525] {ham,
## pip_fruit} => {white_bread} 0.001220132 0.3076923 0.003965430 7.3095504 12
## [3526] {ham,
## white_bread} => {pastry} 0.001118454 0.2200000 0.005083884 2.4728000 11
## [3527] {ham,
## pastry} => {white_bread} 0.001118454 0.2682927 0.004168785 6.3735713 11
## [3528] {pastry,
## white_bread} => {ham} 0.001118454 0.2000000 0.005592272 7.6835938 11
## [3529] {ham,
## white_bread} => {shopping_bags} 0.001525165 0.3000000 0.005083884 3.0448916 15
## [3530] {ham,
## shopping_bags} => {white_bread} 0.001525165 0.3947368 0.003863752 9.3773837 15
## [3531] {shopping_bags,
## white_bread} => {ham} 0.001525165 0.2054795 0.007422471 7.8941032 15
## [3532] {ham,
## white_bread} => {tropical_fruit} 0.001626843 0.3200000 0.005083884 3.0496124 16
## [3533] {ham,
## tropical_fruit} => {white_bread} 0.001626843 0.3018868 0.005388917 7.1716343 16
## [3534] {ham,
## white_bread} => {soda} 0.001220132 0.2400000 0.005083884 1.3763265 12
## [3535] {ham,
## soda} => {white_bread} 0.001220132 0.2448980 0.004982206 5.8178054 12
## [3536] {ham,
## white_bread} => {yogurt} 0.001626843 0.3200000 0.005083884 2.2938776 16
## [3537] {ham,
## yogurt} => {white_bread} 0.001626843 0.2424242 0.006710727 5.7590397 16
## [3538] {ham,
## white_bread} => {other_vegetables} 0.001931876 0.3800000 0.005083884 1.9638991 19
## [3539] {ham,
## other_vegetables} => {white_bread} 0.001931876 0.2111111 0.009150991 5.0151637 19
## [3540] {ham,
## white_bread} => {whole_milk} 0.002440264 0.4800000 0.005083884 1.8785515 24
## [3541] {ham,
## whole_milk} => {white_bread} 0.002440264 0.2123894 0.011489578 5.0455303 24
## [3542] {chocolate,
## ham} => {pastry} 0.001016777 0.3703704 0.002745297 4.1629630 10
## [3543] {ham,
## pastry} => {chocolate} 0.001016777 0.2439024 0.004168785 4.9155338 10
## [3544] {chocolate,
## ham} => {yogurt} 0.001016777 0.3703704 0.002745297 2.6549509 10
## [3545] {chocolate,
## ham} => {rolls/buns} 0.001220132 0.4444444 0.002745297 2.4163135 12
## [3546] {chocolate,
## ham} => {whole_milk} 0.001525165 0.5555556 0.002745297 2.1742495 15
## [3547] {frozen_vegetables,
## ham} => {other_vegetables} 0.001525165 0.7142857 0.002135231 3.6915397 15
## [3548] {frozen_vegetables,
## ham} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [3549] {beef,
## ham} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [3550] {beef,
## ham} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [3551] {curd,
## ham} => {yogurt} 0.001423488 0.5833333 0.002440264 4.1815476 14
## [3552] {ham,
## yogurt} => {curd} 0.001423488 0.2121212 0.006710727 3.9813208 14
## [3553] {curd,
## ham} => {other_vegetables} 0.001321810 0.5416667 0.002440264 2.7994176 13
## [3554] {curd,
## ham} => {whole_milk} 0.001830198 0.7500000 0.002440264 2.9352368 18
## [3555] {ham,
## napkins} => {yogurt} 0.001118454 0.4400000 0.002541942 3.1540816 11
## [3556] {ham,
## napkins} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [3557] {frankfurter,
## ham} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [3558] {frankfurter,
## ham} => {other_vegetables} 0.001423488 0.5600000 0.002541942 2.8941671 14
## [3559] {frankfurter,
## ham} => {whole_milk} 0.001220132 0.4800000 0.002541942 1.8785515 12
## [3560] {bottled_beer,
## ham} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [3561] {bottled_beer,
## ham} => {whole_milk} 0.001423488 0.6363636 0.002236909 2.4905039 14
## [3562] {brown_bread,
## ham} => {other_vegetables} 0.001423488 0.5384615 0.002643620 2.7828530 14
## [3563] {brown_bread,
## ham} => {whole_milk} 0.001830198 0.6923077 0.002643620 2.7094493 18
## [3564] {ham,
## margarine} => {yogurt} 0.001118454 0.4230769 0.002643620 3.0327708 11
## [3565] {ham,
## margarine} => {rolls/buns} 0.001220132 0.4615385 0.002643620 2.5092486 12
## [3566] {ham,
## margarine} => {other_vegetables} 0.001728521 0.6538462 0.002643620 3.3791786 17
## [3567] {ham,
## margarine} => {whole_milk} 0.001525165 0.5769231 0.002643620 2.2578744 15
## [3568] {butter,
## ham} => {domestic_eggs} 0.001118454 0.3548387 0.003152008 5.5926902 11
## [3569] {domestic_eggs,
## ham} => {butter} 0.001118454 0.2682927 0.004168785 4.8415753 11
## [3570] {butter,
## ham} => {tropical_fruit} 0.001016777 0.3225806 0.003152008 3.0742061 10
## [3571] {butter,
## ham} => {yogurt} 0.001423488 0.4516129 0.003152008 3.2373272 14
## [3572] {ham,
## yogurt} => {butter} 0.001423488 0.2121212 0.006710727 3.8279121 14
## [3573] {butter,
## ham} => {other_vegetables} 0.001423488 0.4516129 0.003152008 2.3340057 14
## [3574] {butter,
## ham} => {whole_milk} 0.001830198 0.5806452 0.003152008 2.2724414 18
## [3575] {domestic_eggs,
## ham} => {whipped/sour_cream} 0.001016777 0.2439024 0.004168785 3.4025255 10
## [3576] {ham,
## whipped/sour_cream} => {domestic_eggs} 0.001016777 0.2439024 0.004168785 3.8441995 10
## [3577] {domestic_eggs,
## ham} => {pip_fruit} 0.001016777 0.2439024 0.004168785 3.2241673 10
## [3578] {ham,
## pip_fruit} => {domestic_eggs} 0.001016777 0.2564103 0.003965430 4.0413379 10
## [3579] {domestic_eggs,
## ham} => {pastry} 0.001220132 0.2926829 0.004168785 3.2897561 12
## [3580] {ham,
## pastry} => {domestic_eggs} 0.001220132 0.2926829 0.004168785 4.6130394 12
## [3581] {domestic_eggs,
## ham} => {tropical_fruit} 0.001118454 0.2682927 0.004168785 2.5568397 11
## [3582] {ham,
## tropical_fruit} => {domestic_eggs} 0.001118454 0.2075472 0.005388917 3.2711962 11
## [3583] {domestic_eggs,
## ham} => {yogurt} 0.001321810 0.3170732 0.004168785 2.2728970 13
## [3584] {domestic_eggs,
## ham} => {other_vegetables} 0.002033554 0.4878049 0.004168785 2.5210515 20
## [3585] {ham,
## other_vegetables} => {domestic_eggs} 0.002033554 0.2222222 0.009150991 3.5024929 20
## [3586] {domestic_eggs,
## ham} => {whole_milk} 0.002135231 0.5121951 0.004168785 2.0045519 21
## [3587] {fruit/vegetable_juice,
## ham} => {pastry} 0.001016777 0.2631579 0.003863752 2.9578947 10
## [3588] {ham,
## pastry} => {fruit/vegetable_juice} 0.001016777 0.2439024 0.004168785 3.3738122 10
## [3589] {fruit/vegetable_juice,
## ham} => {tropical_fruit} 0.001525165 0.3947368 0.003863752 3.7618574 15
## [3590] {ham,
## tropical_fruit} => {fruit/vegetable_juice} 0.001525165 0.2830189 0.005388917 3.9148953 15
## [3591] {fruit/vegetable_juice,
## ham} => {soda} 0.001016777 0.2631579 0.003863752 1.5091300 10
## [3592] {ham,
## soda} => {fruit/vegetable_juice} 0.001016777 0.2040816 0.004982206 2.8229857 10
## [3593] {fruit/vegetable_juice,
## ham} => {yogurt} 0.001525165 0.3947368 0.003863752 2.8296187 15
## [3594] {ham,
## yogurt} => {fruit/vegetable_juice} 0.001525165 0.2272727 0.006710727 3.1437796 15
## [3595] {fruit/vegetable_juice,
## ham} => {other_vegetables} 0.001423488 0.3684211 0.003863752 1.9040573 14
## [3596] {fruit/vegetable_juice,
## ham} => {whole_milk} 0.002236909 0.5789474 0.003863752 2.2657968 22
## [3597] {ham,
## whipped/sour_cream} => {citrus_fruit} 0.001016777 0.2439024 0.004168785 2.9469048 10
## [3598] {citrus_fruit,
## ham} => {whipped/sour_cream} 0.001016777 0.3571429 0.002846975 4.9822695 10
## [3599] {ham,
## whipped/sour_cream} => {tropical_fruit} 0.001118454 0.2682927 0.004168785 2.5568397 11
## [3600] {ham,
## tropical_fruit} => {whipped/sour_cream} 0.001118454 0.2075472 0.005388917 2.8953566 11
## [3601] {ham,
## whipped/sour_cream} => {root_vegetables} 0.001220132 0.2926829 0.004168785 2.6852020 12
## [3602] {ham,
## root_vegetables} => {whipped/sour_cream} 0.001220132 0.3333333 0.003660397 4.6501182 12
## [3603] {ham,
## whipped/sour_cream} => {yogurt} 0.001423488 0.3414634 0.004168785 2.4477352 14
## [3604] {ham,
## yogurt} => {whipped/sour_cream} 0.001423488 0.2121212 0.006710727 2.9591661 14
## [3605] {ham,
## whipped/sour_cream} => {rolls/buns} 0.001118454 0.2682927 0.004168785 1.4586283 11
## [3606] {ham,
## whipped/sour_cream} => {other_vegetables} 0.002135231 0.5121951 0.004168785 2.6471041 21
## [3607] {ham,
## other_vegetables} => {whipped/sour_cream} 0.002135231 0.2333333 0.009150991 3.2550827 21
## [3608] {ham,
## whipped/sour_cream} => {whole_milk} 0.002643620 0.6341463 0.004168785 2.4818262 26
## [3609] {ham,
## whole_milk} => {whipped/sour_cream} 0.002643620 0.2300885 0.011489578 3.2098161 26
## [3610] {ham,
## pip_fruit} => {tropical_fruit} 0.001830198 0.4615385 0.003965430 4.3984794 18
## [3611] {ham,
## tropical_fruit} => {pip_fruit} 0.001830198 0.3396226 0.005388917 4.4895009 18
## [3612] {ham,
## pip_fruit} => {yogurt} 0.001728521 0.4358974 0.003965430 3.1246729 17
## [3613] {ham,
## yogurt} => {pip_fruit} 0.001728521 0.2575758 0.006710727 3.4049161 17
## [3614] {ham,
## pip_fruit} => {other_vegetables} 0.002643620 0.6666667 0.003965430 3.4454370 26
## [3615] {ham,
## other_vegetables} => {pip_fruit} 0.002643620 0.2888889 0.009150991 3.8188471 26
## [3616] {ham,
## pip_fruit} => {whole_milk} 0.001931876 0.4871795 0.003965430 1.9066495 19
## [3617] {ham,
## pastry} => {shopping_bags} 0.001016777 0.2439024 0.004168785 2.4755217 10
## [3618] {ham,
## shopping_bags} => {pastry} 0.001016777 0.2631579 0.003863752 2.9578947 10
## [3619] {ham,
## pastry} => {tropical_fruit} 0.001118454 0.2682927 0.004168785 2.5568397 11
## [3620] {ham,
## tropical_fruit} => {pastry} 0.001118454 0.2075472 0.005388917 2.3328302 11
## [3621] {ham,
## pastry} => {soda} 0.001118454 0.2682927 0.004168785 1.5385764 11
## [3622] {ham,
## soda} => {pastry} 0.001118454 0.2244898 0.004982206 2.5232653 11
## [3623] {ham,
## pastry} => {yogurt} 0.001423488 0.3414634 0.004168785 2.4477352 14
## [3624] {ham,
## yogurt} => {pastry} 0.001423488 0.2121212 0.006710727 2.3842424 14
## [3625] {ham,
## pastry} => {rolls/buns} 0.001321810 0.3170732 0.004168785 1.7238334 13
## [3626] {ham,
## pastry} => {other_vegetables} 0.001118454 0.2682927 0.004168785 1.3865783 11
## [3627] {ham,
## pastry} => {whole_milk} 0.002338587 0.5609756 0.004168785 2.1954616 23
## [3628] {ham,
## whole_milk} => {pastry} 0.002338587 0.2035398 0.011489578 2.2877876 23
## [3629] {citrus_fruit,
## ham} => {tropical_fruit} 0.001220132 0.4285714 0.002846975 4.0843023 12
## [3630] {ham,
## tropical_fruit} => {citrus_fruit} 0.001220132 0.2264151 0.005388917 2.7356173 12
## [3631] {citrus_fruit,
## ham} => {root_vegetables} 0.001016777 0.3571429 0.002846975 3.2765858 10
## [3632] {ham,
## root_vegetables} => {citrus_fruit} 0.001016777 0.2777778 0.003660397 3.3561971 10
## [3633] {citrus_fruit,
## ham} => {yogurt} 0.001220132 0.4285714 0.002846975 3.0721574 12
## [3634] {citrus_fruit,
## ham} => {other_vegetables} 0.001423488 0.5000000 0.002846975 2.5840778 14
## [3635] {citrus_fruit,
## ham} => {whole_milk} 0.001525165 0.5357143 0.002846975 2.0965977 15
## [3636] {ham,
## shopping_bags} => {soda} 0.001118454 0.2894737 0.003863752 1.6600430 11
## [3637] {ham,
## soda} => {shopping_bags} 0.001118454 0.2244898 0.004982206 2.2784903 11
## [3638] {ham,
## shopping_bags} => {yogurt} 0.001016777 0.2631579 0.003863752 1.8864125 10
## [3639] {ham,
## shopping_bags} => {rolls/buns} 0.001016777 0.2631579 0.003863752 1.4307119 10
## [3640] {ham,
## shopping_bags} => {other_vegetables} 0.001118454 0.2894737 0.003863752 1.4960450 11
## [3641] {ham,
## shopping_bags} => {whole_milk} 0.001728521 0.4473684 0.003863752 1.7508430 17
## [3642] {ham,
## sausage} => {soda} 0.001321810 0.2653061 0.004982206 1.5214494 13
## [3643] {ham,
## soda} => {sausage} 0.001321810 0.2653061 0.004982206 2.8239023 13
## [3644] {ham,
## sausage} => {yogurt} 0.001118454 0.2244898 0.004982206 1.6092253 11
## [3645] {ham,
## sausage} => {rolls/buns} 0.001626843 0.3265306 0.004982206 1.7752507 16
## [3646] {ham,
## rolls/buns} => {sausage} 0.001626843 0.2352941 0.006914082 2.5044563 16
## [3647] {ham,
## sausage} => {other_vegetables} 0.002033554 0.4081633 0.004982206 2.1094512 20
## [3648] {ham,
## other_vegetables} => {sausage} 0.002033554 0.2222222 0.009150991 2.3653199 20
## [3649] {ham,
## sausage} => {whole_milk} 0.001931876 0.3877551 0.004982206 1.5175374 19
## [3650] {bottled_water,
## ham} => {whole_milk} 0.001016777 0.3448276 0.002948653 1.3495341 10
## [3651] {ham,
## soda} => {tropical_fruit} 0.001016777 0.2040816 0.004982206 1.9449059 10
## [3652] {ham,
## tropical_fruit} => {yogurt} 0.002440264 0.4528302 0.005388917 3.2460531 24
## [3653] {ham,
## yogurt} => {tropical_fruit} 0.002440264 0.3636364 0.006710727 3.4654686 24
## [3654] {ham,
## tropical_fruit} => {rolls/buns} 0.001118454 0.2075472 0.005388917 1.1283728 11
## [3655] {ham,
## tropical_fruit} => {other_vegetables} 0.002643620 0.4905660 0.005388917 2.5353216 26
## [3656] {ham,
## other_vegetables} => {tropical_fruit} 0.002643620 0.2888889 0.009150991 2.7531223 26
## [3657] {ham,
## tropical_fruit} => {whole_milk} 0.002745297 0.5094340 0.005388917 1.9937457 27
## [3658] {ham,
## whole_milk} => {tropical_fruit} 0.002745297 0.2389381 0.011489578 2.2770889 27
## [3659] {ham,
## root_vegetables} => {yogurt} 0.001423488 0.3888889 0.003660397 2.7876984 14
## [3660] {ham,
## yogurt} => {root_vegetables} 0.001423488 0.2121212 0.006710727 1.9460934 14
## [3661] {ham,
## root_vegetables} => {rolls/buns} 0.001321810 0.3611111 0.003660397 1.9632547 13
## [3662] {ham,
## root_vegetables} => {other_vegetables} 0.002135231 0.5833333 0.003660397 3.0147574 21
## [3663] {ham,
## other_vegetables} => {root_vegetables} 0.002135231 0.2333333 0.009150991 2.1407027 21
## [3664] {ham,
## root_vegetables} => {whole_milk} 0.002135231 0.5833333 0.003660397 2.2829619 21
## [3665] {ham,
## soda} => {yogurt} 0.001423488 0.2857143 0.004982206 2.0481050 14
## [3666] {ham,
## yogurt} => {soda} 0.001423488 0.2121212 0.006710727 1.2164502 14
## [3667] {ham,
## soda} => {rolls/buns} 0.001423488 0.2857143 0.004982206 1.5533444 14
## [3668] {ham,
## rolls/buns} => {soda} 0.001423488 0.2058824 0.006914082 1.1806723 14
## [3669] {ham,
## soda} => {other_vegetables} 0.001830198 0.3673469 0.004982206 1.8985061 18
## [3670] {ham,
## other_vegetables} => {soda} 0.001830198 0.2000000 0.009150991 1.1469388 18
## [3671] {ham,
## soda} => {whole_milk} 0.002338587 0.4693878 0.004982206 1.8370189 23
## [3672] {ham,
## whole_milk} => {soda} 0.002338587 0.2035398 0.011489578 1.1672386 23
## [3673] {ham,
## yogurt} => {rolls/buns} 0.002135231 0.3181818 0.006710727 1.7298608 21
## [3674] {ham,
## rolls/buns} => {yogurt} 0.002135231 0.3088235 0.006914082 2.2137605 21
## [3675] {ham,
## yogurt} => {other_vegetables} 0.003050330 0.4545455 0.006710727 2.3491616 30
## [3676] {ham,
## other_vegetables} => {yogurt} 0.003050330 0.3333333 0.009150991 2.3894558 30
## [3677] {ham,
## yogurt} => {whole_milk} 0.003965430 0.5909091 0.006710727 2.3126108 39
## [3678] {ham,
## whole_milk} => {yogurt} 0.003965430 0.3451327 0.011489578 2.4740383 39
## [3679] {ham,
## rolls/buns} => {other_vegetables} 0.002440264 0.3529412 0.006914082 1.8240549 24
## [3680] {ham,
## other_vegetables} => {rolls/buns} 0.002440264 0.2666667 0.009150991 1.4497881 24
## [3681] {ham,
## rolls/buns} => {whole_milk} 0.003457041 0.5000000 0.006914082 1.9568245 34
## [3682] {ham,
## whole_milk} => {rolls/buns} 0.003457041 0.3008850 0.011489578 1.6358229 34
## [3683] {ham,
## other_vegetables} => {whole_milk} 0.004778851 0.5222222 0.009150991 2.0437945 47
## [3684] {ham,
## whole_milk} => {other_vegetables} 0.004778851 0.4159292 0.011489578 2.1495868 47
## [3685] {oil,
## sliced_cheese} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [3686] {onions,
## sliced_cheese} => {other_vegetables} 0.001525165 0.7894737 0.001931876 4.0801228 15
## [3687] {onions,
## sliced_cheese} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [3688] {hamburger_meat,
## sliced_cheese} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [3689] {sliced_cheese,
## sugar} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [3690] {long_life_bakery_product,
## sliced_cheese} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [3691] {dessert,
## sliced_cheese} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [3692] {dessert,
## sliced_cheese} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [3693] {cream_cheese_,
## sliced_cheese} => {sausage} 0.001016777 0.4166667 0.002440264 4.4349747 10
## [3694] {cream_cheese_,
## sliced_cheese} => {other_vegetables} 0.001220132 0.5000000 0.002440264 2.5840778 12
## [3695] {cream_cheese_,
## sliced_cheese} => {whole_milk} 0.001423488 0.5833333 0.002440264 2.2829619 14
## [3696] {chicken,
## sliced_cheese} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [3697] {sliced_cheese,
## white_bread} => {fruit/vegetable_juice} 0.001016777 0.4545455 0.002236909 6.2875591 10
## [3698] {fruit/vegetable_juice,
## sliced_cheese} => {white_bread} 0.001016777 0.2439024 0.004168785 5.7941558 10
## [3699] {sliced_cheese,
## white_bread} => {yogurt} 0.001016777 0.4545455 0.002236909 3.2583488 10
## [3700] {sliced_cheese,
## white_bread} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [3701] {sliced_cheese,
## white_bread} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [3702] {chocolate,
## sliced_cheese} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [3703] {chocolate,
## sliced_cheese} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [3704] {coffee,
## sliced_cheese} => {yogurt} 0.001220132 0.4800000 0.002541942 3.4408163 12
## [3705] {coffee,
## sliced_cheese} => {other_vegetables} 0.001118454 0.4400000 0.002541942 2.2739884 11
## [3706] {coffee,
## sliced_cheese} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [3707] {frozen_vegetables,
## sliced_cheese} => {root_vegetables} 0.001321810 0.5909091 0.002236909 5.4212602 13
## [3708] {root_vegetables,
## sliced_cheese} => {frozen_vegetables} 0.001321810 0.2363636 0.005592272 4.9146646 13
## [3709] {frozen_vegetables,
## sliced_cheese} => {yogurt} 0.001118454 0.5000000 0.002236909 3.5841837 11
## [3710] {frozen_vegetables,
## sliced_cheese} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [3711] {frozen_vegetables,
## sliced_cheese} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [3712] {beef,
## sliced_cheese} => {root_vegetables} 0.001118454 0.5238095 0.002135231 4.8056592 11
## [3713] {root_vegetables,
## sliced_cheese} => {beef} 0.001118454 0.2000000 0.005592272 3.8120155 11
## [3714] {beef,
## sliced_cheese} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [3715] {beef,
## sliced_cheese} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [3716] {curd,
## sliced_cheese} => {sausage} 0.001118454 0.3928571 0.002846975 4.1815476 11
## [3717] {curd,
## sliced_cheese} => {tropical_fruit} 0.001016777 0.3571429 0.002846975 3.4035853 10
## [3718] {curd,
## sliced_cheese} => {yogurt} 0.001626843 0.5714286 0.002846975 4.0962099 16
## [3719] {sliced_cheese,
## yogurt} => {curd} 0.001626843 0.2025316 0.008032537 3.8013335 16
## [3720] {curd,
## sliced_cheese} => {other_vegetables} 0.001118454 0.3928571 0.002846975 2.0303468 11
## [3721] {curd,
## sliced_cheese} => {whole_milk} 0.001423488 0.5000000 0.002846975 1.9568245 14
## [3722] {napkins,
## sliced_cheese} => {sausage} 0.001016777 0.3333333 0.003050330 3.5479798 10
## [3723] {napkins,
## sliced_cheese} => {tropical_fruit} 0.001321810 0.4333333 0.003050330 4.1296835 13
## [3724] {sliced_cheese,
## tropical_fruit} => {napkins} 0.001321810 0.2500000 0.005287239 4.7742718 13
## [3725] {napkins,
## sliced_cheese} => {root_vegetables} 0.001118454 0.3666667 0.003050330 3.3639614 11
## [3726] {root_vegetables,
## sliced_cheese} => {napkins} 0.001118454 0.2000000 0.005592272 3.8194175 11
## [3727] {napkins,
## sliced_cheese} => {yogurt} 0.001118454 0.3666667 0.003050330 2.6284014 11
## [3728] {napkins,
## sliced_cheese} => {other_vegetables} 0.001626843 0.5333333 0.003050330 2.7563496 16
## [3729] {napkins,
## sliced_cheese} => {whole_milk} 0.001525165 0.5000000 0.003050330 1.9568245 15
## [3730] {pork,
## sliced_cheese} => {sausage} 0.001220132 0.4285714 0.002846975 4.5616883 12
## [3731] {pork,
## sliced_cheese} => {root_vegetables} 0.001321810 0.4642857 0.002846975 4.2595616 13
## [3732] {root_vegetables,
## sliced_cheese} => {pork} 0.001321810 0.2363636 0.005592272 4.0998878 13
## [3733] {pork,
## sliced_cheese} => {other_vegetables} 0.001321810 0.4642857 0.002846975 2.3995008 13
## [3734] {pork,
## sliced_cheese} => {whole_milk} 0.001423488 0.5000000 0.002846975 1.9568245 14
## [3735] {frankfurter,
## sliced_cheese} => {root_vegetables} 0.001118454 0.4782609 0.002338587 4.3877758 11
## [3736] {root_vegetables,
## sliced_cheese} => {frankfurter} 0.001118454 0.2000000 0.005592272 3.3913793 11
## [3737] {frankfurter,
## sliced_cheese} => {yogurt} 0.001220132 0.5217391 0.002338587 3.7400177 12
## [3738] {frankfurter,
## sliced_cheese} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [3739] {frankfurter,
## sliced_cheese} => {whole_milk} 0.001626843 0.6956522 0.002338587 2.7225385 16
## [3740] {bottled_beer,
## sliced_cheese} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [3741] {brown_bread,
## sliced_cheese} => {sausage} 0.001321810 0.4642857 0.002846975 4.9418290 13
## [3742] {brown_bread,
## sliced_cheese} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [3743] {brown_bread,
## sliced_cheese} => {rolls/buns} 0.001016777 0.3571429 0.002846975 1.9416805 10
## [3744] {brown_bread,
## sliced_cheese} => {other_vegetables} 0.001118454 0.3928571 0.002846975 2.0303468 11
## [3745] {brown_bread,
## sliced_cheese} => {whole_milk} 0.001321810 0.4642857 0.002846975 1.8170513 13
## [3746] {margarine,
## sliced_cheese} => {bottled_water} 0.001016777 0.3333333 0.003050330 3.0159460 10
## [3747] {bottled_water,
## sliced_cheese} => {margarine} 0.001016777 0.2631579 0.003863752 4.4933297 10
## [3748] {margarine,
## sliced_cheese} => {yogurt} 0.001118454 0.3666667 0.003050330 2.6284014 11
## [3749] {margarine,
## sliced_cheese} => {other_vegetables} 0.001626843 0.5333333 0.003050330 2.7563496 16
## [3750] {margarine,
## sliced_cheese} => {whole_milk} 0.001525165 0.5000000 0.003050330 1.9568245 15
## [3751] {butter,
## sliced_cheese} => {whipped/sour_cream} 0.001321810 0.3513514 0.003762074 4.9014759 13
## [3752] {sliced_cheese,
## whipped/sour_cream} => {butter} 0.001321810 0.3421053 0.003863752 6.1735876 13
## [3753] {butter,
## sliced_cheese} => {tropical_fruit} 0.001423488 0.3783784 0.003762074 3.6059606 14
## [3754] {sliced_cheese,
## tropical_fruit} => {butter} 0.001423488 0.2692308 0.005287239 4.8585039 14
## [3755] {butter,
## sliced_cheese} => {root_vegetables} 0.001423488 0.3783784 0.003762074 3.4714098 14
## [3756] {root_vegetables,
## sliced_cheese} => {butter} 0.001423488 0.2545455 0.005592272 4.5934946 14
## [3757] {butter,
## sliced_cheese} => {yogurt} 0.001830198 0.4864865 0.003762074 3.4873138 18
## [3758] {sliced_cheese,
## yogurt} => {butter} 0.001830198 0.2278481 0.008032537 4.1117176 18
## [3759] {butter,
## sliced_cheese} => {rolls/buns} 0.001423488 0.3783784 0.003762074 2.0571318 14
## [3760] {butter,
## sliced_cheese} => {other_vegetables} 0.001830198 0.4864865 0.003762074 2.5142378 18
## [3761] {other_vegetables,
## sliced_cheese} => {butter} 0.001830198 0.2022472 0.009049314 3.6497268 18
## [3762] {butter,
## sliced_cheese} => {whole_milk} 0.002033554 0.5405405 0.003762074 2.1154860 20
## [3763] {newspapers,
## sliced_cheese} => {pastry} 0.001118454 0.3548387 0.003152008 3.9883871 11
## [3764] {pastry,
## sliced_cheese} => {newspapers} 0.001118454 0.3055556 0.003660397 3.8282024 11
## [3765] {newspapers,
## sliced_cheese} => {sausage} 0.001321810 0.4193548 0.003152008 4.4635875 13
## [3766] {newspapers,
## sliced_cheese} => {tropical_fruit} 0.001118454 0.3548387 0.003152008 3.3816267 11
## [3767] {sliced_cheese,
## tropical_fruit} => {newspapers} 0.001118454 0.2115385 0.005287239 2.6502940 11
## [3768] {newspapers,
## sliced_cheese} => {root_vegetables} 0.001016777 0.3225806 0.003152008 2.9594969 10
## [3769] {newspapers,
## sliced_cheese} => {soda} 0.001321810 0.4193548 0.003152008 2.4048716 13
## [3770] {sliced_cheese,
## soda} => {newspapers} 0.001321810 0.2600000 0.005083884 3.2574522 13
## [3771] {newspapers,
## sliced_cheese} => {yogurt} 0.001321810 0.4193548 0.003152008 3.0060895 13
## [3772] {newspapers,
## sliced_cheese} => {other_vegetables} 0.001830198 0.5806452 0.003152008 3.0008645 18
## [3773] {other_vegetables,
## sliced_cheese} => {newspapers} 0.001830198 0.2022472 0.009049314 2.5338868 18
## [3774] {newspapers,
## sliced_cheese} => {whole_milk} 0.001321810 0.4193548 0.003152008 1.6412077 13
## [3775] {domestic_eggs,
## sliced_cheese} => {whipped/sour_cream} 0.001118454 0.3333333 0.003355363 4.6501182 11
## [3776] {sliced_cheese,
## whipped/sour_cream} => {domestic_eggs} 0.001118454 0.2894737 0.003863752 4.5624578 11
## [3777] {domestic_eggs,
## sliced_cheese} => {sausage} 0.001016777 0.3030303 0.003355363 3.2254362 10
## [3778] {domestic_eggs,
## sliced_cheese} => {tropical_fruit} 0.001016777 0.3030303 0.003355363 2.8878905 10
## [3779] {domestic_eggs,
## sliced_cheese} => {root_vegetables} 0.001220132 0.3636364 0.003355363 3.3361601 12
## [3780] {root_vegetables,
## sliced_cheese} => {domestic_eggs} 0.001220132 0.2181818 0.005592272 3.4388112 12
## [3781] {domestic_eggs,
## sliced_cheese} => {yogurt} 0.001118454 0.3333333 0.003355363 2.3894558 11
## [3782] {domestic_eggs,
## sliced_cheese} => {rolls/buns} 0.001220132 0.3636364 0.003355363 1.9769838 12
## [3783] {domestic_eggs,
## sliced_cheese} => {other_vegetables} 0.001423488 0.4242424 0.003355363 2.1925508 14
## [3784] {domestic_eggs,
## sliced_cheese} => {whole_milk} 0.001830198 0.5454545 0.003355363 2.1347177 18
## [3785] {fruit/vegetable_juice,
## sliced_cheese} => {whipped/sour_cream} 0.001118454 0.2682927 0.004168785 3.7427781 11
## [3786] {sliced_cheese,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001118454 0.2894737 0.003863752 4.0041824 11
## [3787] {fruit/vegetable_juice,
## sliced_cheese} => {bottled_water} 0.001118454 0.2682927 0.004168785 2.4274688 11
## [3788] {bottled_water,
## sliced_cheese} => {fruit/vegetable_juice} 0.001118454 0.2894737 0.003863752 4.0041824 11
## [3789] {fruit/vegetable_juice,
## sliced_cheese} => {tropical_fruit} 0.001423488 0.3414634 0.004168785 3.2541596 14
## [3790] {sliced_cheese,
## tropical_fruit} => {fruit/vegetable_juice} 0.001423488 0.2692308 0.005287239 3.7241696 14
## [3791] {fruit/vegetable_juice,
## sliced_cheese} => {root_vegetables} 0.001118454 0.2682927 0.004168785 2.4614352 11
## [3792] {root_vegetables,
## sliced_cheese} => {fruit/vegetable_juice} 0.001118454 0.2000000 0.005592272 2.7665260 11
## [3793] {fruit/vegetable_juice,
## sliced_cheese} => {yogurt} 0.001728521 0.4146341 0.004168785 2.9722499 17
## [3794] {sliced_cheese,
## yogurt} => {fruit/vegetable_juice} 0.001728521 0.2151899 0.008032537 2.9766419 17
## [3795] {fruit/vegetable_juice,
## sliced_cheese} => {rolls/buns} 0.001220132 0.2926829 0.004168785 1.5912308 12
## [3796] {fruit/vegetable_juice,
## sliced_cheese} => {other_vegetables} 0.001830198 0.4390244 0.004168785 2.2689463 18
## [3797] {other_vegetables,
## sliced_cheese} => {fruit/vegetable_juice} 0.001830198 0.2022472 0.009049314 2.7976106 18
## [3798] {fruit/vegetable_juice,
## sliced_cheese} => {whole_milk} 0.001830198 0.4390244 0.004168785 1.7181874 18
## [3799] {sliced_cheese,
## whipped/sour_cream} => {sausage} 0.001220132 0.3157895 0.003863752 3.3612440 12
## [3800] {sliced_cheese,
## whipped/sour_cream} => {tropical_fruit} 0.001423488 0.3684211 0.003863752 3.5110669 14
## [3801] {sliced_cheese,
## tropical_fruit} => {whipped/sour_cream} 0.001423488 0.2692308 0.005287239 3.7558647 14
## [3802] {sliced_cheese,
## whipped/sour_cream} => {root_vegetables} 0.001830198 0.4736842 0.003863752 4.3457875 18
## [3803] {root_vegetables,
## sliced_cheese} => {whipped/sour_cream} 0.001830198 0.3272727 0.005592272 4.5655706 18
## [3804] {sliced_cheese,
## whipped/sour_cream} => {yogurt} 0.001931876 0.5000000 0.003863752 3.5841837 19
## [3805] {sliced_cheese,
## yogurt} => {whipped/sour_cream} 0.001931876 0.2405063 0.008032537 3.3551486 19
## [3806] {sliced_cheese,
## whipped/sour_cream} => {rolls/buns} 0.001016777 0.2631579 0.003863752 1.4307119 10
## [3807] {sliced_cheese,
## whipped/sour_cream} => {other_vegetables} 0.002135231 0.5526316 0.003863752 2.8560860 21
## [3808] {other_vegetables,
## sliced_cheese} => {whipped/sour_cream} 0.002135231 0.2359551 0.009049314 3.2916567 21
## [3809] {sliced_cheese,
## whipped/sour_cream} => {whole_milk} 0.002745297 0.7105263 0.003863752 2.7807506 27
## [3810] {sliced_cheese,
## whole_milk} => {whipped/sour_cream} 0.002745297 0.2547170 0.010777834 3.5533922 27
## [3811] {pip_fruit,
## sliced_cheese} => {sausage} 0.001423488 0.3414634 0.004168785 3.6345159 14
## [3812] {sausage,
## sliced_cheese} => {pip_fruit} 0.001423488 0.2028986 0.007015760 2.6821334 14
## [3813] {pip_fruit,
## sliced_cheese} => {tropical_fruit} 0.001525165 0.3658537 0.004168785 3.4865995 15
## [3814] {sliced_cheese,
## tropical_fruit} => {pip_fruit} 0.001525165 0.2884615 0.005287239 3.8131979 15
## [3815] {pip_fruit,
## sliced_cheese} => {root_vegetables} 0.001118454 0.2682927 0.004168785 2.4614352 11
## [3816] {root_vegetables,
## sliced_cheese} => {pip_fruit} 0.001118454 0.2000000 0.005592272 2.6438172 11
## [3817] {pip_fruit,
## sliced_cheese} => {yogurt} 0.002033554 0.4878049 0.004168785 3.4967646 20
## [3818] {sliced_cheese,
## yogurt} => {pip_fruit} 0.002033554 0.2531646 0.008032537 3.3466041 20
## [3819] {pip_fruit,
## sliced_cheese} => {rolls/buns} 0.001118454 0.2682927 0.004168785 1.4586283 11
## [3820] {pip_fruit,
## sliced_cheese} => {other_vegetables} 0.002135231 0.5121951 0.004168785 2.6471041 21
## [3821] {other_vegetables,
## sliced_cheese} => {pip_fruit} 0.002135231 0.2359551 0.009049314 3.1191102 21
## [3822] {pip_fruit,
## sliced_cheese} => {whole_milk} 0.002236909 0.5365854 0.004168785 2.1000068 22
## [3823] {sliced_cheese,
## whole_milk} => {pip_fruit} 0.002236909 0.2075472 0.010777834 2.7435839 22
## [3824] {pastry,
## sliced_cheese} => {sausage} 0.001321810 0.3611111 0.003660397 3.8436448 13
## [3825] {pastry,
## sliced_cheese} => {soda} 0.001016777 0.2777778 0.003660397 1.5929705 10
## [3826] {sliced_cheese,
## soda} => {pastry} 0.001016777 0.2000000 0.005083884 2.2480000 10
## [3827] {pastry,
## sliced_cheese} => {yogurt} 0.001220132 0.3333333 0.003660397 2.3894558 12
## [3828] {pastry,
## sliced_cheese} => {rolls/buns} 0.001525165 0.4166667 0.003660397 2.2652939 15
## [3829] {rolls/buns,
## sliced_cheese} => {pastry} 0.001525165 0.2000000 0.007625826 2.2480000 15
## [3830] {pastry,
## sliced_cheese} => {other_vegetables} 0.001931876 0.5277778 0.003660397 2.7276376 19
## [3831] {other_vegetables,
## sliced_cheese} => {pastry} 0.001931876 0.2134831 0.009049314 2.3995506 19
## [3832] {pastry,
## sliced_cheese} => {whole_milk} 0.001931876 0.5277778 0.003660397 2.0655370 19
## [3833] {citrus_fruit,
## sliced_cheese} => {tropical_fruit} 0.001118454 0.3235294 0.003457041 3.0832478 11
## [3834] {sliced_cheese,
## tropical_fruit} => {citrus_fruit} 0.001118454 0.2115385 0.005287239 2.5558732 11
## [3835] {citrus_fruit,
## sliced_cheese} => {yogurt} 0.001728521 0.5000000 0.003457041 3.5841837 17
## [3836] {sliced_cheese,
## yogurt} => {citrus_fruit} 0.001728521 0.2151899 0.008032537 2.5999907 17
## [3837] {citrus_fruit,
## sliced_cheese} => {rolls/buns} 0.001016777 0.2941176 0.003457041 1.5990310 10
## [3838] {citrus_fruit,
## sliced_cheese} => {other_vegetables} 0.001423488 0.4117647 0.003457041 2.1280640 14
## [3839] {citrus_fruit,
## sliced_cheese} => {whole_milk} 0.002033554 0.5882353 0.003457041 2.3021465 20
## [3840] {shopping_bags,
## sliced_cheese} => {sausage} 0.001321810 0.3023256 0.004372140 3.2179352 13
## [3841] {shopping_bags,
## sliced_cheese} => {root_vegetables} 0.001118454 0.2558140 0.004372140 2.3469498 11
## [3842] {root_vegetables,
## sliced_cheese} => {shopping_bags} 0.001118454 0.2000000 0.005592272 2.0299278 11
## [3843] {shopping_bags,
## sliced_cheese} => {soda} 0.001118454 0.2558140 0.004372140 1.4670147 11
## [3844] {sliced_cheese,
## soda} => {shopping_bags} 0.001118454 0.2200000 0.005083884 2.2329205 11
## [3845] {shopping_bags,
## sliced_cheese} => {yogurt} 0.001016777 0.2325581 0.004372140 1.6670622 10
## [3846] {shopping_bags,
## sliced_cheese} => {rolls/buns} 0.001626843 0.3720930 0.004372140 2.0229601 16
## [3847] {rolls/buns,
## sliced_cheese} => {shopping_bags} 0.001626843 0.2133333 0.007625826 2.1652563 16
## [3848] {shopping_bags,
## sliced_cheese} => {other_vegetables} 0.001525165 0.3488372 0.004372140 1.8028450 15
## [3849] {shopping_bags,
## sliced_cheese} => {whole_milk} 0.001626843 0.3720930 0.004372140 1.4562415 16
## [3850] {sausage,
## sliced_cheese} => {tropical_fruit} 0.001423488 0.2028986 0.007015760 1.9336311 14
## [3851] {sliced_cheese,
## tropical_fruit} => {sausage} 0.001423488 0.2692308 0.005287239 2.8656760 14
## [3852] {sausage,
## sliced_cheese} => {root_vegetables} 0.001830198 0.2608696 0.007015760 2.3933323 18
## [3853] {root_vegetables,
## sliced_cheese} => {sausage} 0.001830198 0.3272727 0.005592272 3.4834711 18
## [3854] {sausage,
## sliced_cheese} => {soda} 0.001830198 0.2608696 0.007015760 1.4960071 18
## [3855] {sliced_cheese,
## soda} => {sausage} 0.001830198 0.3600000 0.005083884 3.8318182 18
## [3856] {sausage,
## sliced_cheese} => {yogurt} 0.002440264 0.3478261 0.007015760 2.4933452 24
## [3857] {sliced_cheese,
## yogurt} => {sausage} 0.002440264 0.3037975 0.008032537 3.2336018 24
## [3858] {sausage,
## sliced_cheese} => {rolls/buns} 0.002948653 0.4202899 0.007015760 2.2849921 29
## [3859] {rolls/buns,
## sliced_cheese} => {sausage} 0.002948653 0.3866667 0.007625826 4.1156566 29
## [3860] {sausage,
## sliced_cheese} => {other_vegetables} 0.002440264 0.3478261 0.007015760 1.7976193 24
## [3861] {other_vegetables,
## sliced_cheese} => {sausage} 0.002440264 0.2696629 0.009049314 2.8702758 24
## [3862] {sausage,
## sliced_cheese} => {whole_milk} 0.003152008 0.4492754 0.007015760 1.7583061 31
## [3863] {sliced_cheese,
## whole_milk} => {sausage} 0.003152008 0.2924528 0.010777834 3.1128502 31
## [3864] {bottled_water,
## sliced_cheese} => {tropical_fruit} 0.001118454 0.2894737 0.003863752 2.7586954 11
## [3865] {sliced_cheese,
## tropical_fruit} => {bottled_water} 0.001118454 0.2115385 0.005287239 1.9139657 11
## [3866] {bottled_water,
## sliced_cheese} => {root_vegetables} 0.001118454 0.2894737 0.003863752 2.6557590 11
## [3867] {root_vegetables,
## sliced_cheese} => {bottled_water} 0.001118454 0.2000000 0.005592272 1.8095676 11
## [3868] {bottled_water,
## sliced_cheese} => {soda} 0.001118454 0.2894737 0.003863752 1.6600430 11
## [3869] {sliced_cheese,
## soda} => {bottled_water} 0.001118454 0.2200000 0.005083884 1.9905244 11
## [3870] {bottled_water,
## sliced_cheese} => {yogurt} 0.001626843 0.4210526 0.003863752 3.0182599 16
## [3871] {sliced_cheese,
## yogurt} => {bottled_water} 0.001626843 0.2025316 0.008032537 1.8324735 16
## [3872] {bottled_water,
## sliced_cheese} => {rolls/buns} 0.001118454 0.2894737 0.003863752 1.5737831 11
## [3873] {bottled_water,
## sliced_cheese} => {other_vegetables} 0.001525165 0.3947368 0.003863752 2.0400614 15
## [3874] {bottled_water,
## sliced_cheese} => {whole_milk} 0.001830198 0.4736842 0.003863752 1.8538337 18
## [3875] {sliced_cheese,
## tropical_fruit} => {root_vegetables} 0.002033554 0.3846154 0.005287239 3.5286309 20
## [3876] {root_vegetables,
## sliced_cheese} => {tropical_fruit} 0.002033554 0.3636364 0.005592272 3.4654686 20
## [3877] {sliced_cheese,
## tropical_fruit} => {soda} 0.001525165 0.2884615 0.005287239 1.6542386 15
## [3878] {sliced_cheese,
## soda} => {tropical_fruit} 0.001525165 0.3000000 0.005083884 2.8590116 15
## [3879] {sliced_cheese,
## tropical_fruit} => {yogurt} 0.002745297 0.5192308 0.005287239 3.7220369 27
## [3880] {sliced_cheese,
## yogurt} => {tropical_fruit} 0.002745297 0.3417722 0.008032537 3.2571019 27
## [3881] {sliced_cheese,
## tropical_fruit} => {rolls/buns} 0.001626843 0.3076923 0.005287239 1.6728324 16
## [3882] {rolls/buns,
## sliced_cheese} => {tropical_fruit} 0.001626843 0.2133333 0.007625826 2.0330749 16
## [3883] {sliced_cheese,
## tropical_fruit} => {other_vegetables} 0.003050330 0.5769231 0.005287239 2.9816282 30
## [3884] {other_vegetables,
## sliced_cheese} => {tropical_fruit} 0.003050330 0.3370787 0.009049314 3.2123726 30
## [3885] {sliced_cheese,
## tropical_fruit} => {whole_milk} 0.002846975 0.5384615 0.005287239 2.1073495 28
## [3886] {sliced_cheese,
## whole_milk} => {tropical_fruit} 0.002846975 0.2641509 0.010777834 2.5173687 28
## [3887] {root_vegetables,
## sliced_cheese} => {soda} 0.001118454 0.2000000 0.005592272 1.1469388 11
## [3888] {sliced_cheese,
## soda} => {root_vegetables} 0.001118454 0.2200000 0.005083884 2.0183769 11
## [3889] {root_vegetables,
## sliced_cheese} => {yogurt} 0.002236909 0.4000000 0.005592272 2.8673469 22
## [3890] {sliced_cheese,
## yogurt} => {root_vegetables} 0.002236909 0.2784810 0.008032537 2.5549074 22
## [3891] {root_vegetables,
## sliced_cheese} => {rolls/buns} 0.001321810 0.2363636 0.005592272 1.2850394 13
## [3892] {root_vegetables,
## sliced_cheese} => {other_vegetables} 0.003762074 0.6727273 0.005592272 3.4767592 37
## [3893] {other_vegetables,
## sliced_cheese} => {root_vegetables} 0.003762074 0.4157303 0.009049314 3.8140932 37
## [3894] {root_vegetables,
## sliced_cheese} => {whole_milk} 0.003152008 0.5636364 0.005592272 2.2058749 31
## [3895] {sliced_cheese,
## whole_milk} => {root_vegetables} 0.003152008 0.2924528 0.010777834 2.6830910 31
## [3896] {sliced_cheese,
## soda} => {yogurt} 0.001931876 0.3800000 0.005083884 2.7239796 19
## [3897] {sliced_cheese,
## yogurt} => {soda} 0.001931876 0.2405063 0.008032537 1.3792302 19
## [3898] {sliced_cheese,
## soda} => {rolls/buns} 0.002338587 0.4600000 0.005083884 2.5008845 23
## [3899] {rolls/buns,
## sliced_cheese} => {soda} 0.002338587 0.3066667 0.007625826 1.7586395 23
## [3900] {sliced_cheese,
## soda} => {other_vegetables} 0.001525165 0.3000000 0.005083884 1.5504467 15
## [3901] {sliced_cheese,
## soda} => {whole_milk} 0.002236909 0.4400000 0.005083884 1.7220056 22
## [3902] {sliced_cheese,
## whole_milk} => {soda} 0.002236909 0.2075472 0.010777834 1.1902195 22
## [3903] {sliced_cheese,
## yogurt} => {rolls/buns} 0.002440264 0.3037975 0.008032537 1.6516573 24
## [3904] {rolls/buns,
## sliced_cheese} => {yogurt} 0.002440264 0.3200000 0.007625826 2.2938776 24
## [3905] {sliced_cheese,
## yogurt} => {other_vegetables} 0.003050330 0.3797468 0.008032537 1.9625907 30
## [3906] {other_vegetables,
## sliced_cheese} => {yogurt} 0.003050330 0.3370787 0.009049314 2.4163036 30
## [3907] {sliced_cheese,
## yogurt} => {whole_milk} 0.004575496 0.5696203 0.008032537 2.2292937 45
## [3908] {sliced_cheese,
## whole_milk} => {yogurt} 0.004575496 0.4245283 0.010777834 3.0431748 45
## [3909] {rolls/buns,
## sliced_cheese} => {other_vegetables} 0.002440264 0.3200000 0.007625826 1.6538098 24
## [3910] {other_vegetables,
## sliced_cheese} => {rolls/buns} 0.002440264 0.2696629 0.009049314 1.4660779 24
## [3911] {rolls/buns,
## sliced_cheese} => {whole_milk} 0.003050330 0.4000000 0.007625826 1.5654596 30
## [3912] {sliced_cheese,
## whole_milk} => {rolls/buns} 0.003050330 0.2830189 0.010777834 1.5386902 30
## [3913] {other_vegetables,
## sliced_cheese} => {whole_milk} 0.004575496 0.5056180 0.009049314 1.9788113 45
## [3914] {sliced_cheese,
## whole_milk} => {other_vegetables} 0.004575496 0.4245283 0.010777834 2.1940283 45
## [3915] {hygiene_articles,
## uht_milk} => {tropical_fruit} 0.001016777 0.5882353 0.001728521 5.6059052 10
## [3916] {tropical_fruit,
## uht_milk} => {hygiene_articles} 0.001016777 0.2040816 0.004982206 6.1948854 10
## [3917] {dessert,
## uht_milk} => {yogurt} 0.001016777 0.3333333 0.003050330 2.3894558 10
## [3918] {dessert,
## uht_milk} => {other_vegetables} 0.001016777 0.3333333 0.003050330 1.7227185 10
## [3919] {chicken,
## uht_milk} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [3920] {coffee,
## uht_milk} => {soda} 0.001016777 0.2380952 0.004270463 1.3654033 10
## [3921] {coffee,
## uht_milk} => {yogurt} 0.001118454 0.2619048 0.004270463 1.8774295 11
## [3922] {frozen_vegetables,
## uht_milk} => {yogurt} 0.001016777 0.3703704 0.002745297 2.6549509 10
## [3923] {frozen_vegetables,
## uht_milk} => {other_vegetables} 0.001016777 0.3703704 0.002745297 1.9141317 10
## [3924] {beef,
## uht_milk} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [3925] {curd,
## uht_milk} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [3926] {pork,
## uht_milk} => {root_vegetables} 0.001016777 0.3125000 0.003253686 2.8670126 10
## [3927] {root_vegetables,
## uht_milk} => {pork} 0.001016777 0.2083333 0.004880529 3.6136831 10
## [3928] {pork,
## uht_milk} => {soda} 0.001220132 0.3750000 0.003253686 2.1505102 12
## [3929] {pork,
## uht_milk} => {other_vegetables} 0.001321810 0.4062500 0.003253686 2.0995632 13
## [3930] {frankfurter,
## uht_milk} => {yogurt} 0.001016777 0.3225806 0.003152008 2.3123766 10
## [3931] {frankfurter,
## uht_milk} => {other_vegetables} 0.001118454 0.3548387 0.003152008 1.8338616 11
## [3932] {bottled_beer,
## uht_milk} => {bottled_water} 0.001118454 0.4583333 0.002440264 4.1469258 11
## [3933] {bottled_beer,
## uht_milk} => {soda} 0.001016777 0.4166667 0.002440264 2.3894558 10
## [3934] {brown_bread,
## uht_milk} => {yogurt} 0.001016777 0.2500000 0.004067107 1.7920918 10
## [3935] {brown_bread,
## uht_milk} => {other_vegetables} 0.001118454 0.2750000 0.004067107 1.4212428 11
## [3936] {margarine,
## uht_milk} => {bottled_water} 0.001118454 0.2820513 0.003965430 2.5519543 11
## [3937] {margarine,
## uht_milk} => {yogurt} 0.001321810 0.3333333 0.003965430 2.3894558 13
## [3938] {margarine,
## uht_milk} => {other_vegetables} 0.001220132 0.3076923 0.003965430 1.5902017 12
## [3939] {butter,
## uht_milk} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [3940] {newspapers,
## uht_milk} => {fruit/vegetable_juice} 0.001016777 0.2380952 0.004270463 3.2934834 10
## [3941] {fruit/vegetable_juice,
## uht_milk} => {newspapers} 0.001016777 0.2564103 0.003965430 3.2124775 10
## [3942] {newspapers,
## uht_milk} => {soda} 0.001220132 0.2857143 0.004270463 1.6384840 12
## [3943] {newspapers,
## uht_milk} => {yogurt} 0.001118454 0.2619048 0.004270463 1.8774295 11
## [3944] {newspapers,
## uht_milk} => {other_vegetables} 0.001525165 0.3571429 0.004270463 1.8457698 15
## [3945] {domestic_eggs,
## uht_milk} => {tropical_fruit} 0.001016777 0.2500000 0.004067107 2.3825097 10
## [3946] {tropical_fruit,
## uht_milk} => {domestic_eggs} 0.001016777 0.2040816 0.004982206 3.2165751 10
## [3947] {domestic_eggs,
## uht_milk} => {soda} 0.001118454 0.2750000 0.004067107 1.5770408 11
## [3948] {domestic_eggs,
## uht_milk} => {yogurt} 0.001321810 0.3250000 0.004067107 2.3297194 13
## [3949] {domestic_eggs,
## uht_milk} => {rolls/buns} 0.001525165 0.3750000 0.004067107 2.0387645 15
## [3950] {rolls/buns,
## uht_milk} => {domestic_eggs} 0.001525165 0.2380952 0.006405694 3.7526709 15
## [3951] {domestic_eggs,
## uht_milk} => {other_vegetables} 0.001321810 0.3250000 0.004067107 1.6796506 13
## [3952] {fruit/vegetable_juice,
## uht_milk} => {citrus_fruit} 0.001118454 0.2820513 0.003965430 3.4078309 11
## [3953] {citrus_fruit,
## uht_milk} => {fruit/vegetable_juice} 0.001118454 0.2444444 0.004575496 3.3813096 11
## [3954] {fruit/vegetable_juice,
## uht_milk} => {bottled_water} 0.001118454 0.2820513 0.003965430 2.5519543 11
## [3955] {fruit/vegetable_juice,
## uht_milk} => {tropical_fruit} 0.001525165 0.3846154 0.003965430 3.6653995 15
## [3956] {tropical_fruit,
## uht_milk} => {fruit/vegetable_juice} 0.001525165 0.3061224 0.004982206 4.2344786 15
## [3957] {fruit/vegetable_juice,
## uht_milk} => {soda} 0.001016777 0.2564103 0.003965430 1.4704343 10
## [3958] {fruit/vegetable_juice,
## uht_milk} => {yogurt} 0.001016777 0.2564103 0.003965430 1.8380429 10
## [3959] {fruit/vegetable_juice,
## uht_milk} => {other_vegetables} 0.001118454 0.2820513 0.003965430 1.4576849 11
## [3960] {uht_milk,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.3333333 0.003050330 3.0581468 10
## [3961] {root_vegetables,
## uht_milk} => {whipped/sour_cream} 0.001016777 0.2083333 0.004880529 2.9063239 10
## [3962] {uht_milk,
## whipped/sour_cream} => {yogurt} 0.001220132 0.4000000 0.003050330 2.8673469 12
## [3963] {uht_milk,
## whipped/sour_cream} => {other_vegetables} 0.001525165 0.5000000 0.003050330 2.5840778 15
## [3964] {pip_fruit,
## uht_milk} => {citrus_fruit} 0.001118454 0.2972973 0.003762074 3.5920380 11
## [3965] {citrus_fruit,
## uht_milk} => {pip_fruit} 0.001118454 0.2444444 0.004575496 3.2313321 11
## [3966] {pip_fruit,
## uht_milk} => {tropical_fruit} 0.001423488 0.3783784 0.003762074 3.6059606 14
## [3967] {tropical_fruit,
## uht_milk} => {pip_fruit} 0.001423488 0.2857143 0.004982206 3.7768817 14
## [3968] {pip_fruit,
## uht_milk} => {root_vegetables} 0.001220132 0.3243243 0.003762074 2.9754942 12
## [3969] {root_vegetables,
## uht_milk} => {pip_fruit} 0.001220132 0.2500000 0.004880529 3.3047715 12
## [3970] {pip_fruit,
## uht_milk} => {other_vegetables} 0.001423488 0.3783784 0.003762074 1.9555183 14
## [3971] {pastry,
## uht_milk} => {tropical_fruit} 0.001220132 0.3333333 0.003660397 3.1766796 12
## [3972] {tropical_fruit,
## uht_milk} => {pastry} 0.001220132 0.2448980 0.004982206 2.7526531 12
## [3973] {pastry,
## uht_milk} => {yogurt} 0.001423488 0.3888889 0.003660397 2.7876984 14
## [3974] {pastry,
## uht_milk} => {rolls/buns} 0.001016777 0.2777778 0.003660397 1.5101959 10
## [3975] {pastry,
## uht_milk} => {other_vegetables} 0.001016777 0.2777778 0.003660397 1.4355988 10
## [3976] {citrus_fruit,
## uht_milk} => {bottled_water} 0.001118454 0.2444444 0.004575496 2.2116938 11
## [3977] {citrus_fruit,
## uht_milk} => {tropical_fruit} 0.001220132 0.2666667 0.004575496 2.5413437 12
## [3978] {tropical_fruit,
## uht_milk} => {citrus_fruit} 0.001220132 0.2448980 0.004982206 2.9589330 12
## [3979] {citrus_fruit,
## uht_milk} => {yogurt} 0.001423488 0.3111111 0.004575496 2.2301587 14
## [3980] {citrus_fruit,
## uht_milk} => {other_vegetables} 0.001525165 0.3333333 0.004575496 1.7227185 15
## [3981] {shopping_bags,
## uht_milk} => {bottled_water} 0.001626843 0.3478261 0.004677173 3.1470741 16
## [3982] {bottled_water,
## uht_milk} => {shopping_bags} 0.001626843 0.2222222 0.007320793 2.2554753 16
## [3983] {shopping_bags,
## uht_milk} => {soda} 0.001220132 0.2608696 0.004677173 1.4960071 12
## [3984] {shopping_bags,
## uht_milk} => {other_vegetables} 0.001118454 0.2391304 0.004677173 1.2358633 11
## [3985] {sausage,
## uht_milk} => {soda} 0.001016777 0.2941176 0.003457041 1.6866747 10
## [3986] {sausage,
## uht_milk} => {other_vegetables} 0.001321810 0.3823529 0.003457041 1.9760595 13
## [3987] {tropical_fruit,
## uht_milk} => {bottled_water} 0.001423488 0.2857143 0.004982206 2.5850966 14
## [3988] {root_vegetables,
## uht_milk} => {bottled_water} 0.001220132 0.2500000 0.004880529 2.2619595 12
## [3989] {bottled_water,
## uht_milk} => {soda} 0.002846975 0.3888889 0.007320793 2.2301587 28
## [3990] {soda,
## uht_milk} => {bottled_water} 0.002846975 0.3733333 0.007625826 3.3778596 28
## [3991] {bottled_water,
## uht_milk} => {yogurt} 0.001525165 0.2083333 0.007320793 1.4934099 15
## [3992] {uht_milk,
## yogurt} => {bottled_water} 0.001525165 0.2054795 0.007422471 1.8591448 15
## [3993] {rolls/buns,
## uht_milk} => {bottled_water} 0.001321810 0.2063492 0.006405694 1.8670142 13
## [3994] {bottled_water,
## uht_milk} => {other_vegetables} 0.002236909 0.3055556 0.007320793 1.5791586 22
## [3995] {other_vegetables,
## uht_milk} => {bottled_water} 0.002236909 0.2750000 0.008134215 2.4881555 22
## [3996] {uht_milk,
## whole_milk} => {bottled_water} 0.001016777 0.2564103 0.003965430 2.3199585 10
## [3997] {tropical_fruit,
## uht_milk} => {soda} 0.001220132 0.2448980 0.004982206 1.4044148 12
## [3998] {tropical_fruit,
## uht_milk} => {yogurt} 0.001931876 0.3877551 0.004982206 2.7795710 19
## [3999] {uht_milk,
## yogurt} => {tropical_fruit} 0.001931876 0.2602740 0.007422471 2.4804210 19
## [4000] {tropical_fruit,
## uht_milk} => {other_vegetables} 0.002135231 0.4285714 0.004982206 2.2149238 21
## [4001] {other_vegetables,
## uht_milk} => {tropical_fruit} 0.002135231 0.2625000 0.008134215 2.5016352 21
## [4002] {root_vegetables,
## uht_milk} => {soda} 0.001830198 0.3750000 0.004880529 2.1505102 18
## [4003] {soda,
## uht_milk} => {root_vegetables} 0.001830198 0.2400000 0.007625826 2.2018657 18
## [4004] {root_vegetables,
## uht_milk} => {yogurt} 0.001626843 0.3333333 0.004880529 2.3894558 16
## [4005] {uht_milk,
## yogurt} => {root_vegetables} 0.001626843 0.2191781 0.007422471 2.0108362 16
## [4006] {root_vegetables,
## uht_milk} => {rolls/buns} 0.001016777 0.2083333 0.004880529 1.1326470 10
## [4007] {root_vegetables,
## uht_milk} => {other_vegetables} 0.001728521 0.3541667 0.004880529 1.8303884 17
## [4008] {other_vegetables,
## uht_milk} => {root_vegetables} 0.001728521 0.2125000 0.008134215 1.9495686 17
## [4009] {soda,
## uht_milk} => {other_vegetables} 0.002033554 0.2666667 0.007625826 1.3781748 20
## [4010] {other_vegetables,
## uht_milk} => {soda} 0.002033554 0.2500000 0.008134215 1.4336735 20
## [4011] {uht_milk,
## yogurt} => {rolls/buns} 0.002440264 0.3287671 0.007422471 1.7874100 24
## [4012] {rolls/buns,
## uht_milk} => {yogurt} 0.002440264 0.3809524 0.006405694 2.7308066 24
## [4013] {uht_milk,
## yogurt} => {other_vegetables} 0.002135231 0.2876712 0.007422471 1.4867297 21
## [4014] {other_vegetables,
## uht_milk} => {yogurt} 0.002135231 0.2625000 0.008134215 1.8816964 21
## [4015] {uht_milk,
## whole_milk} => {yogurt} 0.001016777 0.2564103 0.003965430 1.8380429 10
## [4016] {rolls/buns,
## uht_milk} => {other_vegetables} 0.001830198 0.2857143 0.006405694 1.4766159 18
## [4017] {other_vegetables,
## uht_milk} => {rolls/buns} 0.001830198 0.2250000 0.008134215 1.2232587 18
## [4018] {uht_milk,
## whole_milk} => {rolls/buns} 0.001016777 0.2564103 0.003965430 1.3940270 10
## [4019] {uht_milk,
## whole_milk} => {other_vegetables} 0.001423488 0.3589744 0.003965430 1.8552353 14
## [4020] {oil,
## onions} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [4021] {hamburger_meat,
## oil} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [4022] {hygiene_articles,
## oil} => {other_vegetables} 0.001016777 0.3846154 0.002643620 1.9877521 10
## [4023] {hygiene_articles,
## oil} => {whole_milk} 0.001118454 0.4230769 0.002643620 1.6557746 11
## [4024] {oil,
## sugar} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [4025] {oil,
## sugar} => {whole_milk} 0.001626843 0.7272727 0.002236909 2.8462902 16
## [4026] {long_life_bakery_product,
## oil} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [4027] {dessert,
## oil} => {soda} 0.001016777 0.4761905 0.002135231 2.7308066 10
## [4028] {oil,
## soda} => {dessert} 0.001016777 0.2173913 0.004677173 5.8576534 10
## [4029] {dessert,
## oil} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [4030] {cream_cheese_,
## oil} => {root_vegetables} 0.001016777 0.5555556 0.001830198 5.0969113 10
## [4031] {cream_cheese_,
## oil} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [4032] {cream_cheese_,
## oil} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [4033] {chicken,
## oil} => {root_vegetables} 0.001016777 0.4166667 0.002440264 3.8226835 10
## [4034] {chicken,
## oil} => {other_vegetables} 0.001525165 0.6250000 0.002440264 3.2300972 15
## [4035] {chicken,
## oil} => {whole_milk} 0.001321810 0.5416667 0.002440264 2.1198932 13
## [4036] {oil,
## white_bread} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [4037] {chocolate,
## oil} => {whole_milk} 0.001525165 0.5555556 0.002745297 2.1742495 15
## [4038] {coffee,
## oil} => {soda} 0.001118454 0.3333333 0.003355363 1.9115646 11
## [4039] {oil,
## soda} => {coffee} 0.001118454 0.2391304 0.004677173 4.1188228 11
## [4040] {coffee,
## oil} => {yogurt} 0.001118454 0.3333333 0.003355363 2.3894558 11
## [4041] {oil,
## yogurt} => {coffee} 0.001118454 0.2115385 0.005287239 3.6435740 11
## [4042] {coffee,
## oil} => {other_vegetables} 0.002033554 0.6060606 0.003355363 3.1322155 20
## [4043] {oil,
## other_vegetables} => {coffee} 0.002033554 0.2040816 0.009964413 3.5151364 20
## [4044] {coffee,
## oil} => {whole_milk} 0.001728521 0.5151515 0.003355363 2.0161222 17
## [4045] {frozen_vegetables,
## oil} => {other_vegetables} 0.001321810 0.6500000 0.002033554 3.3593011 13
## [4046] {frozen_vegetables,
## oil} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [4047] {beef,
## oil} => {whipped/sour_cream} 0.001016777 0.3225806 0.003152008 4.5001144 10
## [4048] {oil,
## whipped/sour_cream} => {beef} 0.001016777 0.2272727 0.004473818 4.3318358 10
## [4049] {beef,
## oil} => {root_vegetables} 0.001525165 0.4838710 0.003152008 4.4392453 15
## [4050] {oil,
## root_vegetables} => {beef} 0.001525165 0.2173913 0.007015760 4.1434951 15
## [4051] {beef,
## oil} => {rolls/buns} 0.001220132 0.3870968 0.003152008 2.1045311 12
## [4052] {oil,
## rolls/buns} => {beef} 0.001220132 0.2400000 0.005083884 4.5744186 12
## [4053] {beef,
## oil} => {other_vegetables} 0.001525165 0.4838710 0.003152008 2.5007204 15
## [4054] {beef,
## oil} => {whole_milk} 0.002033554 0.6451613 0.003152008 2.5249349 20
## [4055] {curd,
## oil} => {root_vegetables} 0.001220132 0.4615385 0.002643620 4.2343571 12
## [4056] {curd,
## oil} => {other_vegetables} 0.001220132 0.4615385 0.002643620 2.3853026 12
## [4057] {curd,
## oil} => {whole_milk} 0.001728521 0.6538462 0.002643620 2.5589244 17
## [4058] {oil,
## pork} => {root_vegetables} 0.001220132 0.3870968 0.003152008 3.5513962 12
## [4059] {oil,
## pork} => {other_vegetables} 0.001220132 0.3870968 0.003152008 2.0005763 12
## [4060] {oil,
## pork} => {whole_milk} 0.001525165 0.4838710 0.003152008 1.8937011 15
## [4061] {frankfurter,
## oil} => {sausage} 0.001016777 0.4000000 0.002541942 4.2575758 10
## [4062] {oil,
## sausage} => {frankfurter} 0.001016777 0.2500000 0.004067107 4.2392241 10
## [4063] {frankfurter,
## oil} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [4064] {bottled_beer,
## oil} => {citrus_fruit} 0.001016777 0.2941176 0.003457041 3.5536205 10
## [4065] {citrus_fruit,
## oil} => {bottled_beer} 0.001016777 0.2040816 0.004982206 2.5342713 10
## [4066] {bottled_beer,
## oil} => {bottled_water} 0.001220132 0.3529412 0.003457041 3.1933546 12
## [4067] {bottled_water,
## oil} => {bottled_beer} 0.001220132 0.2926829 0.004168785 3.6345159 12
## [4068] {bottled_beer,
## oil} => {root_vegetables} 0.001220132 0.3529412 0.003457041 3.2380378 12
## [4069] {bottled_beer,
## oil} => {other_vegetables} 0.001321810 0.3823529 0.003457041 1.9760595 13
## [4070] {bottled_beer,
## oil} => {whole_milk} 0.001626843 0.4705882 0.003457041 1.8417172 16
## [4071] {brown_bread,
## oil} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [4072] {brown_bread,
## oil} => {whole_milk} 0.001016777 0.4347826 0.002338587 1.7015865 10
## [4073] {margarine,
## oil} => {root_vegetables} 0.001118454 0.3055556 0.003660397 2.8033012 11
## [4074] {margarine,
## oil} => {other_vegetables} 0.002033554 0.5555556 0.003660397 2.8711975 20
## [4075] {oil,
## other_vegetables} => {margarine} 0.002033554 0.2040816 0.009964413 3.4846230 20
## [4076] {margarine,
## oil} => {whole_milk} 0.001321810 0.3611111 0.003660397 1.4132621 13
## [4077] {butter,
## oil} => {whipped/sour_cream} 0.001118454 0.3142857 0.003558719 4.3843972 11
## [4078] {oil,
## whipped/sour_cream} => {butter} 0.001118454 0.2500000 0.004473818 4.5114679 11
## [4079] {butter,
## oil} => {root_vegetables} 0.001830198 0.5142857 0.003558719 4.7182836 18
## [4080] {oil,
## root_vegetables} => {butter} 0.001830198 0.2608696 0.007015760 4.7076187 18
## [4081] {butter,
## oil} => {other_vegetables} 0.001830198 0.5142857 0.003558719 2.6579086 18
## [4082] {butter,
## oil} => {whole_milk} 0.001830198 0.5142857 0.003558719 2.0127338 18
## [4083] {newspapers,
## oil} => {root_vegetables} 0.001220132 0.3870968 0.003152008 3.5513962 12
## [4084] {newspapers,
## oil} => {other_vegetables} 0.001220132 0.3870968 0.003152008 2.0005763 12
## [4085] {newspapers,
## oil} => {whole_milk} 0.001423488 0.4516129 0.003152008 1.7674544 14
## [4086] {domestic_eggs,
## oil} => {citrus_fruit} 0.001016777 0.2702703 0.003762074 3.2654891 10
## [4087] {citrus_fruit,
## oil} => {domestic_eggs} 0.001016777 0.2040816 0.004982206 3.2165751 10
## [4088] {domestic_eggs,
## oil} => {root_vegetables} 0.001423488 0.3783784 0.003762074 3.4714098 14
## [4089] {oil,
## root_vegetables} => {domestic_eggs} 0.001423488 0.2028986 0.007015760 3.1979283 14
## [4090] {domestic_eggs,
## oil} => {yogurt} 0.001220132 0.3243243 0.003762074 2.3248759 12
## [4091] {oil,
## yogurt} => {domestic_eggs} 0.001220132 0.2307692 0.005287239 3.6372041 12
## [4092] {domestic_eggs,
## oil} => {other_vegetables} 0.001626843 0.4324324 0.003762074 2.2348781 16
## [4093] {domestic_eggs,
## oil} => {whole_milk} 0.001830198 0.4864865 0.003762074 1.9039374 18
## [4094] {fruit/vegetable_juice,
## oil} => {whipped/sour_cream} 0.001016777 0.2702703 0.003762074 3.7703661 10
## [4095] {oil,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001016777 0.2272727 0.004473818 3.1437796 10
## [4096] {fruit/vegetable_juice,
## oil} => {citrus_fruit} 0.001321810 0.3513514 0.003762074 4.2451358 13
## [4097] {citrus_fruit,
## oil} => {fruit/vegetable_juice} 0.001321810 0.2653061 0.004982206 3.6698815 13
## [4098] {fruit/vegetable_juice,
## oil} => {tropical_fruit} 0.001423488 0.3783784 0.003762074 3.6059606 14
## [4099] {oil,
## tropical_fruit} => {fruit/vegetable_juice} 0.001423488 0.3043478 0.004677173 4.2099309 14
## [4100] {fruit/vegetable_juice,
## oil} => {root_vegetables} 0.001830198 0.4864865 0.003762074 4.4632412 18
## [4101] {oil,
## root_vegetables} => {fruit/vegetable_juice} 0.001830198 0.2608696 0.007015760 3.6085122 18
## [4102] {fruit/vegetable_juice,
## oil} => {yogurt} 0.001423488 0.3783784 0.003762074 2.7123552 14
## [4103] {oil,
## yogurt} => {fruit/vegetable_juice} 0.001423488 0.2692308 0.005287239 3.7241696 14
## [4104] {fruit/vegetable_juice,
## oil} => {other_vegetables} 0.002135231 0.5675676 0.003762074 2.9332775 21
## [4105] {oil,
## other_vegetables} => {fruit/vegetable_juice} 0.002135231 0.2142857 0.009964413 2.9641350 21
## [4106] {fruit/vegetable_juice,
## oil} => {whole_milk} 0.001931876 0.5135135 0.003762074 2.0097117 19
## [4107] {oil,
## whipped/sour_cream} => {tropical_fruit} 0.001220132 0.2727273 0.004473818 2.5991015 12
## [4108] {oil,
## tropical_fruit} => {whipped/sour_cream} 0.001220132 0.2608696 0.004677173 3.6392229 12
## [4109] {oil,
## whipped/sour_cream} => {root_vegetables} 0.001830198 0.4090909 0.004473818 3.7531801 18
## [4110] {oil,
## root_vegetables} => {whipped/sour_cream} 0.001830198 0.2608696 0.007015760 3.6392229 18
## [4111] {oil,
## whipped/sour_cream} => {yogurt} 0.001220132 0.2727273 0.004473818 1.9550093 12
## [4112] {oil,
## yogurt} => {whipped/sour_cream} 0.001220132 0.2307692 0.005287239 3.2193126 12
## [4113] {oil,
## whipped/sour_cream} => {other_vegetables} 0.002135231 0.4772727 0.004473818 2.4666197 21
## [4114] {oil,
## other_vegetables} => {whipped/sour_cream} 0.002135231 0.2142857 0.009964413 2.9893617 21
## [4115] {oil,
## whipped/sour_cream} => {whole_milk} 0.001931876 0.4318182 0.004473818 1.6899848 19
## [4116] {oil,
## pip_fruit} => {sausage} 0.001118454 0.3793103 0.002948653 4.0373563 11
## [4117] {oil,
## sausage} => {pip_fruit} 0.001118454 0.2750000 0.004067107 3.6352487 11
## [4118] {oil,
## pip_fruit} => {root_vegetables} 0.001016777 0.3448276 0.002948653 3.1636001 10
## [4119] {oil,
## pip_fruit} => {yogurt} 0.001016777 0.3448276 0.002948653 2.4718508 10
## [4120] {oil,
## pip_fruit} => {rolls/buns} 0.001016777 0.3448276 0.002948653 1.8747260 10
## [4121] {oil,
## rolls/buns} => {pip_fruit} 0.001016777 0.2000000 0.005083884 2.6438172 10
## [4122] {oil,
## pip_fruit} => {other_vegetables} 0.001626843 0.5517241 0.002948653 2.8513962 16
## [4123] {oil,
## pip_fruit} => {whole_milk} 0.001728521 0.5862069 0.002948653 2.2942080 17
## [4124] {oil,
## pastry} => {rolls/buns} 0.001016777 0.3333333 0.003050330 1.8122351 10
## [4125] {oil,
## rolls/buns} => {pastry} 0.001016777 0.2000000 0.005083884 2.2480000 10
## [4126] {oil,
## pastry} => {other_vegetables} 0.001118454 0.3666667 0.003050330 1.8949904 11
## [4127] {oil,
## pastry} => {whole_milk} 0.001830198 0.6000000 0.003050330 2.3481894 18
## [4128] {citrus_fruit,
## oil} => {tropical_fruit} 0.001321810 0.2653061 0.004982206 2.5283776 13
## [4129] {oil,
## tropical_fruit} => {citrus_fruit} 0.001321810 0.2826087 0.004677173 3.4145658 13
## [4130] {citrus_fruit,
## oil} => {root_vegetables} 0.002135231 0.4285714 0.004982206 3.9319030 21
## [4131] {oil,
## root_vegetables} => {citrus_fruit} 0.002135231 0.3043478 0.007015760 3.6772247 21
## [4132] {citrus_fruit,
## oil} => {yogurt} 0.001118454 0.2244898 0.004982206 1.6092253 11
## [4133] {oil,
## yogurt} => {citrus_fruit} 0.001118454 0.2115385 0.005287239 2.5558732 11
## [4134] {citrus_fruit,
## oil} => {rolls/buns} 0.001118454 0.2244898 0.004982206 1.2204849 11
## [4135] {oil,
## rolls/buns} => {citrus_fruit} 0.001118454 0.2200000 0.005083884 2.6581081 11
## [4136] {citrus_fruit,
## oil} => {other_vegetables} 0.002541942 0.5102041 0.004982206 2.6368141 25
## [4137] {oil,
## other_vegetables} => {citrus_fruit} 0.002541942 0.2551020 0.009964413 3.0822218 25
## [4138] {citrus_fruit,
## oil} => {whole_milk} 0.002541942 0.5102041 0.004982206 1.9967597 25
## [4139] {oil,
## whole_milk} => {citrus_fruit} 0.002541942 0.2252252 0.011286223 2.7212409 25
## [4140] {oil,
## shopping_bags} => {root_vegetables} 0.001220132 0.4000000 0.003050330 3.6697761 12
## [4141] {oil,
## shopping_bags} => {other_vegetables} 0.001118454 0.3666667 0.003050330 1.8949904 11
## [4142] {oil,
## shopping_bags} => {whole_milk} 0.001525165 0.5000000 0.003050330 1.9568245 15
## [4143] {oil,
## sausage} => {tropical_fruit} 0.001016777 0.2500000 0.004067107 2.3825097 10
## [4144] {oil,
## tropical_fruit} => {sausage} 0.001016777 0.2173913 0.004677173 2.3138999 10
## [4145] {oil,
## sausage} => {root_vegetables} 0.001423488 0.3500000 0.004067107 3.2110541 14
## [4146] {oil,
## root_vegetables} => {sausage} 0.001423488 0.2028986 0.007015760 2.1596399 14
## [4147] {oil,
## sausage} => {soda} 0.001016777 0.2500000 0.004067107 1.4336735 10
## [4148] {oil,
## soda} => {sausage} 0.001016777 0.2173913 0.004677173 2.3138999 10
## [4149] {oil,
## sausage} => {rolls/buns} 0.001016777 0.2500000 0.004067107 1.3591763 10
## [4150] {oil,
## rolls/buns} => {sausage} 0.001016777 0.2000000 0.005083884 2.1287879 10
## [4151] {oil,
## sausage} => {other_vegetables} 0.001931876 0.4750000 0.004067107 2.4548739 19
## [4152] {oil,
## sausage} => {whole_milk} 0.001931876 0.4750000 0.004067107 1.8589833 19
## [4153] {bottled_water,
## oil} => {tropical_fruit} 0.001016777 0.2439024 0.004168785 2.3243997 10
## [4154] {oil,
## tropical_fruit} => {bottled_water} 0.001016777 0.2173913 0.004677173 1.9669213 10
## [4155] {bottled_water,
## oil} => {root_vegetables} 0.001016777 0.2439024 0.004168785 2.2376684 10
## [4156] {bottled_water,
## oil} => {yogurt} 0.001016777 0.2439024 0.004168785 1.7483823 10
## [4157] {bottled_water,
## oil} => {rolls/buns} 0.001220132 0.2926829 0.004168785 1.5912308 12
## [4158] {oil,
## rolls/buns} => {bottled_water} 0.001220132 0.2400000 0.005083884 2.1714811 12
## [4159] {bottled_water,
## oil} => {other_vegetables} 0.001626843 0.3902439 0.004168785 2.0168412 16
## [4160] {bottled_water,
## oil} => {whole_milk} 0.001931876 0.4634146 0.004168785 1.8136422 19
## [4161] {oil,
## tropical_fruit} => {root_vegetables} 0.002033554 0.4347826 0.004677173 3.9888871 20
## [4162] {oil,
## root_vegetables} => {tropical_fruit} 0.002033554 0.2898551 0.007015760 2.7623301 20
## [4163] {oil,
## tropical_fruit} => {soda} 0.001118454 0.2391304 0.004677173 1.3713398 11
## [4164] {oil,
## soda} => {tropical_fruit} 0.001118454 0.2391304 0.004677173 2.2789223 11
## [4165] {oil,
## tropical_fruit} => {yogurt} 0.001931876 0.4130435 0.004677173 2.9608474 19
## [4166] {oil,
## yogurt} => {tropical_fruit} 0.001931876 0.3653846 0.005287239 3.4821295 19
## [4167] {oil,
## tropical_fruit} => {rolls/buns} 0.001118454 0.2391304 0.004677173 1.3000817 11
## [4168] {oil,
## rolls/buns} => {tropical_fruit} 0.001118454 0.2200000 0.005083884 2.0966085 11
## [4169] {oil,
## tropical_fruit} => {other_vegetables} 0.002541942 0.5434783 0.004677173 2.8087802 25
## [4170] {oil,
## other_vegetables} => {tropical_fruit} 0.002541942 0.2551020 0.009964413 2.4311323 25
## [4171] {oil,
## tropical_fruit} => {whole_milk} 0.002541942 0.5434783 0.004677173 2.1269832 25
## [4172] {oil,
## whole_milk} => {tropical_fruit} 0.002541942 0.2252252 0.011286223 2.1464051 25
## [4173] {oil,
## soda} => {root_vegetables} 0.001118454 0.2391304 0.004677173 2.1938879 11
## [4174] {oil,
## root_vegetables} => {yogurt} 0.001931876 0.2753623 0.007015760 1.9738983 19
## [4175] {oil,
## yogurt} => {root_vegetables} 0.001931876 0.3653846 0.005287239 3.3521993 19
## [4176] {oil,
## root_vegetables} => {rolls/buns} 0.001931876 0.2753623 0.007015760 1.4970638 19
## [4177] {oil,
## rolls/buns} => {root_vegetables} 0.001931876 0.3800000 0.005083884 3.4862873 19
## [4178] {oil,
## root_vegetables} => {other_vegetables} 0.003863752 0.5507246 0.007015760 2.8462306 38
## [4179] {oil,
## other_vegetables} => {root_vegetables} 0.003863752 0.3877551 0.009964413 3.5574360 38
## [4180] {oil,
## root_vegetables} => {whole_milk} 0.004473818 0.6376812 0.007015760 2.4956602 44
## [4181] {oil,
## whole_milk} => {root_vegetables} 0.004473818 0.3963964 0.011286223 3.6367151 44
## [4182] {oil,
## soda} => {yogurt} 0.001118454 0.2391304 0.004677173 1.7141748 11
## [4183] {oil,
## yogurt} => {soda} 0.001118454 0.2115385 0.005287239 1.2131083 11
## [4184] {oil,
## soda} => {rolls/buns} 0.001016777 0.2173913 0.004677173 1.1818925 10
## [4185] {oil,
## rolls/buns} => {soda} 0.001016777 0.2000000 0.005083884 1.1469388 10
## [4186] {oil,
## soda} => {other_vegetables} 0.001423488 0.3043478 0.004677173 1.5729169 14
## [4187] {oil,
## soda} => {whole_milk} 0.001626843 0.3478261 0.004677173 1.3612692 16
## [4188] {oil,
## yogurt} => {rolls/buns} 0.001423488 0.2692308 0.005287239 1.4637284 14
## [4189] {oil,
## rolls/buns} => {yogurt} 0.001423488 0.2800000 0.005083884 2.0071429 14
## [4190] {oil,
## yogurt} => {other_vegetables} 0.003253686 0.6153846 0.005287239 3.1804034 32
## [4191] {oil,
## other_vegetables} => {yogurt} 0.003253686 0.3265306 0.009964413 2.3406914 32
## [4192] {oil,
## yogurt} => {whole_milk} 0.003152008 0.5961538 0.005287239 2.3331369 31
## [4193] {oil,
## whole_milk} => {yogurt} 0.003152008 0.2792793 0.011286223 2.0019765 31
## [4194] {oil,
## rolls/buns} => {other_vegetables} 0.002033554 0.4000000 0.005083884 2.0672622 20
## [4195] {oil,
## other_vegetables} => {rolls/buns} 0.002033554 0.2040816 0.009964413 1.1095317 20
## [4196] {oil,
## rolls/buns} => {whole_milk} 0.003050330 0.6000000 0.005083884 2.3481894 30
## [4197] {oil,
## whole_milk} => {rolls/buns} 0.003050330 0.2702703 0.011286223 1.4693798 30
## [4198] {oil,
## other_vegetables} => {whole_milk} 0.005083884 0.5102041 0.009964413 1.9967597 50
## [4199] {oil,
## whole_milk} => {other_vegetables} 0.005083884 0.4504505 0.011286223 2.3279980 50
## [4200] {hamburger_meat,
## onions} => {other_vegetables} 0.001525165 0.6250000 0.002440264 3.2300972 15
## [4201] {hamburger_meat,
## onions} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [4202] {hygiene_articles,
## onions} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [4203] {onions,
## sugar} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [4204] {onions,
## waffles} => {other_vegetables} 0.001220132 0.8000000 0.001525165 4.1345244 12
## [4205] {long_life_bakery_product,
## onions} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [4206] {long_life_bakery_product,
## onions} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [4207] {canned_beer,
## onions} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [4208] {cream_cheese_,
## onions} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [4209] {cream_cheese_,
## onions} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [4210] {chicken,
## onions} => {butter} 0.001016777 0.3571429 0.002846975 6.4449541 10
## [4211] {butter,
## onions} => {chicken} 0.001016777 0.2500000 0.004067107 5.8264218 10
## [4212] {chicken,
## onions} => {root_vegetables} 0.001321810 0.4642857 0.002846975 4.2595616 13
## [4213] {chicken,
## onions} => {yogurt} 0.001220132 0.4285714 0.002846975 3.0721574 12
## [4214] {chicken,
## onions} => {other_vegetables} 0.001728521 0.6071429 0.002846975 3.1378087 17
## [4215] {chicken,
## onions} => {whole_milk} 0.001321810 0.4642857 0.002846975 1.8170513 13
## [4216] {onions,
## white_bread} => {domestic_eggs} 0.001016777 0.4166667 0.002440264 6.5671741 10
## [4217] {domestic_eggs,
## onions} => {white_bread} 0.001016777 0.2083333 0.004880529 4.9491747 10
## [4218] {onions,
## white_bread} => {root_vegetables} 0.001016777 0.4166667 0.002440264 3.8226835 10
## [4219] {onions,
## white_bread} => {other_vegetables} 0.001728521 0.7083333 0.002440264 3.6607768 17
## [4220] {onions,
## white_bread} => {whole_milk} 0.001016777 0.4166667 0.002440264 1.6306871 10
## [4221] {chocolate,
## onions} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [4222] {chocolate,
## onions} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [4223] {coffee,
## onions} => {rolls/buns} 0.001016777 0.4000000 0.002541942 2.1746821 10
## [4224] {frozen_vegetables,
## onions} => {root_vegetables} 0.001525165 0.4838710 0.003152008 4.4392453 15
## [4225] {frozen_vegetables,
## onions} => {yogurt} 0.001118454 0.3548387 0.003152008 2.5436142 11
## [4226] {frozen_vegetables,
## onions} => {rolls/buns} 0.001220132 0.3870968 0.003152008 2.1045311 12
## [4227] {frozen_vegetables,
## onions} => {other_vegetables} 0.002135231 0.6774194 0.003152008 3.5010086 21
## [4228] {frozen_vegetables,
## onions} => {whole_milk} 0.001525165 0.4838710 0.003152008 1.8937011 15
## [4229] {beef,
## onions} => {tropical_fruit} 0.001321810 0.4193548 0.003152008 3.9964679 13
## [4230] {onions,
## tropical_fruit} => {beef} 0.001321810 0.2321429 0.005693950 4.4246609 13
## [4231] {beef,
## onions} => {root_vegetables} 0.001525165 0.4838710 0.003152008 4.4392453 15
## [4232] {beef,
## onions} => {yogurt} 0.001118454 0.3548387 0.003152008 2.5436142 11
## [4233] {beef,
## onions} => {rolls/buns} 0.001118454 0.3548387 0.003152008 1.9291535 11
## [4234] {beef,
## onions} => {other_vegetables} 0.001728521 0.5483871 0.003152008 2.8341498 17
## [4235] {beef,
## onions} => {whole_milk} 0.001626843 0.5161290 0.003152008 2.0199479 16
## [4236] {curd,
## onions} => {root_vegetables} 0.001118454 0.4400000 0.002541942 4.0367537 11
## [4237] {curd,
## onions} => {yogurt} 0.001321810 0.5200000 0.002541942 3.7275510 13
## [4238] {curd,
## onions} => {other_vegetables} 0.001423488 0.5600000 0.002541942 2.8941671 14
## [4239] {curd,
## onions} => {whole_milk} 0.001830198 0.7200000 0.002541942 2.8178273 18
## [4240] {napkins,
## onions} => {root_vegetables} 0.001118454 0.3548387 0.003152008 3.2554466 11
## [4241] {napkins,
## onions} => {other_vegetables} 0.001830198 0.5806452 0.003152008 3.0008645 18
## [4242] {napkins,
## onions} => {whole_milk} 0.001525165 0.4838710 0.003152008 1.8937011 15
## [4243] {onions,
## pork} => {bottled_water} 0.001016777 0.2631579 0.003863752 2.3810100 10
## [4244] {onions,
## pork} => {root_vegetables} 0.001525165 0.3947368 0.003863752 3.6214896 15
## [4245] {onions,
## pork} => {rolls/buns} 0.001118454 0.2894737 0.003863752 1.5737831 11
## [4246] {onions,
## pork} => {other_vegetables} 0.002033554 0.5263158 0.003863752 2.7200819 20
## [4247] {onions,
## pork} => {whole_milk} 0.001525165 0.3947368 0.003863752 1.5448615 15
## [4248] {frankfurter,
## onions} => {root_vegetables} 0.001321810 0.3513514 0.003762074 3.2234520 13
## [4249] {frankfurter,
## onions} => {rolls/buns} 0.001118454 0.2972973 0.003762074 1.6163178 11
## [4250] {frankfurter,
## onions} => {other_vegetables} 0.001525165 0.4054054 0.003762074 2.0951982 15
## [4251] {frankfurter,
## onions} => {whole_milk} 0.001423488 0.3783784 0.003762074 1.4808402 14
## [4252] {bottled_beer,
## onions} => {butter} 0.001016777 0.3030303 0.003355363 5.4684459 10
## [4253] {butter,
## onions} => {bottled_beer} 0.001016777 0.2500000 0.004067107 3.1044823 10
## [4254] {bottled_beer,
## onions} => {bottled_water} 0.001016777 0.3030303 0.003355363 2.7417691 10
## [4255] {bottled_beer,
## onions} => {root_vegetables} 0.001321810 0.3939394 0.003355363 3.6141735 13
## [4256] {bottled_beer,
## onions} => {other_vegetables} 0.001525165 0.4545455 0.003355363 2.3491616 15
## [4257] {bottled_beer,
## onions} => {whole_milk} 0.001525165 0.4545455 0.003355363 1.7789314 15
## [4258] {brown_bread,
## onions} => {citrus_fruit} 0.001118454 0.3437500 0.003253686 4.1532939 11
## [4259] {citrus_fruit,
## onions} => {brown_bread} 0.001118454 0.2000000 0.005592272 3.0830721 11
## [4260] {brown_bread,
## onions} => {yogurt} 0.001118454 0.3437500 0.003253686 2.4641263 11
## [4261] {brown_bread,
## onions} => {other_vegetables} 0.001525165 0.4687500 0.003253686 2.4225729 15
## [4262] {brown_bread,
## onions} => {whole_milk} 0.001728521 0.5312500 0.003253686 2.0791260 17
## [4263] {margarine,
## onions} => {yogurt} 0.001321810 0.5416667 0.002440264 3.8828656 13
## [4264] {margarine,
## onions} => {rolls/buns} 0.001016777 0.4166667 0.002440264 2.2652939 10
## [4265] {margarine,
## onions} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [4266] {margarine,
## onions} => {whole_milk} 0.001423488 0.5833333 0.002440264 2.2829619 14
## [4267] {butter,
## onions} => {domestic_eggs} 0.001321810 0.3250000 0.004067107 5.1223958 13
## [4268] {domestic_eggs,
## onions} => {butter} 0.001321810 0.2708333 0.004880529 4.8874235 13
## [4269] {butter,
## onions} => {bottled_water} 0.001220132 0.3000000 0.004067107 2.7143514 12
## [4270] {bottled_water,
## onions} => {butter} 0.001220132 0.2068966 0.005897306 3.7336286 12
## [4271] {butter,
## onions} => {tropical_fruit} 0.001423488 0.3500000 0.004067107 3.3355136 14
## [4272] {onions,
## tropical_fruit} => {butter} 0.001423488 0.2500000 0.005693950 4.5114679 14
## [4273] {butter,
## onions} => {root_vegetables} 0.002033554 0.5000000 0.004067107 4.5872201 20
## [4274] {onions,
## root_vegetables} => {butter} 0.002033554 0.2150538 0.009456024 3.8808326 20
## [4275] {butter,
## onions} => {yogurt} 0.001626843 0.4000000 0.004067107 2.8673469 16
## [4276] {onions,
## yogurt} => {butter} 0.001626843 0.2253521 0.007219115 4.0666753 16
## [4277] {butter,
## onions} => {rolls/buns} 0.001220132 0.3000000 0.004067107 1.6310116 12
## [4278] {butter,
## onions} => {other_vegetables} 0.002338587 0.5750000 0.004067107 2.9716894 23
## [4279] {butter,
## onions} => {whole_milk} 0.003050330 0.7500000 0.004067107 2.9352368 30
## [4280] {onions,
## whole_milk} => {butter} 0.003050330 0.2521008 0.012099644 4.5493794 30
## [4281] {newspapers,
## onions} => {root_vegetables} 0.001016777 0.3225806 0.003152008 2.9594969 10
## [4282] {newspapers,
## onions} => {other_vegetables} 0.001626843 0.5161290 0.003152008 2.6674351 16
## [4283] {newspapers,
## onions} => {whole_milk} 0.001525165 0.4838710 0.003152008 1.8937011 15
## [4284] {domestic_eggs,
## onions} => {sausage} 0.001118454 0.2291667 0.004880529 2.4392361 11
## [4285] {onions,
## sausage} => {domestic_eggs} 0.001118454 0.3055556 0.003660397 4.8159277 11
## [4286] {domestic_eggs,
## onions} => {bottled_water} 0.001118454 0.2291667 0.004880529 2.0734629 11
## [4287] {domestic_eggs,
## onions} => {root_vegetables} 0.001626843 0.3333333 0.004880529 3.0581468 16
## [4288] {domestic_eggs,
## onions} => {yogurt} 0.001525165 0.3125000 0.004880529 2.2401148 15
## [4289] {onions,
## yogurt} => {domestic_eggs} 0.001525165 0.2112676 0.007219115 3.3298348 15
## [4290] {domestic_eggs,
## onions} => {rolls/buns} 0.001220132 0.2500000 0.004880529 1.3591763 12
## [4291] {domestic_eggs,
## onions} => {other_vegetables} 0.002541942 0.5208333 0.004880529 2.6917477 25
## [4292] {domestic_eggs,
## onions} => {whole_milk} 0.002745297 0.5625000 0.004880529 2.2014276 27
## [4293] {onions,
## whole_milk} => {domestic_eggs} 0.002745297 0.2268908 0.012099644 3.5760747 27
## [4294] {fruit/vegetable_juice,
## onions} => {whipped/sour_cream} 0.001016777 0.2702703 0.003762074 3.7703661 10
## [4295] {onions,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001016777 0.2000000 0.005083884 2.7665260 10
## [4296] {fruit/vegetable_juice,
## onions} => {bottled_water} 0.001321810 0.3513514 0.003762074 3.1789701 13
## [4297] {bottled_water,
## onions} => {fruit/vegetable_juice} 0.001321810 0.2241379 0.005897306 3.1004171 13
## [4298] {fruit/vegetable_juice,
## onions} => {tropical_fruit} 0.001220132 0.3243243 0.003762074 3.0908234 12
## [4299] {onions,
## tropical_fruit} => {fruit/vegetable_juice} 0.001220132 0.2142857 0.005693950 2.9641350 12
## [4300] {fruit/vegetable_juice,
## onions} => {root_vegetables} 0.001220132 0.3243243 0.003762074 2.9754942 12
## [4301] {fruit/vegetable_juice,
## onions} => {soda} 0.001220132 0.3243243 0.003762074 1.8599007 12
## [4302] {onions,
## soda} => {fruit/vegetable_juice} 0.001220132 0.2307692 0.005287239 3.1921454 12
## [4303] {fruit/vegetable_juice,
## onions} => {yogurt} 0.001728521 0.4594595 0.003762074 3.2935742 17
## [4304] {onions,
## yogurt} => {fruit/vegetable_juice} 0.001728521 0.2394366 0.007219115 3.3120382 17
## [4305] {fruit/vegetable_juice,
## onions} => {rolls/buns} 0.001016777 0.2702703 0.003762074 1.4693798 10
## [4306] {fruit/vegetable_juice,
## onions} => {other_vegetables} 0.001830198 0.4864865 0.003762074 2.5142378 18
## [4307] {fruit/vegetable_juice,
## onions} => {whole_milk} 0.001525165 0.4054054 0.003762074 1.5866145 15
## [4308] {onions,
## whipped/sour_cream} => {citrus_fruit} 0.001016777 0.2000000 0.005083884 2.4164619 10
## [4309] {onions,
## whipped/sour_cream} => {tropical_fruit} 0.001525165 0.3000000 0.005083884 2.8590116 15
## [4310] {onions,
## tropical_fruit} => {whipped/sour_cream} 0.001525165 0.2678571 0.005693950 3.7367021 15
## [4311] {onions,
## whipped/sour_cream} => {root_vegetables} 0.002338587 0.4600000 0.005083884 4.2202425 23
## [4312] {onions,
## root_vegetables} => {whipped/sour_cream} 0.002338587 0.2473118 0.009456024 3.4500877 23
## [4313] {onions,
## whipped/sour_cream} => {yogurt} 0.001830198 0.3600000 0.005083884 2.5806122 18
## [4314] {onions,
## yogurt} => {whipped/sour_cream} 0.001830198 0.2535211 0.007219115 3.5367096 18
## [4315] {onions,
## whipped/sour_cream} => {rolls/buns} 0.001016777 0.2000000 0.005083884 1.0873411 10
## [4316] {onions,
## whipped/sour_cream} => {other_vegetables} 0.003152008 0.6200000 0.005083884 3.2042564 31
## [4317] {onions,
## other_vegetables} => {whipped/sour_cream} 0.003152008 0.2214286 0.014234875 3.0890071 31
## [4318] {onions,
## whipped/sour_cream} => {whole_milk} 0.002745297 0.5400000 0.005083884 2.1133705 27
## [4319] {onions,
## whole_milk} => {whipped/sour_cream} 0.002745297 0.2268908 0.012099644 3.1652065 27
## [4320] {onions,
## pip_fruit} => {citrus_fruit} 0.001016777 0.2941176 0.003457041 3.5536205 10
## [4321] {onions,
## pip_fruit} => {tropical_fruit} 0.001016777 0.2941176 0.003457041 2.8029526 10
## [4322] {onions,
## pip_fruit} => {root_vegetables} 0.001321810 0.3823529 0.003457041 3.5078742 13
## [4323] {onions,
## pip_fruit} => {yogurt} 0.001118454 0.3235294 0.003457041 2.3191777 11
## [4324] {onions,
## pip_fruit} => {other_vegetables} 0.002135231 0.6176471 0.003457041 3.1920961 21
## [4325] {onions,
## pip_fruit} => {whole_milk} 0.002236909 0.6470588 0.003457041 2.5323611 22
## [4326] {onions,
## pastry} => {other_vegetables} 0.001423488 0.4827586 0.002948653 2.4949716 14
## [4327] {onions,
## pastry} => {whole_milk} 0.001118454 0.3793103 0.002948653 1.4844876 11
## [4328] {citrus_fruit,
## onions} => {bottled_water} 0.001423488 0.2545455 0.005592272 2.3030861 14
## [4329] {bottled_water,
## onions} => {citrus_fruit} 0.001423488 0.2413793 0.005897306 2.9164196 14
## [4330] {citrus_fruit,
## onions} => {tropical_fruit} 0.001626843 0.2909091 0.005592272 2.7723749 16
## [4331] {onions,
## tropical_fruit} => {citrus_fruit} 0.001626843 0.2857143 0.005693950 3.4520885 16
## [4332] {citrus_fruit,
## onions} => {root_vegetables} 0.001728521 0.3090909 0.005592272 2.8357361 17
## [4333] {citrus_fruit,
## onions} => {yogurt} 0.001728521 0.3090909 0.005592272 2.2156772 17
## [4334] {onions,
## yogurt} => {citrus_fruit} 0.001728521 0.2394366 0.007219115 2.8929474 17
## [4335] {citrus_fruit,
## onions} => {rolls/buns} 0.001525165 0.2727273 0.005592272 1.4827378 15
## [4336] {onions,
## rolls/buns} => {citrus_fruit} 0.001525165 0.2238806 0.006812405 2.7049947 15
## [4337] {citrus_fruit,
## onions} => {other_vegetables} 0.003558719 0.6363636 0.005592272 3.2888263 35
## [4338] {onions,
## other_vegetables} => {citrus_fruit} 0.003558719 0.2500000 0.014234875 3.0205774 35
## [4339] {citrus_fruit,
## onions} => {whole_milk} 0.002338587 0.4181818 0.005592272 1.6366169 23
## [4340] {onions,
## shopping_bags} => {root_vegetables} 0.001118454 0.2619048 0.004270463 2.4028296 11
## [4341] {onions,
## shopping_bags} => {soda} 0.001016777 0.2380952 0.004270463 1.3654033 10
## [4342] {onions,
## shopping_bags} => {rolls/buns} 0.001220132 0.2857143 0.004270463 1.5533444 12
## [4343] {onions,
## shopping_bags} => {other_vegetables} 0.002135231 0.5000000 0.004270463 2.5840778 21
## [4344] {onions,
## shopping_bags} => {whole_milk} 0.001016777 0.2380952 0.004270463 0.9318212 10
## [4345] {onions,
## sausage} => {tropical_fruit} 0.001016777 0.2777778 0.003660397 2.6472330 10
## [4346] {onions,
## sausage} => {root_vegetables} 0.001525165 0.4166667 0.003660397 3.8226835 15
## [4347] {onions,
## sausage} => {yogurt} 0.001220132 0.3333333 0.003660397 2.3894558 12
## [4348] {onions,
## sausage} => {rolls/buns} 0.001321810 0.3611111 0.003660397 1.9632547 13
## [4349] {onions,
## sausage} => {other_vegetables} 0.001931876 0.5277778 0.003660397 2.7276376 19
## [4350] {onions,
## sausage} => {whole_milk} 0.001220132 0.3333333 0.003660397 1.3045497 12
## [4351] {bottled_water,
## onions} => {tropical_fruit} 0.001321810 0.2241379 0.005897306 2.1360432 13
## [4352] {onions,
## tropical_fruit} => {bottled_water} 0.001321810 0.2321429 0.005693950 2.1003910 13
## [4353] {bottled_water,
## onions} => {root_vegetables} 0.002236909 0.3793103 0.005897306 3.4799601 22
## [4354] {onions,
## root_vegetables} => {bottled_water} 0.002236909 0.2365591 0.009456024 2.1403488 22
## [4355] {bottled_water,
## onions} => {soda} 0.001626843 0.2758621 0.005897306 1.5819845 16
## [4356] {onions,
## soda} => {bottled_water} 0.001626843 0.3076923 0.005287239 2.7839502 16
## [4357] {bottled_water,
## onions} => {yogurt} 0.001626843 0.2758621 0.005897306 1.9774806 16
## [4358] {onions,
## yogurt} => {bottled_water} 0.001626843 0.2253521 0.007219115 2.0389494 16
## [4359] {bottled_water,
## onions} => {rolls/buns} 0.001525165 0.2586207 0.005897306 1.4060445 15
## [4360] {onions,
## rolls/buns} => {bottled_water} 0.001525165 0.2238806 0.006812405 2.0256354 15
## [4361] {bottled_water,
## onions} => {other_vegetables} 0.002948653 0.5000000 0.005897306 2.5840778 29
## [4362] {onions,
## other_vegetables} => {bottled_water} 0.002948653 0.2071429 0.014234875 1.8741950 29
## [4363] {bottled_water,
## onions} => {whole_milk} 0.002338587 0.3965517 0.005897306 1.5519643 23
## [4364] {onions,
## tropical_fruit} => {root_vegetables} 0.001830198 0.3214286 0.005693950 2.9489272 18
## [4365] {onions,
## tropical_fruit} => {soda} 0.001423488 0.2500000 0.005693950 1.4336735 14
## [4366] {onions,
## soda} => {tropical_fruit} 0.001423488 0.2692308 0.005287239 2.5657797 14
## [4367] {onions,
## tropical_fruit} => {yogurt} 0.002135231 0.3750000 0.005693950 2.6881378 21
## [4368] {onions,
## yogurt} => {tropical_fruit} 0.002135231 0.2957746 0.007219115 2.8187439 21
## [4369] {onions,
## tropical_fruit} => {other_vegetables} 0.003660397 0.6428571 0.005693950 3.3223857 36
## [4370] {onions,
## other_vegetables} => {tropical_fruit} 0.003660397 0.2571429 0.014234875 2.4505814 36
## [4371] {onions,
## tropical_fruit} => {whole_milk} 0.002846975 0.5000000 0.005693950 1.9568245 28
## [4372] {onions,
## whole_milk} => {tropical_fruit} 0.002846975 0.2352941 0.012099644 2.2423621 28
## [4373] {onions,
## root_vegetables} => {soda} 0.002135231 0.2258065 0.009456024 1.2949309 21
## [4374] {onions,
## soda} => {root_vegetables} 0.002135231 0.4038462 0.005287239 3.7050624 21
## [4375] {onions,
## root_vegetables} => {yogurt} 0.002338587 0.2473118 0.009456024 1.7728220 23
## [4376] {onions,
## yogurt} => {root_vegetables} 0.002338587 0.3239437 0.007219115 2.9720018 23
## [4377] {onions,
## root_vegetables} => {rolls/buns} 0.002541942 0.2688172 0.009456024 1.4614799 25
## [4378] {onions,
## rolls/buns} => {root_vegetables} 0.002541942 0.3731343 0.006812405 3.4232986 25
## [4379] {onions,
## root_vegetables} => {other_vegetables} 0.005693950 0.6021505 0.009456024 3.1120076 56
## [4380] {onions,
## other_vegetables} => {root_vegetables} 0.005693950 0.4000000 0.014234875 3.6697761 56
## [4381] {onions,
## root_vegetables} => {whole_milk} 0.004778851 0.5053763 0.009456024 1.9778656 47
## [4382] {onions,
## whole_milk} => {root_vegetables} 0.004778851 0.3949580 0.012099644 3.6235184 47
## [4383] {onions,
## soda} => {rolls/buns} 0.001321810 0.2500000 0.005287239 1.3591763 13
## [4384] {onions,
## soda} => {other_vegetables} 0.002541942 0.4807692 0.005287239 2.4846902 25
## [4385] {onions,
## soda} => {whole_milk} 0.002135231 0.4038462 0.005287239 1.5805121 21
## [4386] {onions,
## yogurt} => {rolls/buns} 0.002338587 0.3239437 0.007219115 1.7611862 23
## [4387] {onions,
## rolls/buns} => {yogurt} 0.002338587 0.3432836 0.006812405 2.4607828 23
## [4388] {onions,
## yogurt} => {other_vegetables} 0.003863752 0.5352113 0.007219115 2.7660551 38
## [4389] {onions,
## other_vegetables} => {yogurt} 0.003863752 0.2714286 0.014234875 1.9456997 38
## [4390] {onions,
## yogurt} => {whole_milk} 0.003863752 0.5352113 0.007219115 2.0946291 38
## [4391] {onions,
## whole_milk} => {yogurt} 0.003863752 0.3193277 0.012099644 2.2890585 38
## [4392] {onions,
## rolls/buns} => {other_vegetables} 0.003355363 0.4925373 0.006812405 2.5455094 33
## [4393] {onions,
## other_vegetables} => {rolls/buns} 0.003355363 0.2357143 0.014234875 1.2815091 33
## [4394] {onions,
## rolls/buns} => {whole_milk} 0.003152008 0.4626866 0.006812405 1.8107928 31
## [4395] {onions,
## whole_milk} => {rolls/buns} 0.003152008 0.2605042 0.012099644 1.4162846 31
## [4396] {onions,
## other_vegetables} => {whole_milk} 0.006609049 0.4642857 0.014234875 1.8170513 65
## [4397] {onions,
## whole_milk} => {other_vegetables} 0.006609049 0.5462185 0.012099644 2.8229421 65
## [4398] {berries,
## salty_snack} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [4399] {berries,
## sugar} => {whole_milk} 0.001321810 0.5909091 0.002236909 2.3126108 13
## [4400] {berries,
## long_life_bakery_product} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [4401] {berries,
## dessert} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [4402] {berries,
## dessert} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [4403] {berries,
## cream_cheese_} => {yogurt} 0.001321810 0.6500000 0.002033554 4.6594388 13
## [4404] {berries,
## cream_cheese_} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [4405] {berries,
## chicken} => {root_vegetables} 0.001016777 0.3225806 0.003152008 2.9594969 10
## [4406] {berries,
## chicken} => {yogurt} 0.001118454 0.3548387 0.003152008 2.5436142 11
## [4407] {berries,
## chicken} => {other_vegetables} 0.001118454 0.3548387 0.003152008 1.8338616 11
## [4408] {berries,
## chicken} => {whole_milk} 0.001525165 0.4838710 0.003152008 1.8937011 15
## [4409] {berries,
## white_bread} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [4410] {berries,
## chocolate} => {soda} 0.001118454 0.4583333 0.002440264 2.6284014 11
## [4411] {berries,
## chocolate} => {whole_milk} 0.001423488 0.5833333 0.002440264 2.2829619 14
## [4412] {berries,
## frozen_vegetables} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [4413] {berries,
## frozen_vegetables} => {whole_milk} 0.001220132 0.4800000 0.002541942 1.8785515 12
## [4414] {beef,
## berries} => {pork} 0.001220132 0.2727273 0.004473818 4.7306397 12
## [4415] {berries,
## pork} => {beef} 0.001220132 0.3750000 0.003253686 7.1475291 12
## [4416] {beef,
## berries} => {citrus_fruit} 0.001016777 0.2272727 0.004473818 2.7459795 10
## [4417] {beef,
## berries} => {root_vegetables} 0.001525165 0.3409091 0.004473818 3.1276501 15
## [4418] {berries,
## root_vegetables} => {beef} 0.001525165 0.2307692 0.006609049 4.3984794 15
## [4419] {beef,
## berries} => {yogurt} 0.001423488 0.3181818 0.004473818 2.2808442 14
## [4420] {beef,
## berries} => {rolls/buns} 0.001525165 0.3409091 0.004473818 1.8534223 15
## [4421] {berries,
## rolls/buns} => {beef} 0.001525165 0.2307692 0.006609049 4.3984794 15
## [4422] {beef,
## berries} => {other_vegetables} 0.001830198 0.4090909 0.004473818 2.1142454 18
## [4423] {beef,
## berries} => {whole_milk} 0.002135231 0.4772727 0.004473818 1.8678779 21
## [4424] {berries,
## curd} => {whipped/sour_cream} 0.001016777 0.3448276 0.002948653 4.8104671 10
## [4425] {berries,
## curd} => {root_vegetables} 0.001118454 0.3793103 0.002948653 3.4799601 11
## [4426] {berries,
## curd} => {yogurt} 0.001220132 0.4137931 0.002948653 2.9662210 12
## [4427] {berries,
## curd} => {rolls/buns} 0.001016777 0.3448276 0.002948653 1.8747260 10
## [4428] {berries,
## curd} => {other_vegetables} 0.001525165 0.5172414 0.002948653 2.6731839 15
## [4429] {berries,
## curd} => {whole_milk} 0.001423488 0.4827586 0.002948653 1.8893478 14
## [4430] {berries,
## napkins} => {tropical_fruit} 0.001118454 0.3928571 0.002846975 3.7439438 11
## [4431] {berries,
## napkins} => {root_vegetables} 0.001220132 0.4285714 0.002846975 3.9319030 12
## [4432] {berries,
## napkins} => {soda} 0.001118454 0.3928571 0.002846975 2.2529155 11
## [4433] {berries,
## napkins} => {other_vegetables} 0.001016777 0.3571429 0.002846975 1.8457698 10
## [4434] {berries,
## napkins} => {whole_milk} 0.001728521 0.6071429 0.002846975 2.3761441 17
## [4435] {berries,
## pork} => {other_vegetables} 0.001118454 0.3437500 0.003253686 1.7765535 11
## [4436] {berries,
## pork} => {whole_milk} 0.001525165 0.4687500 0.003253686 1.8345230 15
## [4437] {berries,
## frankfurter} => {whole_milk} 0.001626843 0.7272727 0.002236909 2.8462902 16
## [4438] {berries,
## bottled_beer} => {root_vegetables} 0.001016777 0.6250000 0.001626843 5.7340252 10
## [4439] {berries,
## brown_bread} => {root_vegetables} 0.001016777 0.3225806 0.003152008 2.9594969 10
## [4440] {berries,
## brown_bread} => {yogurt} 0.001016777 0.3225806 0.003152008 2.3123766 10
## [4441] {berries,
## brown_bread} => {other_vegetables} 0.001321810 0.4193548 0.003152008 2.1672910 13
## [4442] {berries,
## brown_bread} => {whole_milk} 0.001525165 0.4838710 0.003152008 1.8937011 15
## [4443] {berries,
## margarine} => {yogurt} 0.001220132 0.4615385 0.002643620 3.3084772 12
## [4444] {berries,
## margarine} => {other_vegetables} 0.001525165 0.5769231 0.002643620 2.9816282 15
## [4445] {berries,
## margarine} => {whole_milk} 0.001830198 0.6923077 0.002643620 2.7094493 18
## [4446] {berries,
## butter} => {domestic_eggs} 0.001016777 0.2702703 0.003762074 4.2597886 10
## [4447] {berries,
## domestic_eggs} => {butter} 0.001016777 0.2631579 0.003863752 4.7489136 10
## [4448] {berries,
## butter} => {whipped/sour_cream} 0.001220132 0.3243243 0.003762074 4.5244393 12
## [4449] {berries,
## butter} => {sausage} 0.001118454 0.2972973 0.003762074 3.1644144 11
## [4450] {berries,
## sausage} => {butter} 0.001118454 0.2244898 0.004982206 4.0511140 11
## [4451] {berries,
## butter} => {bottled_water} 0.001118454 0.2972973 0.003762074 2.6898978 11
## [4452] {berries,
## bottled_water} => {butter} 0.001118454 0.2750000 0.004067107 4.9626147 11
## [4453] {berries,
## butter} => {tropical_fruit} 0.001423488 0.3783784 0.003762074 3.6059606 14
## [4454] {berries,
## tropical_fruit} => {butter} 0.001423488 0.2121212 0.006710727 3.8279121 14
## [4455] {berries,
## butter} => {root_vegetables} 0.001525165 0.4054054 0.003762074 3.7193677 15
## [4456] {berries,
## root_vegetables} => {butter} 0.001525165 0.2307692 0.006609049 4.1644319 15
## [4457] {berries,
## butter} => {soda} 0.001118454 0.2972973 0.003762074 1.7049090 11
## [4458] {berries,
## butter} => {yogurt} 0.001220132 0.3243243 0.003762074 2.3248759 12
## [4459] {berries,
## butter} => {rolls/buns} 0.001016777 0.2702703 0.003762074 1.4693798 10
## [4460] {berries,
## butter} => {other_vegetables} 0.001321810 0.3513514 0.003762074 1.8158384 13
## [4461] {berries,
## butter} => {whole_milk} 0.002440264 0.6486486 0.003762074 2.5385832 24
## [4462] {berries,
## whole_milk} => {butter} 0.002440264 0.2068966 0.011794611 3.7336286 24
## [4463] {berries,
## newspapers} => {other_vegetables} 0.001321810 0.4814815 0.002745297 2.4883712 13
## [4464] {berries,
## newspapers} => {whole_milk} 0.001220132 0.4444444 0.002745297 1.7393996 12
## [4465] {berries,
## domestic_eggs} => {whipped/sour_cream} 0.001423488 0.3684211 0.003863752 5.1396043 14
## [4466] {berries,
## domestic_eggs} => {yogurt} 0.001525165 0.3947368 0.003863752 2.8296187 15
## [4467] {berries,
## domestic_eggs} => {rolls/buns} 0.001626843 0.4210526 0.003863752 2.2891391 16
## [4468] {berries,
## rolls/buns} => {domestic_eggs} 0.001626843 0.2461538 0.006609049 3.8796844 16
## [4469] {berries,
## domestic_eggs} => {other_vegetables} 0.001423488 0.3684211 0.003863752 1.9040573 14
## [4470] {berries,
## domestic_eggs} => {whole_milk} 0.001931876 0.5000000 0.003863752 1.9568245 19
## [4471] {berries,
## fruit/vegetable_juice} => {whipped/sour_cream} 0.001220132 0.3333333 0.003660397 4.6501182 12
## [4472] {berries,
## fruit/vegetable_juice} => {citrus_fruit} 0.001118454 0.3055556 0.003660397 3.6918168 11
## [4473] {berries,
## citrus_fruit} => {fruit/vegetable_juice} 0.001118454 0.2075472 0.005388917 2.8709232 11
## [4474] {berries,
## fruit/vegetable_juice} => {sausage} 0.001321810 0.3611111 0.003660397 3.8436448 13
## [4475] {berries,
## sausage} => {fruit/vegetable_juice} 0.001321810 0.2653061 0.004982206 3.6698815 13
## [4476] {berries,
## fruit/vegetable_juice} => {root_vegetables} 0.001016777 0.2777778 0.003660397 2.5484556 10
## [4477] {berries,
## fruit/vegetable_juice} => {soda} 0.001321810 0.3611111 0.003660397 2.0708617 13
## [4478] {berries,
## fruit/vegetable_juice} => {other_vegetables} 0.001220132 0.3333333 0.003660397 1.7227185 12
## [4479] {berries,
## fruit/vegetable_juice} => {whole_milk} 0.002033554 0.5555556 0.003660397 2.1742495 20
## [4480] {berries,
## pip_fruit} => {whipped/sour_cream} 0.001016777 0.2702703 0.003762074 3.7703661 10
## [4481] {berries,
## pastry} => {whipped/sour_cream} 0.001118454 0.2619048 0.004270463 3.6536643 11
## [4482] {berries,
## citrus_fruit} => {whipped/sour_cream} 0.001525165 0.2830189 0.005388917 3.9482136 15
## [4483] {berries,
## shopping_bags} => {whipped/sour_cream} 0.001525165 0.3061224 0.004982206 4.2705167 15
## [4484] {berries,
## sausage} => {whipped/sour_cream} 0.001728521 0.3469388 0.004982206 4.8399189 17
## [4485] {berries,
## bottled_water} => {whipped/sour_cream} 0.001220132 0.3000000 0.004067107 4.1851064 12
## [4486] {berries,
## tropical_fruit} => {whipped/sour_cream} 0.001728521 0.2575758 0.006710727 3.5932732 17
## [4487] {berries,
## root_vegetables} => {whipped/sour_cream} 0.001728521 0.2615385 0.006609049 3.6485543 17
## [4488] {berries,
## soda} => {whipped/sour_cream} 0.001525165 0.2083333 0.007320793 2.9063239 15
## [4489] {berries,
## whipped/sour_cream} => {yogurt} 0.002948653 0.3258427 0.009049314 2.3357601 29
## [4490] {berries,
## yogurt} => {whipped/sour_cream} 0.002948653 0.2788462 0.010574479 3.8900027 29
## [4491] {berries,
## rolls/buns} => {whipped/sour_cream} 0.001423488 0.2153846 0.006609049 3.0046918 14
## [4492] {berries,
## whipped/sour_cream} => {other_vegetables} 0.002236909 0.2471910 0.009049314 1.2775216 22
## [4493] {berries,
## other_vegetables} => {whipped/sour_cream} 0.002236909 0.2178218 0.010269446 3.0386911 22
## [4494] {berries,
## whipped/sour_cream} => {whole_milk} 0.004270463 0.4719101 0.009049314 1.8468906 42
## [4495] {berries,
## whole_milk} => {whipped/sour_cream} 0.004270463 0.3620690 0.011794611 5.0509905 42
## [4496] {berries,
## pip_fruit} => {citrus_fruit} 0.001016777 0.2702703 0.003762074 3.2654891 10
## [4497] {berries,
## pip_fruit} => {tropical_fruit} 0.001423488 0.3783784 0.003762074 3.6059606 14
## [4498] {berries,
## tropical_fruit} => {pip_fruit} 0.001423488 0.2121212 0.006710727 2.8040486 14
## [4499] {berries,
## pip_fruit} => {yogurt} 0.001016777 0.2702703 0.003762074 1.9373966 10
## [4500] {berries,
## pip_fruit} => {other_vegetables} 0.001931876 0.5135135 0.003762074 2.6539177 19
## [4501] {berries,
## pip_fruit} => {whole_milk} 0.001931876 0.5135135 0.003762074 2.0097117 19
## [4502] {berries,
## pastry} => {soda} 0.001118454 0.2619048 0.004270463 1.5019436 11
## [4503] {berries,
## pastry} => {yogurt} 0.001626843 0.3809524 0.004270463 2.7308066 16
## [4504] {berries,
## pastry} => {rolls/buns} 0.001220132 0.2857143 0.004270463 1.5533444 12
## [4505] {berries,
## pastry} => {other_vegetables} 0.001931876 0.4523810 0.004270463 2.3379751 19
## [4506] {berries,
## pastry} => {whole_milk} 0.002338587 0.5476190 0.004270463 2.1431888 23
## [4507] {berries,
## citrus_fruit} => {sausage} 0.001423488 0.2641509 0.005388917 2.8116066 14
## [4508] {berries,
## sausage} => {citrus_fruit} 0.001423488 0.2857143 0.004982206 3.4520885 14
## [4509] {berries,
## citrus_fruit} => {bottled_water} 0.001118454 0.2075472 0.005388917 1.8778532 11
## [4510] {berries,
## bottled_water} => {citrus_fruit} 0.001118454 0.2750000 0.004067107 3.3226351 11
## [4511] {berries,
## citrus_fruit} => {tropical_fruit} 0.001525165 0.2830189 0.005388917 2.6971808 15
## [4512] {berries,
## tropical_fruit} => {citrus_fruit} 0.001525165 0.2272727 0.006710727 2.7459795 15
## [4513] {berries,
## citrus_fruit} => {root_vegetables} 0.001525165 0.2830189 0.005388917 2.5965397 15
## [4514] {berries,
## root_vegetables} => {citrus_fruit} 0.001525165 0.2307692 0.006609049 2.7882253 15
## [4515] {berries,
## citrus_fruit} => {soda} 0.001423488 0.2641509 0.005388917 1.5148248 14
## [4516] {berries,
## citrus_fruit} => {yogurt} 0.001830198 0.3396226 0.005388917 2.4345399 18
## [4517] {berries,
## citrus_fruit} => {rolls/buns} 0.001118454 0.2075472 0.005388917 1.1283728 11
## [4518] {berries,
## citrus_fruit} => {other_vegetables} 0.001728521 0.3207547 0.005388917 1.6577103 17
## [4519] {berries,
## citrus_fruit} => {whole_milk} 0.002135231 0.3962264 0.005388917 1.5506911 21
## [4520] {berries,
## shopping_bags} => {tropical_fruit} 0.001423488 0.2857143 0.004982206 2.7228682 14
## [4521] {berries,
## tropical_fruit} => {shopping_bags} 0.001423488 0.2121212 0.006710727 2.1529537 14
## [4522] {berries,
## shopping_bags} => {root_vegetables} 0.001220132 0.2448980 0.004982206 2.2468017 12
## [4523] {berries,
## shopping_bags} => {yogurt} 0.001118454 0.2244898 0.004982206 1.6092253 11
## [4524] {berries,
## shopping_bags} => {rolls/buns} 0.001016777 0.2040816 0.004982206 1.1095317 10
## [4525] {berries,
## shopping_bags} => {other_vegetables} 0.001626843 0.3265306 0.004982206 1.6875610 16
## [4526] {berries,
## shopping_bags} => {whole_milk} 0.001525165 0.3061224 0.004982206 1.1980558 15
## [4527] {berries,
## sausage} => {tropical_fruit} 0.001525165 0.3061224 0.004982206 2.9173588 15
## [4528] {berries,
## tropical_fruit} => {sausage} 0.001525165 0.2272727 0.006710727 2.4190771 15
## [4529] {berries,
## sausage} => {root_vegetables} 0.001220132 0.2448980 0.004982206 2.2468017 12
## [4530] {berries,
## sausage} => {soda} 0.001016777 0.2040816 0.004982206 1.1703457 10
## [4531] {berries,
## sausage} => {yogurt} 0.001423488 0.2857143 0.004982206 2.0481050 14
## [4532] {berries,
## sausage} => {rolls/buns} 0.001525165 0.3061224 0.004982206 1.6642976 15
## [4533] {berries,
## rolls/buns} => {sausage} 0.001525165 0.2307692 0.006609049 2.4562937 15
## [4534] {berries,
## sausage} => {other_vegetables} 0.001931876 0.3877551 0.004982206 2.0039787 19
## [4535] {berries,
## sausage} => {whole_milk} 0.002440264 0.4897959 0.004982206 1.9168893 24
## [4536] {berries,
## whole_milk} => {sausage} 0.002440264 0.2068966 0.011794611 2.2021944 24
## [4537] {berries,
## bottled_water} => {tropical_fruit} 0.001321810 0.3250000 0.004067107 3.0972626 13
## [4538] {berries,
## bottled_water} => {root_vegetables} 0.001118454 0.2750000 0.004067107 2.5229711 11
## [4539] {berries,
## bottled_water} => {soda} 0.001728521 0.4250000 0.004067107 2.4372449 17
## [4540] {berries,
## soda} => {bottled_water} 0.001728521 0.2361111 0.007320793 2.1362951 17
## [4541] {berries,
## bottled_water} => {yogurt} 0.001220132 0.3000000 0.004067107 2.1505102 12
## [4542] {berries,
## bottled_water} => {rolls/buns} 0.001016777 0.2500000 0.004067107 1.3591763 10
## [4543] {berries,
## bottled_water} => {other_vegetables} 0.002033554 0.5000000 0.004067107 2.5840778 20
## [4544] {berries,
## bottled_water} => {whole_milk} 0.001525165 0.3750000 0.004067107 1.4676184 15
## [4545] {berries,
## tropical_fruit} => {root_vegetables} 0.001931876 0.2878788 0.006710727 2.6411268 19
## [4546] {berries,
## root_vegetables} => {tropical_fruit} 0.001931876 0.2923077 0.006609049 2.7857036 19
## [4547] {berries,
## tropical_fruit} => {soda} 0.001830198 0.2727273 0.006710727 1.5640074 18
## [4548] {berries,
## soda} => {tropical_fruit} 0.001830198 0.2500000 0.007320793 2.3825097 18
## [4549] {berries,
## tropical_fruit} => {yogurt} 0.002440264 0.3636364 0.006710727 2.6066790 24
## [4550] {berries,
## yogurt} => {tropical_fruit} 0.002440264 0.2307692 0.010574479 2.1992397 24
## [4551] {berries,
## tropical_fruit} => {rolls/buns} 0.001525165 0.2272727 0.006710727 1.2356149 15
## [4552] {berries,
## rolls/buns} => {tropical_fruit} 0.001525165 0.2307692 0.006609049 2.1992397 15
## [4553] {berries,
## tropical_fruit} => {other_vegetables} 0.002846975 0.4242424 0.006710727 2.1925508 28
## [4554] {berries,
## other_vegetables} => {tropical_fruit} 0.002846975 0.2772277 0.010269446 2.6419909 28
## [4555] {berries,
## tropical_fruit} => {whole_milk} 0.003355363 0.5000000 0.006710727 1.9568245 33
## [4556] {berries,
## whole_milk} => {tropical_fruit} 0.003355363 0.2844828 0.011794611 2.7111317 33
## [4557] {berries,
## root_vegetables} => {soda} 0.001728521 0.2615385 0.006609049 1.4998430 17
## [4558] {berries,
## soda} => {root_vegetables} 0.001728521 0.2361111 0.007320793 2.1661873 17
## [4559] {berries,
## root_vegetables} => {yogurt} 0.001931876 0.2923077 0.006609049 2.0953689 19
## [4560] {berries,
## root_vegetables} => {rolls/buns} 0.001728521 0.2615385 0.006609049 1.4219076 17
## [4561] {berries,
## rolls/buns} => {root_vegetables} 0.001728521 0.2615385 0.006609049 2.3994690 17
## [4562] {berries,
## root_vegetables} => {other_vegetables} 0.003050330 0.4615385 0.006609049 2.3853026 30
## [4563] {berries,
## other_vegetables} => {root_vegetables} 0.003050330 0.2970297 0.010269446 2.7250813 30
## [4564] {berries,
## root_vegetables} => {whole_milk} 0.003660397 0.5538462 0.006609049 2.1675595 36
## [4565] {berries,
## whole_milk} => {root_vegetables} 0.003660397 0.3103448 0.011794611 2.8472401 36
## [4566] {berries,
## soda} => {yogurt} 0.002643620 0.3611111 0.007320793 2.5885771 26
## [4567] {berries,
## yogurt} => {soda} 0.002643620 0.2500000 0.010574479 1.4336735 26
## [4568] {berries,
## soda} => {rolls/buns} 0.001931876 0.2638889 0.007320793 1.4346861 19
## [4569] {berries,
## rolls/buns} => {soda} 0.001931876 0.2923077 0.006609049 1.6762951 19
## [4570] {berries,
## soda} => {other_vegetables} 0.002033554 0.2777778 0.007320793 1.4355988 20
## [4571] {berries,
## soda} => {whole_milk} 0.002135231 0.2916667 0.007320793 1.1414810 21
## [4572] {berries,
## yogurt} => {rolls/buns} 0.002643620 0.2500000 0.010574479 1.3591763 26
## [4573] {berries,
## rolls/buns} => {yogurt} 0.002643620 0.4000000 0.006609049 2.8673469 26
## [4574] {berries,
## yogurt} => {other_vegetables} 0.003863752 0.3653846 0.010574479 1.8883645 38
## [4575] {berries,
## other_vegetables} => {yogurt} 0.003863752 0.3762376 0.010269446 2.6970095 38
## [4576] {berries,
## yogurt} => {whole_milk} 0.003355363 0.3173077 0.010574479 1.2418309 33
## [4577] {berries,
## whole_milk} => {yogurt} 0.003355363 0.2844828 0.011794611 2.0392769 33
## [4578] {berries,
## rolls/buns} => {other_vegetables} 0.002745297 0.4153846 0.006609049 2.1467723 27
## [4579] {berries,
## other_vegetables} => {rolls/buns} 0.002745297 0.2673267 0.010269446 1.4533767 27
## [4580] {berries,
## rolls/buns} => {whole_milk} 0.002846975 0.4307692 0.006609049 1.6858796 28
## [4581] {berries,
## whole_milk} => {rolls/buns} 0.002846975 0.2413793 0.011794611 1.3123082 28
## [4582] {berries,
## other_vegetables} => {whole_milk} 0.004982206 0.4851485 0.010269446 1.8987010 49
## [4583] {berries,
## whole_milk} => {other_vegetables} 0.004982206 0.4224138 0.011794611 2.1831002 49
## [4584] {hamburger_meat,
## hygiene_articles} => {other_vegetables} 0.001016777 0.4000000 0.002541942 2.0672622 10
## [4585] {hamburger_meat,
## hygiene_articles} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [4586] {hamburger_meat,
## salty_snack} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [4587] {hamburger_meat,
## sugar} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [4588] {hamburger_meat,
## sugar} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [4589] {hamburger_meat,
## waffles} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [4590] {hamburger_meat,
## long_life_bakery_product} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [4591] {dessert,
## hamburger_meat} => {other_vegetables} 0.001423488 0.5600000 0.002541942 2.8941671 14
## [4592] {dessert,
## hamburger_meat} => {whole_milk} 0.001220132 0.4800000 0.002541942 1.8785515 12
## [4593] {cream_cheese_,
## hamburger_meat} => {yogurt} 0.001118454 0.4583333 0.002440264 3.2855017 11
## [4594] {cream_cheese_,
## hamburger_meat} => {whole_milk} 0.001016777 0.4166667 0.002440264 1.6306871 10
## [4595] {chicken,
## hamburger_meat} => {butter} 0.001118454 0.2972973 0.003762074 5.3649888 11
## [4596] {butter,
## hamburger_meat} => {chicken} 0.001118454 0.2558140 0.004372140 5.9619200 11
## [4597] {chicken,
## hamburger_meat} => {whipped/sour_cream} 0.001016777 0.2702703 0.003762074 3.7703661 10
## [4598] {hamburger_meat,
## whipped/sour_cream} => {chicken} 0.001016777 0.2380952 0.004270463 5.5489731 10
## [4599] {chicken,
## hamburger_meat} => {rolls/buns} 0.001118454 0.2972973 0.003762074 1.6163178 11
## [4600] {chicken,
## hamburger_meat} => {other_vegetables} 0.002440264 0.6486486 0.003762074 3.3523171 24
## [4601] {chicken,
## hamburger_meat} => {whole_milk} 0.001423488 0.3783784 0.003762074 1.4808402 14
## [4602] {hamburger_meat,
## white_bread} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [4603] {hamburger_meat,
## white_bread} => {other_vegetables} 0.001525165 0.5357143 0.002846975 2.7686548 15
## [4604] {hamburger_meat,
## white_bread} => {whole_milk} 0.001626843 0.5714286 0.002846975 2.2363709 16
## [4605] {chocolate,
## hamburger_meat} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [4606] {chocolate,
## hamburger_meat} => {whole_milk} 0.001626843 0.6666667 0.002440264 2.6090994 16
## [4607] {coffee,
## hamburger_meat} => {other_vegetables} 0.001220132 0.4137931 0.002948653 2.1385471 12
## [4608] {coffee,
## hamburger_meat} => {whole_milk} 0.001423488 0.4827586 0.002948653 1.8893478 14
## [4609] {frozen_vegetables,
## hamburger_meat} => {yogurt} 0.001016777 0.3333333 0.003050330 2.3894558 10
## [4610] {frozen_vegetables,
## hamburger_meat} => {rolls/buns} 0.001118454 0.3666667 0.003050330 1.9934586 11
## [4611] {frozen_vegetables,
## hamburger_meat} => {other_vegetables} 0.001321810 0.4333333 0.003050330 2.2395341 13
## [4612] {frozen_vegetables,
## hamburger_meat} => {whole_milk} 0.001525165 0.5000000 0.003050330 1.9568245 15
## [4613] {beef,
## hamburger_meat} => {pork} 0.001220132 0.3243243 0.003762074 5.6256256 12
## [4614] {hamburger_meat,
## pork} => {beef} 0.001220132 0.3750000 0.003253686 7.1475291 12
## [4615] {beef,
## hamburger_meat} => {butter} 0.001220132 0.3243243 0.003762074 5.8527151 12
## [4616] {butter,
## hamburger_meat} => {beef} 0.001220132 0.2790698 0.004372140 5.3190914 12
## [4617] {beef,
## butter} => {hamburger_meat} 0.001220132 0.2105263 0.005795628 6.3318848 12
## [4618] {beef,
## hamburger_meat} => {pastry} 0.001016777 0.2702703 0.003762074 3.0378378 10
## [4619] {hamburger_meat,
## pastry} => {beef} 0.001016777 0.2222222 0.004575496 4.2355728 10
## [4620] {beef,
## hamburger_meat} => {root_vegetables} 0.001525165 0.4054054 0.003762074 3.7193677 15
## [4621] {hamburger_meat,
## root_vegetables} => {beef} 0.001525165 0.2459016 0.006202339 4.6869043 15
## [4622] {beef,
## hamburger_meat} => {yogurt} 0.001423488 0.3783784 0.003762074 2.7123552 14
## [4623] {hamburger_meat,
## yogurt} => {beef} 0.001423488 0.2187500 0.006507372 4.1693920 14
## [4624] {beef,
## hamburger_meat} => {rolls/buns} 0.001728521 0.4594595 0.003762074 2.4979457 17
## [4625] {hamburger_meat,
## rolls/buns} => {beef} 0.001728521 0.2000000 0.008642603 3.8120155 17
## [4626] {beef,
## hamburger_meat} => {other_vegetables} 0.002135231 0.5675676 0.003762074 2.9332775 21
## [4627] {beef,
## hamburger_meat} => {whole_milk} 0.002236909 0.5945946 0.003762074 2.3270346 22
## [4628] {curd,
## hamburger_meat} => {yogurt} 0.001118454 0.3548387 0.003152008 2.5436142 11
## [4629] {curd,
## hamburger_meat} => {other_vegetables} 0.002033554 0.6451613 0.003152008 3.3342939 20
## [4630] {curd,
## hamburger_meat} => {whole_milk} 0.002541942 0.8064516 0.003152008 3.1561686 25
## [4631] {hamburger_meat,
## napkins} => {other_vegetables} 0.001423488 0.5384615 0.002643620 2.7828530 14
## [4632] {hamburger_meat,
## pork} => {yogurt} 0.001118454 0.3437500 0.003253686 2.4641263 11
## [4633] {hamburger_meat,
## pork} => {rolls/buns} 0.001118454 0.3437500 0.003253686 1.8688675 11
## [4634] {hamburger_meat,
## pork} => {other_vegetables} 0.002033554 0.6250000 0.003253686 3.2300972 20
## [4635] {hamburger_meat,
## pork} => {whole_milk} 0.002135231 0.6562500 0.003253686 2.5683322 21
## [4636] {frankfurter,
## hamburger_meat} => {other_vegetables} 0.001626843 0.4848485 0.003355363 2.5057724 16
## [4637] {frankfurter,
## hamburger_meat} => {whole_milk} 0.002236909 0.6666667 0.003355363 2.6090994 22
## [4638] {bottled_beer,
## hamburger_meat} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [4639] {bottled_beer,
## hamburger_meat} => {whole_milk} 0.001728521 0.8095238 0.002135231 3.1681921 17
## [4640] {brown_bread,
## hamburger_meat} => {yogurt} 0.001016777 0.3125000 0.003253686 2.2401148 10
## [4641] {brown_bread,
## hamburger_meat} => {other_vegetables} 0.001525165 0.4687500 0.003253686 2.4225729 15
## [4642] {brown_bread,
## hamburger_meat} => {whole_milk} 0.001525165 0.4687500 0.003253686 1.8345230 15
## [4643] {hamburger_meat,
## margarine} => {rolls/buns} 0.001118454 0.3666667 0.003050330 1.9934586 11
## [4644] {hamburger_meat,
## margarine} => {other_vegetables} 0.001728521 0.5666667 0.003050330 2.9286215 17
## [4645] {hamburger_meat,
## margarine} => {whole_milk} 0.001830198 0.6000000 0.003050330 2.3481894 18
## [4646] {butter,
## hamburger_meat} => {whipped/sour_cream} 0.001525165 0.3488372 0.004372140 4.8664028 15
## [4647] {hamburger_meat,
## whipped/sour_cream} => {butter} 0.001525165 0.3571429 0.004270463 6.4449541 15
## [4648] {butter,
## hamburger_meat} => {pip_fruit} 0.001016777 0.2325581 0.004372140 3.0742061 10
## [4649] {hamburger_meat,
## pip_fruit} => {butter} 0.001016777 0.2272727 0.004473818 4.1013344 10
## [4650] {butter,
## hamburger_meat} => {pastry} 0.001118454 0.2558140 0.004372140 2.8753488 11
## [4651] {hamburger_meat,
## pastry} => {butter} 0.001118454 0.2444444 0.004575496 4.4112130 11
## [4652] {butter,
## hamburger_meat} => {citrus_fruit} 0.001220132 0.2790698 0.004372140 3.3718073 12
## [4653] {citrus_fruit,
## hamburger_meat} => {butter} 0.001220132 0.3076923 0.003965430 5.5525759 12
## [4654] {butter,
## hamburger_meat} => {root_vegetables} 0.001118454 0.2558140 0.004372140 2.3469498 11
## [4655] {butter,
## hamburger_meat} => {yogurt} 0.001830198 0.4186047 0.004372140 3.0007119 18
## [4656] {hamburger_meat,
## yogurt} => {butter} 0.001830198 0.2812500 0.006507372 5.0754014 18
## [4657] {butter,
## hamburger_meat} => {rolls/buns} 0.001220132 0.2790698 0.004372140 1.5172201 12
## [4658] {butter,
## hamburger_meat} => {other_vegetables} 0.002440264 0.5581395 0.004372140 2.8845519 24
## [4659] {butter,
## hamburger_meat} => {whole_milk} 0.003050330 0.6976744 0.004372140 2.7304528 30
## [4660] {hamburger_meat,
## whole_milk} => {butter} 0.003050330 0.2068966 0.014743264 3.7336286 30
## [4661] {hamburger_meat,
## newspapers} => {root_vegetables} 0.001118454 0.4074074 0.002745297 3.7377349 11
## [4662] {hamburger_meat,
## newspapers} => {other_vegetables} 0.001321810 0.4814815 0.002745297 2.4883712 13
## [4663] {hamburger_meat,
## newspapers} => {whole_milk} 0.001321810 0.4814815 0.002745297 1.8843495 13
## [4664] {domestic_eggs,
## hamburger_meat} => {root_vegetables} 0.001118454 0.2750000 0.004067107 2.5229711 11
## [4665] {domestic_eggs,
## hamburger_meat} => {rolls/buns} 0.001321810 0.3250000 0.004067107 1.7669292 13
## [4666] {domestic_eggs,
## hamburger_meat} => {other_vegetables} 0.002338587 0.5750000 0.004067107 2.9716894 23
## [4667] {domestic_eggs,
## hamburger_meat} => {whole_milk} 0.002541942 0.6250000 0.004067107 2.4460306 25
## [4668] {fruit/vegetable_juice,
## hamburger_meat} => {root_vegetables} 0.001016777 0.2857143 0.003558719 2.6212687 10
## [4669] {fruit/vegetable_juice,
## hamburger_meat} => {yogurt} 0.001525165 0.4285714 0.003558719 3.0721574 15
## [4670] {hamburger_meat,
## yogurt} => {fruit/vegetable_juice} 0.001525165 0.2343750 0.006507372 3.2420227 15
## [4671] {fruit/vegetable_juice,
## hamburger_meat} => {rolls/buns} 0.001016777 0.2857143 0.003558719 1.5533444 10
## [4672] {fruit/vegetable_juice,
## hamburger_meat} => {other_vegetables} 0.001525165 0.4285714 0.003558719 2.2149238 15
## [4673] {fruit/vegetable_juice,
## hamburger_meat} => {whole_milk} 0.002033554 0.5714286 0.003558719 2.2363709 20
## [4674] {hamburger_meat,
## whipped/sour_cream} => {pip_fruit} 0.001016777 0.2380952 0.004270463 3.1474014 10
## [4675] {hamburger_meat,
## pip_fruit} => {whipped/sour_cream} 0.001016777 0.2272727 0.004473818 3.1705351 10
## [4676] {hamburger_meat,
## whipped/sour_cream} => {tropical_fruit} 0.001118454 0.2619048 0.004270463 2.4959625 11
## [4677] {hamburger_meat,
## tropical_fruit} => {whipped/sour_cream} 0.001118454 0.2619048 0.004270463 3.6536643 11
## [4678] {hamburger_meat,
## whipped/sour_cream} => {root_vegetables} 0.001220132 0.2857143 0.004270463 2.6212687 12
## [4679] {hamburger_meat,
## whipped/sour_cream} => {yogurt} 0.001626843 0.3809524 0.004270463 2.7308066 16
## [4680] {hamburger_meat,
## yogurt} => {whipped/sour_cream} 0.001626843 0.2500000 0.006507372 3.4875887 16
## [4681] {hamburger_meat,
## whipped/sour_cream} => {other_vegetables} 0.002440264 0.5714286 0.004270463 2.9532317 24
## [4682] {hamburger_meat,
## whipped/sour_cream} => {whole_milk} 0.002643620 0.6190476 0.004270463 2.4227351 26
## [4683] {hamburger_meat,
## pip_fruit} => {sausage} 0.001016777 0.2272727 0.004473818 2.4190771 10
## [4684] {hamburger_meat,
## pip_fruit} => {tropical_fruit} 0.001321810 0.2954545 0.004473818 2.8156933 13
## [4685] {hamburger_meat,
## tropical_fruit} => {pip_fruit} 0.001321810 0.3095238 0.004270463 4.0916219 13
## [4686] {hamburger_meat,
## pip_fruit} => {root_vegetables} 0.001321810 0.2954545 0.004473818 2.7106301 13
## [4687] {hamburger_meat,
## root_vegetables} => {pip_fruit} 0.001321810 0.2131148 0.006202339 2.8171823 13
## [4688] {hamburger_meat,
## pip_fruit} => {yogurt} 0.001423488 0.3181818 0.004473818 2.2808442 14
## [4689] {hamburger_meat,
## yogurt} => {pip_fruit} 0.001423488 0.2187500 0.006507372 2.8916751 14
## [4690] {hamburger_meat,
## pip_fruit} => {rolls/buns} 0.001220132 0.2727273 0.004473818 1.4827378 12
## [4691] {hamburger_meat,
## pip_fruit} => {other_vegetables} 0.002948653 0.6590909 0.004473818 3.4062843 29
## [4692] {hamburger_meat,
## other_vegetables} => {pip_fruit} 0.002948653 0.2132353 0.013828165 2.8187757 29
## [4693] {hamburger_meat,
## pip_fruit} => {whole_milk} 0.002541942 0.5681818 0.004473818 2.2236642 25
## [4694] {hamburger_meat,
## pastry} => {yogurt} 0.001220132 0.2666667 0.004575496 1.9115646 12
## [4695] {hamburger_meat,
## pastry} => {rolls/buns} 0.001220132 0.2666667 0.004575496 1.4497881 12
## [4696] {hamburger_meat,
## pastry} => {other_vegetables} 0.002033554 0.4444444 0.004575496 2.2969580 20
## [4697] {hamburger_meat,
## pastry} => {whole_milk} 0.002541942 0.5555556 0.004575496 2.1742495 25
## [4698] {citrus_fruit,
## hamburger_meat} => {root_vegetables} 0.001016777 0.2564103 0.003965430 2.3524206 10
## [4699] {citrus_fruit,
## hamburger_meat} => {yogurt} 0.001525165 0.3846154 0.003965430 2.7570644 15
## [4700] {hamburger_meat,
## yogurt} => {citrus_fruit} 0.001525165 0.2343750 0.006507372 2.8317913 15
## [4701] {citrus_fruit,
## hamburger_meat} => {rolls/buns} 0.001321810 0.3333333 0.003965430 1.8122351 13
## [4702] {citrus_fruit,
## hamburger_meat} => {other_vegetables} 0.001931876 0.4871795 0.003965430 2.5178194 19
## [4703] {citrus_fruit,
## hamburger_meat} => {whole_milk} 0.002236909 0.5641026 0.003965430 2.2076995 22
## [4704] {hamburger_meat,
## shopping_bags} => {soda} 0.001016777 0.2564103 0.003965430 1.4704343 10
## [4705] {hamburger_meat,
## shopping_bags} => {rolls/buns} 0.001016777 0.2564103 0.003965430 1.3940270 10
## [4706] {hamburger_meat,
## shopping_bags} => {other_vegetables} 0.001016777 0.2564103 0.003965430 1.3251681 10
## [4707] {hamburger_meat,
## shopping_bags} => {whole_milk} 0.001728521 0.4358974 0.003965430 1.7059496 17
## [4708] {hamburger_meat,
## sausage} => {tropical_fruit} 0.001220132 0.2352941 0.005185562 2.2423621 12
## [4709] {hamburger_meat,
## tropical_fruit} => {sausage} 0.001220132 0.2857143 0.004270463 3.0411255 12
## [4710] {hamburger_meat,
## sausage} => {yogurt} 0.001321810 0.2549020 0.005185562 1.8272309 13
## [4711] {hamburger_meat,
## yogurt} => {sausage} 0.001321810 0.2031250 0.006507372 2.1620502 13
## [4712] {hamburger_meat,
## sausage} => {rolls/buns} 0.001626843 0.3137255 0.005185562 1.7056331 16
## [4713] {hamburger_meat,
## sausage} => {other_vegetables} 0.002135231 0.4117647 0.005185562 2.1280640 21
## [4714] {hamburger_meat,
## sausage} => {whole_milk} 0.002643620 0.5098039 0.005185562 1.9951936 26
## [4715] {bottled_water,
## hamburger_meat} => {rolls/buns} 0.001016777 0.3448276 0.002948653 1.8747260 10
## [4716] {bottled_water,
## hamburger_meat} => {other_vegetables} 0.001423488 0.4827586 0.002948653 2.4949716 14
## [4717] {bottled_water,
## hamburger_meat} => {whole_milk} 0.001830198 0.6206897 0.002948653 2.4291615 18
## [4718] {hamburger_meat,
## tropical_fruit} => {root_vegetables} 0.001220132 0.2857143 0.004270463 2.6212687 12
## [4719] {hamburger_meat,
## tropical_fruit} => {soda} 0.001016777 0.2380952 0.004270463 1.3654033 10
## [4720] {hamburger_meat,
## tropical_fruit} => {yogurt} 0.001626843 0.3809524 0.004270463 2.7308066 16
## [4721] {hamburger_meat,
## yogurt} => {tropical_fruit} 0.001626843 0.2500000 0.006507372 2.3825097 16
## [4722] {hamburger_meat,
## tropical_fruit} => {rolls/buns} 0.001525165 0.3571429 0.004270463 1.9416805 15
## [4723] {hamburger_meat,
## tropical_fruit} => {other_vegetables} 0.002338587 0.5476190 0.004270463 2.8301804 23
## [4724] {hamburger_meat,
## tropical_fruit} => {whole_milk} 0.001931876 0.4523810 0.004270463 1.7704603 19
## [4725] {hamburger_meat,
## root_vegetables} => {yogurt} 0.001728521 0.2786885 0.006202339 1.9977417 17
## [4726] {hamburger_meat,
## yogurt} => {root_vegetables} 0.001728521 0.2656250 0.006507372 2.4369607 17
## [4727] {hamburger_meat,
## root_vegetables} => {rolls/buns} 0.002236909 0.3606557 0.006202339 1.9607790 22
## [4728] {hamburger_meat,
## rolls/buns} => {root_vegetables} 0.002236909 0.2588235 0.008642603 2.3745610 22
## [4729] {hamburger_meat,
## root_vegetables} => {other_vegetables} 0.003660397 0.5901639 0.006202339 3.0500590 36
## [4730] {hamburger_meat,
## other_vegetables} => {root_vegetables} 0.003660397 0.2647059 0.013828165 2.4285283 36
## [4731] {hamburger_meat,
## root_vegetables} => {whole_milk} 0.003965430 0.6393443 0.006202339 2.5021690 39
## [4732] {hamburger_meat,
## whole_milk} => {root_vegetables} 0.003965430 0.2689655 0.014743264 2.4676081 39
## [4733] {hamburger_meat,
## soda} => {yogurt} 0.001321810 0.2280702 0.005795628 1.6348908 13
## [4734] {hamburger_meat,
## yogurt} => {soda} 0.001321810 0.2031250 0.006507372 1.1648597 13
## [4735] {hamburger_meat,
## soda} => {rolls/buns} 0.001321810 0.2280702 0.005795628 1.2399503 13
## [4736] {hamburger_meat,
## soda} => {other_vegetables} 0.001728521 0.2982456 0.005795628 1.5413797 17
## [4737] {hamburger_meat,
## soda} => {whole_milk} 0.002033554 0.3508772 0.005795628 1.3732102 20
## [4738] {hamburger_meat,
## yogurt} => {rolls/buns} 0.002338587 0.3593750 0.006507372 1.9538160 23
## [4739] {hamburger_meat,
## rolls/buns} => {yogurt} 0.002338587 0.2705882 0.008642603 1.9396759 23
## [4740] {hamburger_meat,
## yogurt} => {other_vegetables} 0.003457041 0.5312500 0.006507372 2.7455826 34
## [4741] {hamburger_meat,
## other_vegetables} => {yogurt} 0.003457041 0.2500000 0.013828165 1.7920918 34
## [4742] {hamburger_meat,
## yogurt} => {whole_milk} 0.003965430 0.6093750 0.006507372 2.3848799 39
## [4743] {hamburger_meat,
## whole_milk} => {yogurt} 0.003965430 0.2689655 0.014743264 1.9280436 39
## [4744] {hamburger_meat,
## rolls/buns} => {other_vegetables} 0.004677173 0.5411765 0.008642603 2.7968842 46
## [4745] {hamburger_meat,
## other_vegetables} => {rolls/buns} 0.004677173 0.3382353 0.013828165 1.8388856 46
## [4746] {hamburger_meat,
## rolls/buns} => {whole_milk} 0.004372140 0.5058824 0.008642603 1.9798460 43
## [4747] {hamburger_meat,
## whole_milk} => {rolls/buns} 0.004372140 0.2965517 0.014743264 1.6122643 43
## [4748] {hamburger_meat,
## other_vegetables} => {whole_milk} 0.006304016 0.4558824 0.013828165 1.7841635 62
## [4749] {hamburger_meat,
## whole_milk} => {other_vegetables} 0.006304016 0.4275862 0.014743264 2.2098320 62
## [4750] {hygiene_articles,
## sugar} => {whipped/sour_cream} 0.001016777 0.3846154 0.002643620 5.3655210 10
## [4751] {hygiene_articles,
## whipped/sour_cream} => {sugar} 0.001016777 0.2380952 0.004270463 7.0320320 10
## [4752] {sugar,
## whipped/sour_cream} => {hygiene_articles} 0.001016777 0.2083333 0.004880529 6.3239455 10
## [4753] {hygiene_articles,
## sugar} => {other_vegetables} 0.001016777 0.3846154 0.002643620 1.9877521 10
## [4754] {hygiene_articles,
## sugar} => {whole_milk} 0.001525165 0.5769231 0.002643620 2.2578744 15
## [4755] {hygiene_articles,
## waffles} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [4756] {cream_cheese_,
## hygiene_articles} => {yogurt} 0.001220132 0.5454545 0.002236909 3.9100186 12
## [4757] {cream_cheese_,
## hygiene_articles} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [4758] {cream_cheese_,
## hygiene_articles} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [4759] {hygiene_articles,
## white_bread} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [4760] {hygiene_articles,
## white_bread} => {whole_milk} 0.001423488 0.5833333 0.002440264 2.2829619 14
## [4761] {chocolate,
## hygiene_articles} => {citrus_fruit} 0.001220132 0.4444444 0.002745297 5.3699154 12
## [4762] {citrus_fruit,
## hygiene_articles} => {chocolate} 0.001220132 0.2307692 0.005287239 4.6508512 12
## [4763] {chocolate,
## hygiene_articles} => {soda} 0.001118454 0.4074074 0.002745297 2.3363568 11
## [4764] {chocolate,
## hygiene_articles} => {whole_milk} 0.001321810 0.4814815 0.002745297 1.8843495 13
## [4765] {coffee,
## hygiene_articles} => {other_vegetables} 0.001220132 0.3750000 0.003253686 1.9380583 12
## [4766] {coffee,
## hygiene_articles} => {whole_milk} 0.001525165 0.4687500 0.003253686 1.8345230 15
## [4767] {frozen_vegetables,
## hygiene_articles} => {root_vegetables} 0.001118454 0.3666667 0.003050330 3.3639614 11
## [4768] {hygiene_articles,
## root_vegetables} => {frozen_vegetables} 0.001118454 0.2075472 0.005388917 4.3154892 11
## [4769] {frozen_vegetables,
## hygiene_articles} => {yogurt} 0.001016777 0.3333333 0.003050330 2.3894558 10
## [4770] {frozen_vegetables,
## hygiene_articles} => {other_vegetables} 0.001321810 0.4333333 0.003050330 2.2395341 13
## [4771] {frozen_vegetables,
## hygiene_articles} => {whole_milk} 0.001626843 0.5333333 0.003050330 2.0872795 16
## [4772] {beef,
## hygiene_articles} => {butter} 0.001016777 0.3125000 0.003253686 5.6393349 10
## [4773] {butter,
## hygiene_articles} => {beef} 0.001016777 0.2325581 0.004372140 4.4325762 10
## [4774] {beef,
## hygiene_articles} => {bottled_water} 0.001016777 0.3125000 0.003253686 2.8274494 10
## [4775] {beef,
## hygiene_articles} => {root_vegetables} 0.001321810 0.4062500 0.003253686 3.7271164 13
## [4776] {hygiene_articles,
## root_vegetables} => {beef} 0.001321810 0.2452830 0.005388917 4.6751134 13
## [4777] {beef,
## hygiene_articles} => {yogurt} 0.001321810 0.4062500 0.003253686 2.9121492 13
## [4778] {beef,
## hygiene_articles} => {rolls/buns} 0.001220132 0.3750000 0.003253686 2.0387645 12
## [4779] {hygiene_articles,
## rolls/buns} => {beef} 0.001220132 0.2068966 0.005897306 3.9434643 12
## [4780] {beef,
## hygiene_articles} => {other_vegetables} 0.001423488 0.4375000 0.003253686 2.2610681 14
## [4781] {beef,
## hygiene_articles} => {whole_milk} 0.001728521 0.5312500 0.003253686 2.0791260 17
## [4782] {curd,
## hygiene_articles} => {napkins} 0.001321810 0.3333333 0.003965430 6.3656958 13
## [4783] {hygiene_articles,
## napkins} => {curd} 0.001321810 0.2166667 0.006100661 4.0666349 13
## [4784] {curd,
## napkins} => {hygiene_articles} 0.001321810 0.2765957 0.004778851 8.3960468 13
## [4785] {curd,
## hygiene_articles} => {butter} 0.001016777 0.2564103 0.003965430 4.6271466 10
## [4786] {butter,
## hygiene_articles} => {curd} 0.001016777 0.2325581 0.004372140 4.3649032 10
## [4787] {curd,
## hygiene_articles} => {domestic_eggs} 0.001016777 0.2564103 0.003965430 4.0413379 10
## [4788] {domestic_eggs,
## hygiene_articles} => {curd} 0.001016777 0.2127660 0.004778851 3.9934221 10
## [4789] {curd,
## hygiene_articles} => {pip_fruit} 0.001118454 0.2820513 0.003965430 3.7284602 11
## [4790] {hygiene_articles,
## pip_fruit} => {curd} 0.001118454 0.2340426 0.004778851 4.3927643 11
## [4791] {curd,
## hygiene_articles} => {citrus_fruit} 0.001016777 0.2564103 0.003965430 3.0980281 10
## [4792] {curd,
## hygiene_articles} => {tropical_fruit} 0.001321810 0.3333333 0.003965430 3.1766796 13
## [4793] {curd,
## hygiene_articles} => {yogurt} 0.001830198 0.4615385 0.003965430 3.3084772 18
## [4794] {hygiene_articles,
## yogurt} => {curd} 0.001830198 0.2500000 0.007320793 4.6922710 18
## [4795] {curd,
## hygiene_articles} => {rolls/buns} 0.001016777 0.2564103 0.003965430 1.3940270 10
## [4796] {curd,
## hygiene_articles} => {other_vegetables} 0.001931876 0.4871795 0.003965430 2.5178194 19
## [4797] {hygiene_articles,
## other_vegetables} => {curd} 0.001931876 0.2021277 0.009557702 3.7937510 19
## [4798] {curd,
## hygiene_articles} => {whole_milk} 0.001931876 0.4871795 0.003965430 1.9066495 19
## [4799] {butter,
## hygiene_articles} => {napkins} 0.001118454 0.2558140 0.004372140 4.8853014 11
## [4800] {butter,
## napkins} => {hygiene_articles} 0.001118454 0.2244898 0.004982206 6.8143739 11
## [4801] {fruit/vegetable_juice,
## hygiene_articles} => {napkins} 0.001016777 0.2631579 0.003863752 5.0255493 10
## [4802] {hygiene_articles,
## whipped/sour_cream} => {napkins} 0.001118454 0.2619048 0.004270463 5.0016181 11
## [4803] {hygiene_articles,
## napkins} => {pip_fruit} 0.001220132 0.2000000 0.006100661 2.6438172 12
## [4804] {hygiene_articles,
## pip_fruit} => {napkins} 0.001220132 0.2553191 0.004778851 4.8758521 12
## [4805] {hygiene_articles,
## pastry} => {napkins} 0.001016777 0.2222222 0.004575496 4.2437972 10
## [4806] {hygiene_articles,
## napkins} => {citrus_fruit} 0.001220132 0.2000000 0.006100661 2.4164619 12
## [4807] {citrus_fruit,
## hygiene_articles} => {napkins} 0.001220132 0.2307692 0.005287239 4.4070202 12
## [4808] {hygiene_articles,
## sausage} => {napkins} 0.001016777 0.2325581 0.004372140 4.4411831 10
## [4809] {hygiene_articles,
## napkins} => {bottled_water} 0.001423488 0.2333333 0.006100661 2.1111622 14
## [4810] {bottled_water,
## hygiene_articles} => {napkins} 0.001423488 0.2500000 0.005693950 4.7742718 14
## [4811] {hygiene_articles,
## napkins} => {tropical_fruit} 0.001525165 0.2500000 0.006100661 2.3825097 15
## [4812] {hygiene_articles,
## tropical_fruit} => {napkins} 0.001525165 0.2272727 0.006710727 4.3402471 15
## [4813] {hygiene_articles,
## napkins} => {soda} 0.001220132 0.2000000 0.006100661 1.1469388 12
## [4814] {hygiene_articles,
## napkins} => {yogurt} 0.001525165 0.2500000 0.006100661 1.7920918 15
## [4815] {hygiene_articles,
## yogurt} => {napkins} 0.001525165 0.2083333 0.007320793 3.9785599 15
## [4816] {hygiene_articles,
## napkins} => {rolls/buns} 0.001321810 0.2166667 0.006100661 1.1779528 13
## [4817] {hygiene_articles,
## rolls/buns} => {napkins} 0.001321810 0.2241379 0.005897306 4.2803817 13
## [4818] {hygiene_articles,
## napkins} => {other_vegetables} 0.002033554 0.3333333 0.006100661 1.7227185 20
## [4819] {hygiene_articles,
## other_vegetables} => {napkins} 0.002033554 0.2127660 0.009557702 4.0632101 20
## [4820] {hygiene_articles,
## napkins} => {whole_milk} 0.002846975 0.4666667 0.006100661 1.8263695 28
## [4821] {hygiene_articles,
## whole_milk} => {napkins} 0.002846975 0.2222222 0.012811388 4.2437972 28
## [4822] {hygiene_articles,
## pork} => {butter} 0.001220132 0.3529412 0.003457041 6.3691311 12
## [4823] {butter,
## hygiene_articles} => {pork} 0.001220132 0.2790698 0.004372140 4.8406546 12
## [4824] {butter,
## pork} => {hygiene_articles} 0.001220132 0.2222222 0.005490595 6.7455418 12
## [4825] {hygiene_articles,
## pork} => {root_vegetables} 0.001321810 0.3823529 0.003457041 3.5078742 13
## [4826] {hygiene_articles,
## root_vegetables} => {pork} 0.001321810 0.2452830 0.005388917 4.2546005 13
## [4827] {hygiene_articles,
## pork} => {other_vegetables} 0.001321810 0.3823529 0.003457041 1.9760595 13
## [4828] {hygiene_articles,
## pork} => {whole_milk} 0.002033554 0.5882353 0.003457041 2.3021465 20
## [4829] {frankfurter,
## hygiene_articles} => {domestic_eggs} 0.001016777 0.3225806 0.003152008 5.0842639 10
## [4830] {domestic_eggs,
## hygiene_articles} => {frankfurter} 0.001016777 0.2127660 0.004778851 3.6078503 10
## [4831] {frankfurter,
## hygiene_articles} => {tropical_fruit} 0.001118454 0.3548387 0.003152008 3.3816267 11
## [4832] {frankfurter,
## hygiene_articles} => {rolls/buns} 0.001016777 0.3225806 0.003152008 1.7537759 10
## [4833] {frankfurter,
## hygiene_articles} => {other_vegetables} 0.001321810 0.4193548 0.003152008 2.1672910 13
## [4834] {frankfurter,
## hygiene_articles} => {whole_milk} 0.001423488 0.4516129 0.003152008 1.7674544 14
## [4835] {bottled_beer,
## hygiene_articles} => {bottled_water} 0.001118454 0.3928571 0.002846975 3.5545078 11
## [4836] {bottled_beer,
## hygiene_articles} => {whole_milk} 0.001321810 0.4642857 0.002846975 1.8170513 13
## [4837] {brown_bread,
## hygiene_articles} => {other_vegetables} 0.001321810 0.4333333 0.003050330 2.2395341 13
## [4838] {brown_bread,
## hygiene_articles} => {whole_milk} 0.001423488 0.4666667 0.003050330 1.8263695 14
## [4839] {hygiene_articles,
## margarine} => {butter} 0.001016777 0.2631579 0.003863752 4.7489136 10
## [4840] {butter,
## hygiene_articles} => {margarine} 0.001016777 0.2325581 0.004372140 3.9708495 10
## [4841] {hygiene_articles,
## margarine} => {whipped/sour_cream} 0.001016777 0.2631579 0.003863752 3.6711459 10
## [4842] {hygiene_articles,
## whipped/sour_cream} => {margarine} 0.001016777 0.2380952 0.004270463 4.0653935 10
## [4843] {hygiene_articles,
## margarine} => {tropical_fruit} 0.001321810 0.3421053 0.003863752 3.2602764 13
## [4844] {hygiene_articles,
## margarine} => {root_vegetables} 0.001016777 0.2631579 0.003863752 2.4143264 10
## [4845] {hygiene_articles,
## margarine} => {yogurt} 0.001626843 0.4210526 0.003863752 3.0182599 16
## [4846] {hygiene_articles,
## yogurt} => {margarine} 0.001626843 0.2222222 0.007320793 3.7943673 16
## [4847] {hygiene_articles,
## margarine} => {rolls/buns} 0.001220132 0.3157895 0.003863752 1.7168543 12
## [4848] {hygiene_articles,
## rolls/buns} => {margarine} 0.001220132 0.2068966 0.005897306 3.5326868 12
## [4849] {hygiene_articles,
## margarine} => {other_vegetables} 0.001728521 0.4473684 0.003863752 2.3120696 17
## [4850] {hygiene_articles,
## margarine} => {whole_milk} 0.002236909 0.5789474 0.003863752 2.2657968 22
## [4851] {butter,
## hygiene_articles} => {domestic_eggs} 0.001118454 0.2558140 0.004372140 4.0319395 11
## [4852] {domestic_eggs,
## hygiene_articles} => {butter} 0.001118454 0.2340426 0.004778851 4.2235019 11
## [4853] {butter,
## hygiene_articles} => {whipped/sour_cream} 0.001118454 0.2558140 0.004372140 3.5686954 11
## [4854] {hygiene_articles,
## whipped/sour_cream} => {butter} 0.001118454 0.2619048 0.004270463 4.7262997 11
## [4855] {butter,
## hygiene_articles} => {pip_fruit} 0.001016777 0.2325581 0.004372140 3.0742061 10
## [4856] {hygiene_articles,
## pip_fruit} => {butter} 0.001016777 0.2127660 0.004778851 3.8395471 10
## [4857] {butter,
## hygiene_articles} => {pastry} 0.001220132 0.2790698 0.004372140 3.1367442 12
## [4858] {hygiene_articles,
## pastry} => {butter} 0.001220132 0.2666667 0.004575496 4.8122324 12
## [4859] {butter,
## hygiene_articles} => {citrus_fruit} 0.001220132 0.2790698 0.004372140 3.3718073 12
## [4860] {citrus_fruit,
## hygiene_articles} => {butter} 0.001220132 0.2307692 0.005287239 4.1644319 12
## [4861] {butter,
## hygiene_articles} => {sausage} 0.001016777 0.2325581 0.004372140 2.4753347 10
## [4862] {hygiene_articles,
## sausage} => {butter} 0.001016777 0.2325581 0.004372140 4.1967143 10
## [4863] {butter,
## hygiene_articles} => {bottled_water} 0.001423488 0.3255814 0.004372140 2.9458077 14
## [4864] {bottled_water,
## hygiene_articles} => {butter} 0.001423488 0.2500000 0.005693950 4.5114679 14
## [4865] {butter,
## hygiene_articles} => {tropical_fruit} 0.001321810 0.3023256 0.004372140 2.8811745 13
## [4866] {butter,
## hygiene_articles} => {root_vegetables} 0.001728521 0.3953488 0.004372140 3.6271043 17
## [4867] {hygiene_articles,
## root_vegetables} => {butter} 0.001728521 0.3207547 0.005388917 5.7882984 17
## [4868] {butter,
## hygiene_articles} => {yogurt} 0.001423488 0.3255814 0.004372140 2.3338870 14
## [4869] {butter,
## hygiene_articles} => {rolls/buns} 0.001220132 0.2790698 0.004372140 1.5172201 12
## [4870] {hygiene_articles,
## rolls/buns} => {butter} 0.001220132 0.2068966 0.005897306 3.7336286 12
## [4871] {butter,
## hygiene_articles} => {other_vegetables} 0.002338587 0.5348837 0.004372140 2.7643623 23
## [4872] {hygiene_articles,
## other_vegetables} => {butter} 0.002338587 0.2446809 0.009557702 4.4154792 23
## [4873] {butter,
## hygiene_articles} => {whole_milk} 0.003050330 0.6976744 0.004372140 2.7304528 30
## [4874] {hygiene_articles,
## whole_milk} => {butter} 0.003050330 0.2380952 0.012811388 4.2966361 30
## [4875] {hygiene_articles,
## newspapers} => {other_vegetables} 0.001118454 0.3666667 0.003050330 1.8949904 11
## [4876] {hygiene_articles,
## newspapers} => {whole_milk} 0.001220132 0.4000000 0.003050330 1.5654596 12
## [4877] {domestic_eggs,
## hygiene_articles} => {bottled_water} 0.001118454 0.2340426 0.004778851 2.1175791 11
## [4878] {domestic_eggs,
## hygiene_articles} => {tropical_fruit} 0.001321810 0.2765957 0.004778851 2.6359682 13
## [4879] {domestic_eggs,
## hygiene_articles} => {root_vegetables} 0.001016777 0.2127660 0.004778851 1.9520086 10
## [4880] {domestic_eggs,
## hygiene_articles} => {soda} 0.001118454 0.2340426 0.004778851 1.3421624 11
## [4881] {domestic_eggs,
## hygiene_articles} => {rolls/buns} 0.001321810 0.2765957 0.004778851 1.5037696 13
## [4882] {hygiene_articles,
## rolls/buns} => {domestic_eggs} 0.001321810 0.2241379 0.005897306 3.5326868 13
## [4883] {domestic_eggs,
## hygiene_articles} => {other_vegetables} 0.001525165 0.3191489 0.004778851 1.6494113 15
## [4884] {domestic_eggs,
## hygiene_articles} => {whole_milk} 0.002745297 0.5744681 0.004778851 2.2482665 27
## [4885] {hygiene_articles,
## whole_milk} => {domestic_eggs} 0.002745297 0.2142857 0.012811388 3.3774038 27
## [4886] {fruit/vegetable_juice,
## hygiene_articles} => {pip_fruit} 0.001220132 0.3157895 0.003863752 4.1744482 12
## [4887] {hygiene_articles,
## pip_fruit} => {fruit/vegetable_juice} 0.001220132 0.2553191 0.004778851 3.5317353 12
## [4888] {fruit/vegetable_juice,
## hygiene_articles} => {citrus_fruit} 0.001118454 0.2894737 0.003863752 3.4975107 11
## [4889] {citrus_fruit,
## hygiene_articles} => {fruit/vegetable_juice} 0.001118454 0.2115385 0.005287239 2.9261333 11
## [4890] {fruit/vegetable_juice,
## hygiene_articles} => {sausage} 0.001016777 0.2631579 0.003863752 2.8010367 10
## [4891] {hygiene_articles,
## sausage} => {fruit/vegetable_juice} 0.001016777 0.2325581 0.004372140 3.2168907 10
## [4892] {fruit/vegetable_juice,
## hygiene_articles} => {tropical_fruit} 0.001321810 0.3421053 0.003863752 3.2602764 13
## [4893] {fruit/vegetable_juice,
## hygiene_articles} => {soda} 0.001220132 0.3157895 0.003863752 1.8109560 12
## [4894] {fruit/vegetable_juice,
## hygiene_articles} => {yogurt} 0.001728521 0.4473684 0.003863752 3.2069012 17
## [4895] {hygiene_articles,
## yogurt} => {fruit/vegetable_juice} 0.001728521 0.2361111 0.007320793 3.2660377 17
## [4896] {fruit/vegetable_juice,
## hygiene_articles} => {other_vegetables} 0.001220132 0.3157895 0.003863752 1.6320491 12
## [4897] {fruit/vegetable_juice,
## hygiene_articles} => {whole_milk} 0.001423488 0.3684211 0.003863752 1.4418707 14
## [4898] {hygiene_articles,
## whipped/sour_cream} => {citrus_fruit} 0.001423488 0.3333333 0.004270463 4.0274365 14
## [4899] {citrus_fruit,
## hygiene_articles} => {whipped/sour_cream} 0.001423488 0.2692308 0.005287239 3.7558647 14
## [4900] {hygiene_articles,
## whipped/sour_cream} => {bottled_water} 0.001016777 0.2380952 0.004270463 2.1542472 10
## [4901] {hygiene_articles,
## whipped/sour_cream} => {tropical_fruit} 0.001220132 0.2857143 0.004270463 2.7228682 12
## [4902] {hygiene_articles,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.2380952 0.004270463 2.1843905 10
## [4903] {hygiene_articles,
## whipped/sour_cream} => {yogurt} 0.001728521 0.4047619 0.004270463 2.9014820 17
## [4904] {hygiene_articles,
## yogurt} => {whipped/sour_cream} 0.001728521 0.2361111 0.007320793 3.2938337 17
## [4905] {hygiene_articles,
## whipped/sour_cream} => {rolls/buns} 0.001118454 0.2619048 0.004270463 1.4238990 11
## [4906] {hygiene_articles,
## whipped/sour_cream} => {other_vegetables} 0.002338587 0.5476190 0.004270463 2.8301804 23
## [4907] {hygiene_articles,
## other_vegetables} => {whipped/sour_cream} 0.002338587 0.2446809 0.009557702 3.4133846 23
## [4908] {hygiene_articles,
## whipped/sour_cream} => {whole_milk} 0.002440264 0.5714286 0.004270463 2.2363709 24
## [4909] {hygiene_articles,
## pip_fruit} => {pastry} 0.001118454 0.2340426 0.004778851 2.6306383 11
## [4910] {hygiene_articles,
## pastry} => {pip_fruit} 0.001118454 0.2444444 0.004575496 3.2313321 11
## [4911] {hygiene_articles,
## pip_fruit} => {citrus_fruit} 0.001525165 0.3191489 0.004778851 3.8560562 15
## [4912] {citrus_fruit,
## hygiene_articles} => {pip_fruit} 0.001525165 0.2884615 0.005287239 3.8131979 15
## [4913] {hygiene_articles,
## pip_fruit} => {sausage} 0.001626843 0.3404255 0.004778851 3.6234687 16
## [4914] {hygiene_articles,
## sausage} => {pip_fruit} 0.001626843 0.3720930 0.004372140 4.9187297 16
## [4915] {hygiene_articles,
## pip_fruit} => {tropical_fruit} 0.002236909 0.4680851 0.004778851 4.4608692 22
## [4916] {hygiene_articles,
## tropical_fruit} => {pip_fruit} 0.002236909 0.3333333 0.006710727 4.4063620 22
## [4917] {hygiene_articles,
## pip_fruit} => {root_vegetables} 0.001016777 0.2127660 0.004778851 1.9520086 10
## [4918] {hygiene_articles,
## pip_fruit} => {soda} 0.001016777 0.2127660 0.004778851 1.2201476 10
## [4919] {hygiene_articles,
## pip_fruit} => {yogurt} 0.001931876 0.4042553 0.004778851 2.8978506 19
## [4920] {hygiene_articles,
## yogurt} => {pip_fruit} 0.001931876 0.2638889 0.007320793 3.4883699 19
## [4921] {hygiene_articles,
## pip_fruit} => {other_vegetables} 0.001931876 0.4042553 0.004778851 2.0892544 19
## [4922] {hygiene_articles,
## other_vegetables} => {pip_fruit} 0.001931876 0.2021277 0.009557702 2.6719429 19
## [4923] {hygiene_articles,
## pip_fruit} => {whole_milk} 0.003050330 0.6382979 0.004778851 2.4980738 30
## [4924] {hygiene_articles,
## whole_milk} => {pip_fruit} 0.003050330 0.2380952 0.012811388 3.1474014 30
## [4925] {hygiene_articles,
## pastry} => {tropical_fruit} 0.001525165 0.3333333 0.004575496 3.1766796 15
## [4926] {hygiene_articles,
## tropical_fruit} => {pastry} 0.001525165 0.2272727 0.006710727 2.5545455 15
## [4927] {hygiene_articles,
## pastry} => {soda} 0.001423488 0.3111111 0.004575496 1.7841270 14
## [4928] {hygiene_articles,
## soda} => {pastry} 0.001423488 0.2028986 0.007015760 2.2805797 14
## [4929] {hygiene_articles,
## pastry} => {yogurt} 0.001118454 0.2444444 0.004575496 1.7522676 11
## [4930] {hygiene_articles,
## pastry} => {rolls/buns} 0.001118454 0.2444444 0.004575496 1.3289724 11
## [4931] {hygiene_articles,
## pastry} => {other_vegetables} 0.001423488 0.3111111 0.004575496 1.6078706 14
## [4932] {hygiene_articles,
## pastry} => {whole_milk} 0.002541942 0.5555556 0.004575496 2.1742495 25
## [4933] {citrus_fruit,
## hygiene_articles} => {sausage} 0.001321810 0.2500000 0.005287239 2.6609848 13
## [4934] {hygiene_articles,
## sausage} => {citrus_fruit} 0.001321810 0.3023256 0.004372140 3.6527913 13
## [4935] {citrus_fruit,
## hygiene_articles} => {bottled_water} 0.001118454 0.2115385 0.005287239 1.9139657 11
## [4936] {citrus_fruit,
## hygiene_articles} => {tropical_fruit} 0.001728521 0.3269231 0.005287239 3.1155896 17
## [4937] {hygiene_articles,
## tropical_fruit} => {citrus_fruit} 0.001728521 0.2575758 0.006710727 3.1121100 17
## [4938] {citrus_fruit,
## hygiene_articles} => {root_vegetables} 0.001423488 0.2692308 0.005287239 2.4700416 14
## [4939] {hygiene_articles,
## root_vegetables} => {citrus_fruit} 0.001423488 0.2641509 0.005388917 3.1915535 14
## [4940] {citrus_fruit,
## hygiene_articles} => {yogurt} 0.001830198 0.3461538 0.005287239 2.4813579 18
## [4941] {hygiene_articles,
## yogurt} => {citrus_fruit} 0.001830198 0.2500000 0.007320793 3.0205774 18
## [4942] {citrus_fruit,
## hygiene_articles} => {other_vegetables} 0.002338587 0.4423077 0.005287239 2.2859150 23
## [4943] {hygiene_articles,
## other_vegetables} => {citrus_fruit} 0.002338587 0.2446809 0.009557702 2.9563098 23
## [4944] {citrus_fruit,
## hygiene_articles} => {whole_milk} 0.002541942 0.4807692 0.005287239 1.8815620 25
## [4945] {hygiene_articles,
## shopping_bags} => {soda} 0.001220132 0.2352941 0.005185562 1.3493397 12
## [4946] {hygiene_articles,
## shopping_bags} => {yogurt} 0.001220132 0.2352941 0.005185562 1.6866747 12
## [4947] {hygiene_articles,
## shopping_bags} => {whole_milk} 0.002236909 0.4313725 0.005185562 1.6882408 22
## [4948] {hygiene_articles,
## sausage} => {bottled_water} 0.001220132 0.2790698 0.004372140 2.5249781 12
## [4949] {bottled_water,
## hygiene_articles} => {sausage} 0.001220132 0.2142857 0.005693950 2.2808442 12
## [4950] {hygiene_articles,
## sausage} => {tropical_fruit} 0.001423488 0.3255814 0.004372140 3.1028033 14
## [4951] {hygiene_articles,
## tropical_fruit} => {sausage} 0.001423488 0.2121212 0.006710727 2.2578053 14
## [4952] {hygiene_articles,
## sausage} => {root_vegetables} 0.001016777 0.2325581 0.004372140 2.1335908 10
## [4953] {hygiene_articles,
## sausage} => {soda} 0.001423488 0.3255814 0.004372140 1.8671096 14
## [4954] {hygiene_articles,
## soda} => {sausage} 0.001423488 0.2028986 0.007015760 2.1596399 14
## [4955] {hygiene_articles,
## sausage} => {yogurt} 0.001626843 0.3720930 0.004372140 2.6672995 16
## [4956] {hygiene_articles,
## yogurt} => {sausage} 0.001626843 0.2222222 0.007320793 2.3653199 16
## [4957] {hygiene_articles,
## sausage} => {rolls/buns} 0.001118454 0.2558140 0.004372140 1.3907851 11
## [4958] {hygiene_articles,
## sausage} => {other_vegetables} 0.001525165 0.3488372 0.004372140 1.8028450 15
## [4959] {hygiene_articles,
## sausage} => {whole_milk} 0.002440264 0.5581395 0.004372140 2.1843622 24
## [4960] {bottled_water,
## hygiene_articles} => {tropical_fruit} 0.002135231 0.3750000 0.005693950 3.5737645 21
## [4961] {hygiene_articles,
## tropical_fruit} => {bottled_water} 0.002135231 0.3181818 0.006710727 2.8788576 21
## [4962] {bottled_water,
## hygiene_articles} => {root_vegetables} 0.001423488 0.2500000 0.005693950 2.2936101 14
## [4963] {hygiene_articles,
## root_vegetables} => {bottled_water} 0.001423488 0.2641509 0.005388917 2.3899950 14
## [4964] {bottled_water,
## hygiene_articles} => {yogurt} 0.001525165 0.2678571 0.005693950 1.9200984 15
## [4965] {hygiene_articles,
## yogurt} => {bottled_water} 0.001525165 0.2083333 0.007320793 1.8849663 15
## [4966] {bottled_water,
## hygiene_articles} => {rolls/buns} 0.001423488 0.2500000 0.005693950 1.3591763 14
## [4967] {hygiene_articles,
## rolls/buns} => {bottled_water} 0.001423488 0.2413793 0.005897306 2.1839609 14
## [4968] {bottled_water,
## hygiene_articles} => {other_vegetables} 0.001830198 0.3214286 0.005693950 1.6611929 18
## [4969] {bottled_water,
## hygiene_articles} => {whole_milk} 0.003050330 0.5357143 0.005693950 2.0965977 30
## [4970] {hygiene_articles,
## whole_milk} => {bottled_water} 0.003050330 0.2380952 0.012811388 2.1542472 30
## [4971] {hygiene_articles,
## tropical_fruit} => {root_vegetables} 0.001626843 0.2424242 0.006710727 2.2241067 16
## [4972] {hygiene_articles,
## root_vegetables} => {tropical_fruit} 0.001626843 0.3018868 0.005388917 2.8769928 16
## [4973] {hygiene_articles,
## tropical_fruit} => {yogurt} 0.002541942 0.3787879 0.006710727 2.7152907 25
## [4974] {hygiene_articles,
## yogurt} => {tropical_fruit} 0.002541942 0.3472222 0.007320793 3.3090412 25
## [4975] {hygiene_articles,
## tropical_fruit} => {rolls/buns} 0.001830198 0.2727273 0.006710727 1.4827378 18
## [4976] {hygiene_articles,
## rolls/buns} => {tropical_fruit} 0.001830198 0.3103448 0.005897306 2.9575982 18
## [4977] {hygiene_articles,
## tropical_fruit} => {other_vegetables} 0.002643620 0.3939394 0.006710727 2.0359401 26
## [4978] {hygiene_articles,
## other_vegetables} => {tropical_fruit} 0.002643620 0.2765957 0.009557702 2.6359682 26
## [4979] {hygiene_articles,
## tropical_fruit} => {whole_milk} 0.004067107 0.6060606 0.006710727 2.3719085 40
## [4980] {hygiene_articles,
## whole_milk} => {tropical_fruit} 0.004067107 0.3174603 0.012811388 3.0254091 40
## [4981] {hygiene_articles,
## root_vegetables} => {soda} 0.001220132 0.2264151 0.005388917 1.2984213 12
## [4982] {hygiene_articles,
## root_vegetables} => {yogurt} 0.001423488 0.2641509 0.005388917 1.8935310 14
## [4983] {hygiene_articles,
## root_vegetables} => {rolls/buns} 0.001220132 0.2264151 0.005388917 1.2309522 12
## [4984] {hygiene_articles,
## rolls/buns} => {root_vegetables} 0.001220132 0.2068966 0.005897306 1.8981601 12
## [4985] {hygiene_articles,
## root_vegetables} => {other_vegetables} 0.002541942 0.4716981 0.005388917 2.4378092 25
## [4986] {hygiene_articles,
## other_vegetables} => {root_vegetables} 0.002541942 0.2659574 0.009557702 2.4400107 25
## [4987] {hygiene_articles,
## root_vegetables} => {whole_milk} 0.003558719 0.6603774 0.005388917 2.5844852 35
## [4988] {hygiene_articles,
## whole_milk} => {root_vegetables} 0.003558719 0.2777778 0.012811388 2.5484556 35
## [4989] {hygiene_articles,
## soda} => {yogurt} 0.001830198 0.2608696 0.007015760 1.8700089 18
## [4990] {hygiene_articles,
## yogurt} => {soda} 0.001830198 0.2500000 0.007320793 1.4336735 18
## [4991] {hygiene_articles,
## soda} => {other_vegetables} 0.001423488 0.2028986 0.007015760 1.0486113 14
## [4992] {hygiene_articles,
## soda} => {whole_milk} 0.002338587 0.3333333 0.007015760 1.3045497 23
## [4993] {hygiene_articles,
## yogurt} => {rolls/buns} 0.001830198 0.2500000 0.007320793 1.3591763 18
## [4994] {hygiene_articles,
## rolls/buns} => {yogurt} 0.001830198 0.3103448 0.005897306 2.2246657 18
## [4995] {hygiene_articles,
## yogurt} => {other_vegetables} 0.002846975 0.3888889 0.007320793 2.0098383 28
## [4996] {hygiene_articles,
## other_vegetables} => {yogurt} 0.002846975 0.2978723 0.009557702 2.1352584 28
## [4997] {hygiene_articles,
## yogurt} => {whole_milk} 0.003965430 0.5416667 0.007320793 2.1198932 39
## [4998] {hygiene_articles,
## whole_milk} => {yogurt} 0.003965430 0.3095238 0.012811388 2.2187804 39
## [4999] {hygiene_articles,
## rolls/buns} => {other_vegetables} 0.002236909 0.3793103 0.005897306 1.9603349 22
## [5000] {hygiene_articles,
## other_vegetables} => {rolls/buns} 0.002236909 0.2340426 0.009557702 1.2724204 22
## [5001] {hygiene_articles,
## rolls/buns} => {whole_milk} 0.003050330 0.5172414 0.005897306 2.0243012 30
## [5002] {hygiene_articles,
## whole_milk} => {rolls/buns} 0.003050330 0.2380952 0.012811388 1.2944537 30
## [5003] {hygiene_articles,
## other_vegetables} => {whole_milk} 0.005185562 0.5425532 0.009557702 2.1233628 51
## [5004] {hygiene_articles,
## whole_milk} => {other_vegetables} 0.005185562 0.4047619 0.012811388 2.0918725 51
## [5005] {salty_snack,
## sugar} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [5006] {salty_snack,
## sugar} => {whole_milk} 0.001423488 0.5833333 0.002440264 2.2829619 14
## [5007] {salty_snack,
## waffles} => {other_vegetables} 0.001626843 0.4210526 0.003863752 2.1760655 16
## [5008] {salty_snack,
## waffles} => {whole_milk} 0.001220132 0.3157895 0.003863752 1.2358892 12
## [5009] {long_life_bakery_product,
## salty_snack} => {napkins} 0.001016777 0.3030303 0.003355363 5.7869962 10
## [5010] {napkins,
## salty_snack} => {long_life_bakery_product} 0.001016777 0.2500000 0.004067107 6.6813859 10
## [5011] {long_life_bakery_product,
## napkins} => {salty_snack} 0.001016777 0.2127660 0.004778851 5.6251430 10
## [5012] {long_life_bakery_product,
## salty_snack} => {pastry} 0.001016777 0.3030303 0.003355363 3.4060606 10
## [5013] {long_life_bakery_product,
## salty_snack} => {sausage} 0.001118454 0.3333333 0.003355363 3.5479798 11
## [5014] {salty_snack,
## sausage} => {long_life_bakery_product} 0.001118454 0.2115385 0.005287239 5.6534804 11
## [5015] {long_life_bakery_product,
## sausage} => {salty_snack} 0.001118454 0.2075472 0.005388917 5.4871678 11
## [5016] {long_life_bakery_product,
## salty_snack} => {soda} 0.001321810 0.3939394 0.003355363 2.2591218 13
## [5017] {long_life_bakery_product,
## salty_snack} => {other_vegetables} 0.001220132 0.3636364 0.003355363 1.8793293 12
## [5018] {long_life_bakery_product,
## salty_snack} => {whole_milk} 0.002033554 0.6060606 0.003355363 2.3719085 20
## [5019] {dessert,
## salty_snack} => {soda} 0.001118454 0.5000000 0.002236909 2.8673469 11
## [5020] {dessert,
## salty_snack} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [5021] {dessert,
## salty_snack} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [5022] {cream_cheese_,
## salty_snack} => {other_vegetables} 0.001321810 0.5200000 0.002541942 2.6874409 13
## [5023] {cream_cheese_,
## salty_snack} => {whole_milk} 0.001220132 0.4800000 0.002541942 1.8785515 12
## [5024] {chicken,
## salty_snack} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [5025] {salty_snack,
## white_bread} => {fruit/vegetable_juice} 0.001016777 0.4000000 0.002541942 5.5330520 10
## [5026] {salty_snack,
## white_bread} => {soda} 0.001016777 0.4000000 0.002541942 2.2938776 10
## [5027] {salty_snack,
## white_bread} => {other_vegetables} 0.001016777 0.4000000 0.002541942 2.0672622 10
## [5028] {salty_snack,
## white_bread} => {whole_milk} 0.001220132 0.4800000 0.002541942 1.8785515 12
## [5029] {chocolate,
## salty_snack} => {pastry} 0.001016777 0.2857143 0.003558719 3.2114286 10
## [5030] {chocolate,
## salty_snack} => {shopping_bags} 0.001118454 0.3142857 0.003558719 3.1898865 11
## [5031] {chocolate,
## salty_snack} => {soda} 0.001220132 0.3428571 0.003558719 1.9661808 12
## [5032] {chocolate,
## salty_snack} => {whole_milk} 0.001423488 0.4000000 0.003558719 1.5654596 14
## [5033] {coffee,
## salty_snack} => {soda} 0.001118454 0.3666667 0.003050330 2.1027211 11
## [5034] {coffee,
## salty_snack} => {whole_milk} 0.001118454 0.3666667 0.003050330 1.4350046 11
## [5035] {frozen_vegetables,
## salty_snack} => {fruit/vegetable_juice} 0.001016777 0.3448276 0.002948653 4.7698724 10
## [5036] {frozen_vegetables,
## salty_snack} => {whipped/sour_cream} 0.001118454 0.3793103 0.002948653 5.2915138 11
## [5037] {salty_snack,
## whipped/sour_cream} => {frozen_vegetables} 0.001118454 0.2156863 0.005185562 4.4847241 11
## [5038] {frozen_vegetables,
## salty_snack} => {soda} 0.001016777 0.3448276 0.002948653 1.9774806 10
## [5039] {frozen_vegetables,
## salty_snack} => {yogurt} 0.001118454 0.3793103 0.002948653 2.7190359 11
## [5040] {frozen_vegetables,
## salty_snack} => {other_vegetables} 0.001423488 0.4827586 0.002948653 2.4949716 14
## [5041] {frozen_vegetables,
## salty_snack} => {whole_milk} 0.001423488 0.4827586 0.002948653 1.8893478 14
## [5042] {beef,
## salty_snack} => {whole_milk} 0.001220132 0.4615385 0.002643620 1.8062996 12
## [5043] {curd,
## salty_snack} => {whipped/sour_cream} 0.001321810 0.4333333 0.003050330 6.0451537 13
## [5044] {salty_snack,
## whipped/sour_cream} => {curd} 0.001321810 0.2549020 0.005185562 4.7842763 13
## [5045] {curd,
## salty_snack} => {pastry} 0.001016777 0.3333333 0.003050330 3.7466667 10
## [5046] {curd,
## salty_snack} => {yogurt} 0.001118454 0.3666667 0.003050330 2.6284014 11
## [5047] {curd,
## salty_snack} => {other_vegetables} 0.001728521 0.5666667 0.003050330 2.9286215 17
## [5048] {curd,
## salty_snack} => {whole_milk} 0.001626843 0.5333333 0.003050330 2.0872795 16
## [5049] {napkins,
## salty_snack} => {pastry} 0.001016777 0.2500000 0.004067107 2.8100000 10
## [5050] {napkins,
## salty_snack} => {citrus_fruit} 0.001016777 0.2500000 0.004067107 3.0205774 10
## [5051] {citrus_fruit,
## salty_snack} => {napkins} 0.001016777 0.2777778 0.003660397 5.3047465 10
## [5052] {napkins,
## salty_snack} => {sausage} 0.001016777 0.2500000 0.004067107 2.6609848 10
## [5053] {napkins,
## salty_snack} => {soda} 0.001321810 0.3250000 0.004067107 1.8637755 13
## [5054] {napkins,
## salty_snack} => {yogurt} 0.001118454 0.2750000 0.004067107 1.9713010 11
## [5055] {napkins,
## salty_snack} => {other_vegetables} 0.001525165 0.3750000 0.004067107 1.9380583 15
## [5056] {napkins,
## salty_snack} => {whole_milk} 0.001321810 0.3250000 0.004067107 1.2719359 13
## [5057] {pork,
## salty_snack} => {whipped/sour_cream} 0.001118454 0.3437500 0.003253686 4.7954344 11
## [5058] {salty_snack,
## whipped/sour_cream} => {pork} 0.001118454 0.2156863 0.005185562 3.7412249 11
## [5059] {pork,
## salty_snack} => {other_vegetables} 0.001321810 0.4062500 0.003253686 2.0995632 13
## [5060] {frankfurter,
## salty_snack} => {whipped/sour_cream} 0.001016777 0.3225806 0.003152008 4.5001144 10
## [5061] {frankfurter,
## salty_snack} => {tropical_fruit} 0.001118454 0.3548387 0.003152008 3.3816267 11
## [5062] {salty_snack,
## tropical_fruit} => {frankfurter} 0.001118454 0.2000000 0.005592272 3.3913793 11
## [5063] {frankfurter,
## salty_snack} => {soda} 0.001118454 0.3548387 0.003152008 2.0348914 11
## [5064] {frankfurter,
## salty_snack} => {other_vegetables} 0.001423488 0.4516129 0.003152008 2.3340057 14
## [5065] {frankfurter,
## salty_snack} => {whole_milk} 0.001423488 0.4516129 0.003152008 1.7674544 14
## [5066] {bottled_beer,
## salty_snack} => {fruit/vegetable_juice} 0.001016777 0.3225806 0.003152008 4.4621387 10
## [5067] {bottled_beer,
## salty_snack} => {soda} 0.001321810 0.4193548 0.003152008 2.4048716 13
## [5068] {bottled_beer,
## salty_snack} => {yogurt} 0.001423488 0.4516129 0.003152008 3.2373272 14
## [5069] {salty_snack,
## yogurt} => {bottled_beer} 0.001423488 0.2295082 0.006202339 2.8500166 14
## [5070] {bottled_beer,
## salty_snack} => {whole_milk} 0.001118454 0.3548387 0.003152008 1.3887142 11
## [5071] {brown_bread,
## salty_snack} => {shopping_bags} 0.001016777 0.4166667 0.002440264 4.2290162 10
## [5072] {brown_bread,
## salty_snack} => {soda} 0.001016777 0.4166667 0.002440264 2.3894558 10
## [5073] {brown_bread,
## salty_snack} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [5074] {brown_bread,
## salty_snack} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [5075] {margarine,
## salty_snack} => {soda} 0.001118454 0.3793103 0.002948653 2.1752287 11
## [5076] {margarine,
## salty_snack} => {yogurt} 0.001220132 0.4137931 0.002948653 2.9662210 12
## [5077] {margarine,
## salty_snack} => {other_vegetables} 0.001321810 0.4482759 0.002948653 2.3167594 13
## [5078] {margarine,
## salty_snack} => {whole_milk} 0.001016777 0.3448276 0.002948653 1.3495341 10
## [5079] {butter,
## salty_snack} => {whipped/sour_cream} 0.001220132 0.4137931 0.002948653 5.7725605 12
## [5080] {salty_snack,
## whipped/sour_cream} => {butter} 0.001220132 0.2352941 0.005185562 4.2460874 12
## [5081] {butter,
## salty_snack} => {sausage} 0.001016777 0.3448276 0.002948653 3.6703239 10
## [5082] {butter,
## salty_snack} => {root_vegetables} 0.001118454 0.3793103 0.002948653 3.4799601 11
## [5083] {root_vegetables,
## salty_snack} => {butter} 0.001118454 0.2244898 0.004982206 4.0511140 11
## [5084] {butter,
## salty_snack} => {other_vegetables} 0.001423488 0.4827586 0.002948653 2.4949716 14
## [5085] {butter,
## salty_snack} => {whole_milk} 0.001423488 0.4827586 0.002948653 1.8893478 14
## [5086] {newspapers,
## salty_snack} => {soda} 0.001118454 0.3793103 0.002948653 2.1752287 11
## [5087] {newspapers,
## salty_snack} => {other_vegetables} 0.001118454 0.3793103 0.002948653 1.9603349 11
## [5088] {newspapers,
## salty_snack} => {whole_milk} 0.001016777 0.3448276 0.002948653 1.3495341 10
## [5089] {domestic_eggs,
## salty_snack} => {whipped/sour_cream} 0.001016777 0.2857143 0.003558719 3.9858156 10
## [5090] {domestic_eggs,
## salty_snack} => {shopping_bags} 0.001016777 0.2857143 0.003558719 2.8998968 10
## [5091] {domestic_eggs,
## salty_snack} => {yogurt} 0.001016777 0.2857143 0.003558719 2.0481050 10
## [5092] {domestic_eggs,
## salty_snack} => {other_vegetables} 0.001321810 0.3714286 0.003558719 1.9196006 13
## [5093] {domestic_eggs,
## salty_snack} => {whole_milk} 0.001830198 0.5142857 0.003558719 2.0127338 18
## [5094] {fruit/vegetable_juice,
## salty_snack} => {whipped/sour_cream} 0.001728521 0.2881356 0.005998983 4.0195937 17
## [5095] {salty_snack,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001728521 0.3333333 0.005185562 4.6108767 17
## [5096] {fruit/vegetable_juice,
## salty_snack} => {pip_fruit} 0.001423488 0.2372881 0.005998983 3.1367323 14
## [5097] {pip_fruit,
## salty_snack} => {fruit/vegetable_juice} 0.001423488 0.3500000 0.004067107 4.8414205 14
## [5098] {fruit/vegetable_juice,
## salty_snack} => {pastry} 0.001220132 0.2033898 0.005998983 2.2861017 12
## [5099] {pastry,
## salty_snack} => {fruit/vegetable_juice} 0.001220132 0.2352941 0.005185562 3.2547365 12
## [5100] {fruit/vegetable_juice,
## salty_snack} => {shopping_bags} 0.001321810 0.2203390 0.005998983 2.2363611 13
## [5101] {salty_snack,
## shopping_bags} => {fruit/vegetable_juice} 0.001321810 0.2203390 0.005998983 3.0478676 13
## [5102] {fruit/vegetable_juice,
## salty_snack} => {sausage} 0.001321810 0.2203390 0.005998983 2.3452748 13
## [5103] {salty_snack,
## sausage} => {fruit/vegetable_juice} 0.001321810 0.2500000 0.005287239 3.4581575 13
## [5104] {fruit/vegetable_juice,
## salty_snack} => {bottled_water} 0.001525165 0.2542373 0.005998983 2.3002978 15
## [5105] {bottled_water,
## salty_snack} => {fruit/vegetable_juice} 0.001525165 0.3488372 0.004372140 4.8253361 15
## [5106] {fruit/vegetable_juice,
## salty_snack} => {tropical_fruit} 0.001220132 0.2033898 0.005998983 1.9383130 12
## [5107] {salty_snack,
## tropical_fruit} => {fruit/vegetable_juice} 0.001220132 0.2181818 0.005592272 3.0180284 12
## [5108] {fruit/vegetable_juice,
## salty_snack} => {soda} 0.002236909 0.3728814 0.005998983 2.1383604 22
## [5109] {salty_snack,
## soda} => {fruit/vegetable_juice} 0.002236909 0.2391304 0.009354347 3.3078028 22
## [5110] {fruit/vegetable_juice,
## salty_snack} => {yogurt} 0.002236909 0.3728814 0.005998983 2.6729505 22
## [5111] {salty_snack,
## yogurt} => {fruit/vegetable_juice} 0.002236909 0.3606557 0.006202339 4.9888174 22
## [5112] {fruit/vegetable_juice,
## salty_snack} => {other_vegetables} 0.002236909 0.3728814 0.005998983 1.9271088 22
## [5113] {other_vegetables,
## salty_snack} => {fruit/vegetable_juice} 0.002236909 0.2075472 0.010777834 2.8709232 22
## [5114] {fruit/vegetable_juice,
## salty_snack} => {whole_milk} 0.002440264 0.4067797 0.005998983 1.5919928 24
## [5115] {salty_snack,
## whole_milk} => {fruit/vegetable_juice} 0.002440264 0.2181818 0.011184545 3.0180284 24
## [5116] {salty_snack,
## whipped/sour_cream} => {pip_fruit} 0.001321810 0.2549020 0.005185562 3.3695709 13
## [5117] {pip_fruit,
## salty_snack} => {whipped/sour_cream} 0.001321810 0.3250000 0.004067107 4.5338652 13
## [5118] {salty_snack,
## whipped/sour_cream} => {citrus_fruit} 0.001220132 0.2352941 0.005185562 2.8428964 12
## [5119] {citrus_fruit,
## salty_snack} => {whipped/sour_cream} 0.001220132 0.3333333 0.003660397 4.6501182 12
## [5120] {salty_snack,
## whipped/sour_cream} => {sausage} 0.001118454 0.2156863 0.005185562 2.2957516 11
## [5121] {salty_snack,
## sausage} => {whipped/sour_cream} 0.001118454 0.2115385 0.005287239 2.9510366 11
## [5122] {salty_snack,
## whipped/sour_cream} => {tropical_fruit} 0.001525165 0.2941176 0.005185562 2.8029526 15
## [5123] {salty_snack,
## tropical_fruit} => {whipped/sour_cream} 0.001525165 0.2727273 0.005592272 3.8046422 15
## [5124] {salty_snack,
## whipped/sour_cream} => {root_vegetables} 0.001118454 0.2156863 0.005185562 1.9788008 11
## [5125] {root_vegetables,
## salty_snack} => {whipped/sour_cream} 0.001118454 0.2244898 0.004982206 3.1317123 11
## [5126] {salty_snack,
## whipped/sour_cream} => {soda} 0.001118454 0.2156863 0.005185562 1.2368948 11
## [5127] {salty_snack,
## whipped/sour_cream} => {yogurt} 0.001626843 0.3137255 0.005185562 2.2488996 16
## [5128] {salty_snack,
## yogurt} => {whipped/sour_cream} 0.001626843 0.2622951 0.006202339 3.6591094 16
## [5129] {salty_snack,
## whipped/sour_cream} => {other_vegetables} 0.002745297 0.5294118 0.005185562 2.7360823 27
## [5130] {other_vegetables,
## salty_snack} => {whipped/sour_cream} 0.002745297 0.2547170 0.010777834 3.5533922 27
## [5131] {salty_snack,
## whipped/sour_cream} => {whole_milk} 0.002745297 0.5294118 0.005185562 2.0719318 27
## [5132] {salty_snack,
## whole_milk} => {whipped/sour_cream} 0.002745297 0.2454545 0.011184545 3.4241779 27
## [5133] {pip_fruit,
## salty_snack} => {pastry} 0.001321810 0.3250000 0.004067107 3.6530000 13
## [5134] {pastry,
## salty_snack} => {pip_fruit} 0.001321810 0.2549020 0.005185562 3.3695709 13
## [5135] {pip_fruit,
## salty_snack} => {citrus_fruit} 0.001016777 0.2500000 0.004067107 3.0205774 10
## [5136] {citrus_fruit,
## salty_snack} => {pip_fruit} 0.001016777 0.2777778 0.003660397 3.6719683 10
## [5137] {pip_fruit,
## salty_snack} => {shopping_bags} 0.001118454 0.2750000 0.004067107 2.7911507 11
## [5138] {pip_fruit,
## salty_snack} => {tropical_fruit} 0.001525165 0.3750000 0.004067107 3.5737645 15
## [5139] {salty_snack,
## tropical_fruit} => {pip_fruit} 0.001525165 0.2727273 0.005592272 3.6052053 15
## [5140] {pip_fruit,
## salty_snack} => {soda} 0.001220132 0.3000000 0.004067107 1.7204082 12
## [5141] {pip_fruit,
## salty_snack} => {yogurt} 0.001321810 0.3250000 0.004067107 2.3297194 13
## [5142] {salty_snack,
## yogurt} => {pip_fruit} 0.001321810 0.2131148 0.006202339 2.8171823 13
## [5143] {pip_fruit,
## salty_snack} => {other_vegetables} 0.001931876 0.4750000 0.004067107 2.4548739 19
## [5144] {pip_fruit,
## salty_snack} => {whole_milk} 0.002135231 0.5250000 0.004067107 2.0546657 21
## [5145] {pastry,
## salty_snack} => {shopping_bags} 0.001525165 0.2941176 0.005185562 2.9851879 15
## [5146] {salty_snack,
## shopping_bags} => {pastry} 0.001525165 0.2542373 0.005998983 2.8576271 15
## [5147] {pastry,
## salty_snack} => {soda} 0.002236909 0.4313725 0.005185562 2.4737895 22
## [5148] {salty_snack,
## soda} => {pastry} 0.002236909 0.2391304 0.009354347 2.6878261 22
## [5149] {pastry,
## salty_snack} => {other_vegetables} 0.001728521 0.3333333 0.005185562 1.7227185 17
## [5150] {pastry,
## salty_snack} => {whole_milk} 0.001830198 0.3529412 0.005185562 1.3812879 18
## [5151] {citrus_fruit,
## salty_snack} => {shopping_bags} 0.001016777 0.2777778 0.003660397 2.8193441 10
## [5152] {citrus_fruit,
## salty_snack} => {other_vegetables} 0.001525165 0.4166667 0.003660397 2.1533981 15
## [5153] {citrus_fruit,
## salty_snack} => {whole_milk} 0.001118454 0.3055556 0.003660397 1.1958372 11
## [5154] {salty_snack,
## shopping_bags} => {sausage} 0.001220132 0.2033898 0.005998983 2.1648690 12
## [5155] {salty_snack,
## sausage} => {shopping_bags} 0.001220132 0.2307692 0.005287239 2.3422243 12
## [5156] {salty_snack,
## shopping_bags} => {tropical_fruit} 0.001525165 0.2542373 0.005998983 2.4228912 15
## [5157] {salty_snack,
## tropical_fruit} => {shopping_bags} 0.001525165 0.2727273 0.005592272 2.7680833 15
## [5158] {salty_snack,
## shopping_bags} => {soda} 0.002135231 0.3559322 0.005998983 2.0411622 21
## [5159] {salty_snack,
## soda} => {shopping_bags} 0.002135231 0.2282609 0.009354347 2.3167654 21
## [5160] {salty_snack,
## shopping_bags} => {other_vegetables} 0.002033554 0.3389831 0.005998983 1.7519171 20
## [5161] {salty_snack,
## shopping_bags} => {whole_milk} 0.001830198 0.3050847 0.005998983 1.1939946 18
## [5162] {salty_snack,
## sausage} => {soda} 0.001830198 0.3461538 0.005287239 1.9850863 18
## [5163] {rolls/buns,
## salty_snack} => {sausage} 0.001016777 0.2040816 0.004982206 2.1722325 10
## [5164] {salty_snack,
## sausage} => {other_vegetables} 0.001728521 0.3269231 0.005287239 1.6895893 17
## [5165] {salty_snack,
## sausage} => {whole_milk} 0.001931876 0.3653846 0.005287239 1.4299871 19
## [5166] {bottled_water,
## salty_snack} => {tropical_fruit} 0.001423488 0.3255814 0.004372140 3.1028033 14
## [5167] {salty_snack,
## tropical_fruit} => {bottled_water} 0.001423488 0.2545455 0.005592272 2.3030861 14
## [5168] {bottled_water,
## salty_snack} => {soda} 0.001931876 0.4418605 0.004372140 2.5339345 19
## [5169] {salty_snack,
## soda} => {bottled_water} 0.001931876 0.2065217 0.009354347 1.8685753 19
## [5170] {bottled_water,
## salty_snack} => {yogurt} 0.001321810 0.3023256 0.004372140 2.1671808 13
## [5171] {salty_snack,
## yogurt} => {bottled_water} 0.001321810 0.2131148 0.006202339 1.9282278 13
## [5172] {bottled_water,
## salty_snack} => {other_vegetables} 0.001626843 0.3720930 0.004372140 1.9230346 16
## [5173] {bottled_water,
## salty_snack} => {whole_milk} 0.002135231 0.4883721 0.004372140 1.9113170 21
## [5174] {salty_snack,
## tropical_fruit} => {root_vegetables} 0.001525165 0.2727273 0.005592272 2.5021201 15
## [5175] {root_vegetables,
## salty_snack} => {tropical_fruit} 0.001525165 0.3061224 0.004982206 2.9173588 15
## [5176] {salty_snack,
## tropical_fruit} => {soda} 0.001830198 0.3272727 0.005592272 1.8768089 18
## [5177] {salty_snack,
## tropical_fruit} => {yogurt} 0.001626843 0.2909091 0.005592272 2.0853432 16
## [5178] {salty_snack,
## yogurt} => {tropical_fruit} 0.001626843 0.2622951 0.006202339 2.4996823 16
## [5179] {salty_snack,
## tropical_fruit} => {rolls/buns} 0.001220132 0.2181818 0.005592272 1.1861903 12
## [5180] {rolls/buns,
## salty_snack} => {tropical_fruit} 0.001220132 0.2448980 0.004982206 2.3338870 12
## [5181] {salty_snack,
## tropical_fruit} => {other_vegetables} 0.002846975 0.5090909 0.005592272 2.6310610 28
## [5182] {other_vegetables,
## salty_snack} => {tropical_fruit} 0.002846975 0.2641509 0.010777834 2.5173687 28
## [5183] {salty_snack,
## tropical_fruit} => {whole_milk} 0.002541942 0.4545455 0.005592272 1.7789314 25
## [5184] {salty_snack,
## whole_milk} => {tropical_fruit} 0.002541942 0.2272727 0.011184545 2.1659179 25
## [5185] {root_vegetables,
## salty_snack} => {soda} 0.001423488 0.2857143 0.004982206 1.6384840 14
## [5186] {root_vegetables,
## salty_snack} => {yogurt} 0.001423488 0.2857143 0.004982206 2.0481050 14
## [5187] {salty_snack,
## yogurt} => {root_vegetables} 0.001423488 0.2295082 0.006202339 2.1056092 14
## [5188] {root_vegetables,
## salty_snack} => {other_vegetables} 0.002846975 0.5714286 0.004982206 2.9532317 28
## [5189] {other_vegetables,
## salty_snack} => {root_vegetables} 0.002846975 0.2641509 0.010777834 2.4234371 28
## [5190] {root_vegetables,
## salty_snack} => {whole_milk} 0.002033554 0.4081633 0.004982206 1.5974078 20
## [5191] {salty_snack,
## yogurt} => {soda} 0.001525165 0.2459016 0.006202339 1.4101706 15
## [5192] {rolls/buns,
## salty_snack} => {soda} 0.001423488 0.2857143 0.004982206 1.6384840 14
## [5193] {salty_snack,
## soda} => {other_vegetables} 0.002643620 0.2826087 0.009354347 1.4605657 26
## [5194] {other_vegetables,
## salty_snack} => {soda} 0.002643620 0.2452830 0.010777834 1.4066230 26
## [5195] {salty_snack,
## soda} => {whole_milk} 0.002745297 0.2934783 0.009354347 1.1485709 27
## [5196] {salty_snack,
## whole_milk} => {soda} 0.002745297 0.2454545 0.011184545 1.4076067 27
## [5197] {salty_snack,
## yogurt} => {other_vegetables} 0.002745297 0.4426230 0.006202339 2.2875443 27
## [5198] {other_vegetables,
## salty_snack} => {yogurt} 0.002745297 0.2547170 0.010777834 1.8259049 27
## [5199] {salty_snack,
## yogurt} => {whole_milk} 0.002541942 0.4098361 0.006202339 1.6039545 25
## [5200] {salty_snack,
## whole_milk} => {yogurt} 0.002541942 0.2272727 0.011184545 1.6291744 25
## [5201] {rolls/buns,
## salty_snack} => {other_vegetables} 0.001626843 0.3265306 0.004982206 1.6875610 16
## [5202] {rolls/buns,
## salty_snack} => {whole_milk} 0.001830198 0.3673469 0.004982206 1.4376670 18
## [5203] {other_vegetables,
## salty_snack} => {whole_milk} 0.004880529 0.4528302 0.010777834 1.7722184 48
## [5204] {salty_snack,
## whole_milk} => {other_vegetables} 0.004880529 0.4363636 0.011184545 2.2551951 48
## [5205] {sugar,
## waffles} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [5206] {long_life_bakery_product,
## sugar} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [5207] {cream_cheese_,
## sugar} => {domestic_eggs} 0.001118454 0.4074074 0.002745297 6.4212369 11
## [5208] {domestic_eggs,
## sugar} => {cream_cheese_} 0.001118454 0.2244898 0.004982206 5.6611722 11
## [5209] {cream_cheese_,
## domestic_eggs} => {sugar} 0.001118454 0.2200000 0.005083884 6.4975976 11
## [5210] {cream_cheese_,
## sugar} => {yogurt} 0.001118454 0.4074074 0.002745297 2.9204460 11
## [5211] {cream_cheese_,
## sugar} => {other_vegetables} 0.001626843 0.5925926 0.002745297 3.0626107 16
## [5212] {cream_cheese_,
## sugar} => {whole_milk} 0.002033554 0.7407407 0.002745297 2.8989993 20
## [5213] {chicken,
## sugar} => {other_vegetables} 0.001220132 0.4800000 0.002541942 2.4807147 12
## [5214] {chicken,
## sugar} => {whole_milk} 0.001830198 0.7200000 0.002541942 2.8178273 18
## [5215] {sugar,
## white_bread} => {whole_milk} 0.001728521 0.6071429 0.002846975 2.3761441 17
## [5216] {chocolate,
## sugar} => {whole_milk} 0.001525165 0.6250000 0.002440264 2.4460306 15
## [5217] {coffee,
## sugar} => {shopping_bags} 0.001220132 0.2553191 0.004778851 2.5913971 12
## [5218] {shopping_bags,
## sugar} => {coffee} 0.001220132 0.3428571 0.003558719 5.9054291 12
## [5219] {coffee,
## sugar} => {root_vegetables} 0.001118454 0.2340426 0.004778851 2.1472094 11
## [5220] {coffee,
## sugar} => {soda} 0.001220132 0.2553191 0.004778851 1.4641772 12
## [5221] {coffee,
## sugar} => {other_vegetables} 0.001626843 0.3404255 0.004778851 1.7593721 16
## [5222] {coffee,
## sugar} => {whole_milk} 0.002033554 0.4255319 0.004778851 1.6653826 20
## [5223] {frozen_vegetables,
## sugar} => {rolls/buns} 0.001016777 0.3225806 0.003152008 1.7537759 10
## [5224] {frozen_vegetables,
## sugar} => {other_vegetables} 0.002033554 0.6451613 0.003152008 3.3342939 20
## [5225] {frozen_vegetables,
## sugar} => {whole_milk} 0.001830198 0.5806452 0.003152008 2.2724414 18
## [5226] {beef,
## sugar} => {root_vegetables} 0.001321810 0.4482759 0.002948653 4.1126801 13
## [5227] {root_vegetables,
## sugar} => {beef} 0.001321810 0.2063492 0.006405694 3.9330319 13
## [5228] {beef,
## sugar} => {rolls/buns} 0.001016777 0.3448276 0.002948653 1.8747260 10
## [5229] {beef,
## sugar} => {other_vegetables} 0.001728521 0.5862069 0.002948653 3.0296084 17
## [5230] {beef,
## sugar} => {whole_milk} 0.001423488 0.4827586 0.002948653 1.8893478 14
## [5231] {curd,
## sugar} => {margarine} 0.001118454 0.3235294 0.003457041 5.5241524 11
## [5232] {margarine,
## sugar} => {curd} 0.001118454 0.2037037 0.005490595 3.8233319 11
## [5233] {curd,
## sugar} => {domestic_eggs} 0.001016777 0.2941176 0.003457041 4.6356523 10
## [5234] {domestic_eggs,
## sugar} => {curd} 0.001016777 0.2040816 0.004982206 3.8304253 10
## [5235] {curd,
## sugar} => {whipped/sour_cream} 0.001423488 0.4117647 0.003457041 5.7442637 14
## [5236] {sugar,
## whipped/sour_cream} => {curd} 0.001423488 0.2916667 0.004880529 5.4743162 14
## [5237] {curd,
## sugar} => {yogurt} 0.001626843 0.4705882 0.003457041 3.3733493 16
## [5238] {sugar,
## yogurt} => {curd} 0.001626843 0.2352941 0.006914082 4.4162551 16
## [5239] {curd,
## sugar} => {other_vegetables} 0.001525165 0.4411765 0.003457041 2.2800686 15
## [5240] {curd,
## sugar} => {whole_milk} 0.002338587 0.6764706 0.003457041 2.6474685 23
## [5241] {napkins,
## sugar} => {fruit/vegetable_juice} 0.001118454 0.3333333 0.003355363 4.6108767 11
## [5242] {fruit/vegetable_juice,
## sugar} => {napkins} 0.001118454 0.2340426 0.004778851 4.4695311 11
## [5243] {napkins,
## sugar} => {whipped/sour_cream} 0.001016777 0.3030303 0.003355363 4.2273802 10
## [5244] {sugar,
## whipped/sour_cream} => {napkins} 0.001016777 0.2083333 0.004880529 3.9785599 10
## [5245] {napkins,
## sugar} => {root_vegetables} 0.001118454 0.3333333 0.003355363 3.0581468 11
## [5246] {napkins,
## sugar} => {soda} 0.001118454 0.3333333 0.003355363 1.9115646 11
## [5247] {napkins,
## sugar} => {yogurt} 0.001321810 0.3939394 0.003355363 2.8239023 13
## [5248] {napkins,
## sugar} => {other_vegetables} 0.001423488 0.4242424 0.003355363 2.1925508 14
## [5249] {napkins,
## sugar} => {whole_milk} 0.002033554 0.6060606 0.003355363 2.3719085 20
## [5250] {pork,
## sugar} => {whipped/sour_cream} 0.001423488 0.3181818 0.004473818 4.4387492 14
## [5251] {sugar,
## whipped/sour_cream} => {pork} 0.001423488 0.2916667 0.004880529 5.0591564 14
## [5252] {pork,
## sugar} => {pastry} 0.001118454 0.2500000 0.004473818 2.8100000 11
## [5253] {pastry,
## sugar} => {pork} 0.001118454 0.2156863 0.005185562 3.7412249 11
## [5254] {pork,
## sugar} => {root_vegetables} 0.001118454 0.2500000 0.004473818 2.2936101 11
## [5255] {pork,
## sugar} => {soda} 0.001016777 0.2272727 0.004473818 1.3033395 10
## [5256] {pork,
## sugar} => {yogurt} 0.001118454 0.2500000 0.004473818 1.7920918 11
## [5257] {pork,
## sugar} => {rolls/buns} 0.001220132 0.2727273 0.004473818 1.4827378 12
## [5258] {pork,
## sugar} => {other_vegetables} 0.002236909 0.5000000 0.004473818 2.5840778 22
## [5259] {other_vegetables,
## sugar} => {pork} 0.002236909 0.2075472 0.010777834 3.6000466 22
## [5260] {pork,
## sugar} => {whole_milk} 0.002643620 0.5909091 0.004473818 2.3126108 26
## [5261] {frankfurter,
## sugar} => {tropical_fruit} 0.001118454 0.2972973 0.003762074 2.8332548 11
## [5262] {sugar,
## tropical_fruit} => {frankfurter} 0.001118454 0.2340426 0.004778851 3.9686354 11
## [5263] {frankfurter,
## sugar} => {yogurt} 0.001016777 0.2702703 0.003762074 1.9373966 10
## [5264] {frankfurter,
## sugar} => {rolls/buns} 0.001220132 0.3243243 0.003762074 1.7632558 12
## [5265] {frankfurter,
## sugar} => {other_vegetables} 0.001423488 0.3783784 0.003762074 1.9555183 14
## [5266] {frankfurter,
## sugar} => {whole_milk} 0.002135231 0.5675676 0.003762074 2.2212603 21
## [5267] {bottled_beer,
## sugar} => {bottled_water} 0.001220132 0.3529412 0.003457041 3.1933546 12
## [5268] {bottled_water,
## sugar} => {bottled_beer} 0.001220132 0.2553191 0.004778851 3.1705351 12
## [5269] {bottled_beer,
## sugar} => {root_vegetables} 0.001016777 0.2941176 0.003457041 2.6983648 10
## [5270] {bottled_beer,
## sugar} => {soda} 0.001321810 0.3823529 0.003457041 2.1926771 13
## [5271] {bottled_beer,
## sugar} => {other_vegetables} 0.001525165 0.4411765 0.003457041 2.2800686 15
## [5272] {bottled_beer,
## sugar} => {whole_milk} 0.001830198 0.5294118 0.003457041 2.0719318 18
## [5273] {brown_bread,
## sugar} => {soda} 0.001016777 0.3030303 0.003355363 1.7377860 10
## [5274] {brown_bread,
## sugar} => {whole_milk} 0.001626843 0.4848485 0.003355363 1.8975268 16
## [5275] {newspapers,
## sugar} => {margarine} 0.001016777 0.3225806 0.003152008 5.5079525 10
## [5276] {margarine,
## sugar} => {pastry} 0.001118454 0.2037037 0.005490595 2.2896296 11
## [5277] {pastry,
## sugar} => {margarine} 0.001118454 0.2156863 0.005185562 3.6827682 11
## [5278] {margarine,
## sugar} => {citrus_fruit} 0.001525165 0.2777778 0.005490595 3.3561971 15
## [5279] {citrus_fruit,
## sugar} => {margarine} 0.001525165 0.3191489 0.004778851 5.4493573 15
## [5280] {margarine,
## sugar} => {bottled_water} 0.001423488 0.2592593 0.005490595 2.3457358 14
## [5281] {bottled_water,
## sugar} => {margarine} 0.001423488 0.2978723 0.004778851 5.0860668 14
## [5282] {margarine,
## sugar} => {tropical_fruit} 0.001423488 0.2592593 0.005490595 2.4707508 14
## [5283] {sugar,
## tropical_fruit} => {margarine} 0.001423488 0.2978723 0.004778851 5.0860668 14
## [5284] {margarine,
## sugar} => {root_vegetables} 0.001525165 0.2777778 0.005490595 2.5484556 15
## [5285] {root_vegetables,
## sugar} => {margarine} 0.001525165 0.2380952 0.006405694 4.0653935 15
## [5286] {margarine,
## sugar} => {yogurt} 0.001830198 0.3333333 0.005490595 2.3894558 18
## [5287] {sugar,
## yogurt} => {margarine} 0.001830198 0.2647059 0.006914082 4.5197610 18
## [5288] {margarine,
## sugar} => {rolls/buns} 0.001118454 0.2037037 0.005490595 1.1074770 11
## [5289] {margarine,
## sugar} => {other_vegetables} 0.002135231 0.3888889 0.005490595 2.0098383 21
## [5290] {margarine,
## sugar} => {whole_milk} 0.002440264 0.4444444 0.005490595 1.7393996 24
## [5291] {butter,
## sugar} => {whipped/sour_cream} 0.001220132 0.3870968 0.003152008 5.4001373 12
## [5292] {sugar,
## whipped/sour_cream} => {butter} 0.001220132 0.2500000 0.004880529 4.5114679 12
## [5293] {butter,
## sugar} => {root_vegetables} 0.001016777 0.3225806 0.003152008 2.9594969 10
## [5294] {butter,
## sugar} => {other_vegetables} 0.001423488 0.4516129 0.003152008 2.3340057 14
## [5295] {butter,
## sugar} => {whole_milk} 0.002135231 0.6774194 0.003152008 2.6511816 21
## [5296] {newspapers,
## sugar} => {other_vegetables} 0.001016777 0.3225806 0.003152008 1.6671469 10
## [5297] {domestic_eggs,
## sugar} => {whipped/sour_cream} 0.001321810 0.2653061 0.004982206 3.7011145 13
## [5298] {sugar,
## whipped/sour_cream} => {domestic_eggs} 0.001321810 0.2708333 0.004880529 4.2686632 13
## [5299] {domestic_eggs,
## sugar} => {citrus_fruit} 0.001525165 0.3061224 0.004982206 3.6986662 15
## [5300] {citrus_fruit,
## sugar} => {domestic_eggs} 0.001525165 0.3191489 0.004778851 5.0301759 15
## [5301] {domestic_eggs,
## sugar} => {sausage} 0.001016777 0.2040816 0.004982206 2.1722325 10
## [5302] {sausage,
## sugar} => {domestic_eggs} 0.001016777 0.2777778 0.003660397 4.3781161 10
## [5303] {domestic_eggs,
## sugar} => {tropical_fruit} 0.001220132 0.2448980 0.004982206 2.3338870 12
## [5304] {sugar,
## tropical_fruit} => {domestic_eggs} 0.001220132 0.2553191 0.004778851 4.0241408 12
## [5305] {domestic_eggs,
## sugar} => {root_vegetables} 0.001016777 0.2040816 0.004982206 1.8723348 10
## [5306] {domestic_eggs,
## sugar} => {yogurt} 0.001525165 0.3061224 0.004982206 2.1943982 15
## [5307] {sugar,
## yogurt} => {domestic_eggs} 0.001525165 0.2205882 0.006914082 3.4767393 15
## [5308] {domestic_eggs,
## sugar} => {other_vegetables} 0.002338587 0.4693878 0.004982206 2.4258689 23
## [5309] {other_vegetables,
## sugar} => {domestic_eggs} 0.002338587 0.2169811 0.010777834 3.4198869 23
## [5310] {domestic_eggs,
## sugar} => {whole_milk} 0.003558719 0.7142857 0.004982206 2.7954636 35
## [5311] {sugar,
## whole_milk} => {domestic_eggs} 0.003558719 0.2364865 0.015048297 3.7273151 35
## [5312] {fruit/vegetable_juice,
## sugar} => {pip_fruit} 0.001016777 0.2127660 0.004778851 2.8125715 10
## [5313] {pip_fruit,
## sugar} => {fruit/vegetable_juice} 0.001016777 0.2127660 0.004778851 2.9431128 10
## [5314] {fruit/vegetable_juice,
## sugar} => {sausage} 0.001016777 0.2127660 0.004778851 2.2646680 10
## [5315] {sausage,
## sugar} => {fruit/vegetable_juice} 0.001016777 0.2777778 0.003660397 3.8423972 10
## [5316] {fruit/vegetable_juice,
## sugar} => {bottled_water} 0.001321810 0.2765957 0.004778851 2.5025935 13
## [5317] {bottled_water,
## sugar} => {fruit/vegetable_juice} 0.001321810 0.2765957 0.004778851 3.8260466 13
## [5318] {fruit/vegetable_juice,
## sugar} => {root_vegetables} 0.001423488 0.2978723 0.004778851 2.7328120 14
## [5319] {root_vegetables,
## sugar} => {fruit/vegetable_juice} 0.001423488 0.2222222 0.006405694 3.0739178 14
## [5320] {fruit/vegetable_juice,
## sugar} => {soda} 0.001728521 0.3617021 0.004778851 2.0742510 17
## [5321] {soda,
## sugar} => {fruit/vegetable_juice} 0.001728521 0.2361111 0.007320793 3.2660377 17
## [5322] {fruit/vegetable_juice,
## sugar} => {yogurt} 0.001728521 0.3617021 0.004778851 2.5928137 17
## [5323] {sugar,
## yogurt} => {fruit/vegetable_juice} 0.001728521 0.2500000 0.006914082 3.4581575 17
## [5324] {fruit/vegetable_juice,
## sugar} => {other_vegetables} 0.002033554 0.4255319 0.004778851 2.1992151 20
## [5325] {fruit/vegetable_juice,
## sugar} => {whole_milk} 0.002236909 0.4680851 0.004778851 1.8319208 22
## [5326] {sugar,
## whipped/sour_cream} => {citrus_fruit} 0.001321810 0.2708333 0.004880529 3.2722922 13
## [5327] {citrus_fruit,
## sugar} => {whipped/sour_cream} 0.001321810 0.2765957 0.004778851 3.8586087 13
## [5328] {sugar,
## whipped/sour_cream} => {tropical_fruit} 0.001321810 0.2708333 0.004880529 2.5810522 13
## [5329] {sugar,
## tropical_fruit} => {whipped/sour_cream} 0.001321810 0.2765957 0.004778851 3.8586087 13
## [5330] {sugar,
## whipped/sour_cream} => {root_vegetables} 0.001321810 0.2708333 0.004880529 2.4847442 13
## [5331] {root_vegetables,
## sugar} => {whipped/sour_cream} 0.001321810 0.2063492 0.006405694 2.8786446 13
## [5332] {sugar,
## whipped/sour_cream} => {yogurt} 0.002135231 0.4375000 0.004880529 3.1361607 21
## [5333] {sugar,
## yogurt} => {whipped/sour_cream} 0.002135231 0.3088235 0.006914082 4.3081977 21
## [5334] {sugar,
## whipped/sour_cream} => {rolls/buns} 0.001423488 0.2916667 0.004880529 1.5857057 14
## [5335] {rolls/buns,
## sugar} => {whipped/sour_cream} 0.001423488 0.2028986 0.007015760 2.8305067 14
## [5336] {sugar,
## whipped/sour_cream} => {other_vegetables} 0.002643620 0.5416667 0.004880529 2.7994176 26
## [5337] {other_vegetables,
## sugar} => {whipped/sour_cream} 0.002643620 0.2452830 0.010777834 3.4217851 26
## [5338] {sugar,
## whipped/sour_cream} => {whole_milk} 0.003152008 0.6458333 0.004880529 2.5275650 31
## [5339] {sugar,
## whole_milk} => {whipped/sour_cream} 0.003152008 0.2094595 0.015048297 2.9220337 31
## [5340] {pip_fruit,
## sugar} => {tropical_fruit} 0.001626843 0.3404255 0.004778851 3.2442685 16
## [5341] {sugar,
## tropical_fruit} => {pip_fruit} 0.001626843 0.3404255 0.004778851 4.5001144 16
## [5342] {pip_fruit,
## sugar} => {root_vegetables} 0.001321810 0.2765957 0.004778851 2.5376111 13
## [5343] {root_vegetables,
## sugar} => {pip_fruit} 0.001321810 0.2063492 0.006405694 2.7277479 13
## [5344] {pip_fruit,
## sugar} => {soda} 0.001118454 0.2340426 0.004778851 1.3421624 11
## [5345] {pip_fruit,
## sugar} => {yogurt} 0.001728521 0.3617021 0.004778851 2.5928137 17
## [5346] {sugar,
## yogurt} => {pip_fruit} 0.001728521 0.2500000 0.006914082 3.3047715 17
## [5347] {pip_fruit,
## sugar} => {other_vegetables} 0.002440264 0.5106383 0.004778851 2.6390582 24
## [5348] {other_vegetables,
## sugar} => {pip_fruit} 0.002440264 0.2264151 0.010777834 2.9930006 24
## [5349] {pip_fruit,
## sugar} => {whole_milk} 0.002541942 0.5319149 0.004778851 2.0817282 25
## [5350] {pastry,
## sugar} => {soda} 0.001626843 0.3137255 0.005185562 1.7991196 16
## [5351] {soda,
## sugar} => {pastry} 0.001626843 0.2222222 0.007320793 2.4977778 16
## [5352] {pastry,
## sugar} => {other_vegetables} 0.001830198 0.3529412 0.005185562 1.8240549 18
## [5353] {pastry,
## sugar} => {whole_milk} 0.002643620 0.5098039 0.005185562 1.9951936 26
## [5354] {citrus_fruit,
## sugar} => {tropical_fruit} 0.001016777 0.2127660 0.004778851 2.0276678 10
## [5355] {sugar,
## tropical_fruit} => {citrus_fruit} 0.001016777 0.2127660 0.004778851 2.5707042 10
## [5356] {citrus_fruit,
## sugar} => {root_vegetables} 0.001118454 0.2340426 0.004778851 2.1472094 11
## [5357] {citrus_fruit,
## sugar} => {soda} 0.001321810 0.2765957 0.004778851 1.5861919 13
## [5358] {citrus_fruit,
## sugar} => {yogurt} 0.001321810 0.2765957 0.004778851 1.9827399 13
## [5359] {citrus_fruit,
## sugar} => {rolls/buns} 0.001118454 0.2340426 0.004778851 1.2724204 11
## [5360] {citrus_fruit,
## sugar} => {other_vegetables} 0.002440264 0.5106383 0.004778851 2.6390582 24
## [5361] {other_vegetables,
## sugar} => {citrus_fruit} 0.002440264 0.2264151 0.010777834 2.7356173 24
## [5362] {citrus_fruit,
## sugar} => {whole_milk} 0.002745297 0.5744681 0.004778851 2.2482665 27
## [5363] {shopping_bags,
## sugar} => {soda} 0.001220132 0.3428571 0.003558719 1.9661808 12
## [5364] {shopping_bags,
## sugar} => {other_vegetables} 0.001118454 0.3142857 0.003558719 1.6242775 11
## [5365] {shopping_bags,
## sugar} => {whole_milk} 0.001321810 0.3714286 0.003558719 1.4536411 13
## [5366] {sausage,
## sugar} => {tropical_fruit} 0.001016777 0.2777778 0.003660397 2.6472330 10
## [5367] {sugar,
## tropical_fruit} => {sausage} 0.001016777 0.2127660 0.004778851 2.2646680 10
## [5368] {sausage,
## sugar} => {rolls/buns} 0.001321810 0.3611111 0.003660397 1.9632547 13
## [5369] {sausage,
## sugar} => {other_vegetables} 0.001220132 0.3333333 0.003660397 1.7227185 12
## [5370] {sausage,
## sugar} => {whole_milk} 0.002135231 0.5833333 0.003660397 2.2829619 21
## [5371] {bottled_water,
## sugar} => {tropical_fruit} 0.001118454 0.2340426 0.004778851 2.2304346 11
## [5372] {sugar,
## tropical_fruit} => {bottled_water} 0.001118454 0.2340426 0.004778851 2.1175791 11
## [5373] {bottled_water,
## sugar} => {root_vegetables} 0.001016777 0.2127660 0.004778851 1.9520086 10
## [5374] {bottled_water,
## sugar} => {soda} 0.001728521 0.3617021 0.004778851 2.0742510 17
## [5375] {soda,
## sugar} => {bottled_water} 0.001728521 0.2361111 0.007320793 2.1362951 17
## [5376] {bottled_water,
## sugar} => {yogurt} 0.001626843 0.3404255 0.004778851 2.4402953 16
## [5377] {sugar,
## yogurt} => {bottled_water} 0.001626843 0.2352941 0.006914082 2.1289031 16
## [5378] {bottled_water,
## sugar} => {rolls/buns} 0.001220132 0.2553191 0.004778851 1.3880950 12
## [5379] {bottled_water,
## sugar} => {other_vegetables} 0.001626843 0.3404255 0.004778851 1.7593721 16
## [5380] {bottled_water,
## sugar} => {whole_milk} 0.002643620 0.5531915 0.004778851 2.1649973 26
## [5381] {sugar,
## tropical_fruit} => {root_vegetables} 0.001321810 0.2765957 0.004778851 2.5376111 13
## [5382] {root_vegetables,
## sugar} => {tropical_fruit} 0.001321810 0.2063492 0.006405694 1.9665159 13
## [5383] {sugar,
## tropical_fruit} => {soda} 0.001016777 0.2127660 0.004778851 1.2201476 10
## [5384] {sugar,
## tropical_fruit} => {yogurt} 0.001728521 0.3617021 0.004778851 2.5928137 17
## [5385] {sugar,
## yogurt} => {tropical_fruit} 0.001728521 0.2500000 0.006914082 2.3825097 17
## [5386] {sugar,
## tropical_fruit} => {rolls/buns} 0.001220132 0.2553191 0.004778851 1.3880950 12
## [5387] {sugar,
## tropical_fruit} => {other_vegetables} 0.001830198 0.3829787 0.004778851 1.9792936 18
## [5388] {sugar,
## tropical_fruit} => {whole_milk} 0.002846975 0.5957447 0.004778851 2.3315356 28
## [5389] {root_vegetables,
## sugar} => {soda} 0.001830198 0.2857143 0.006405694 1.6384840 18
## [5390] {soda,
## sugar} => {root_vegetables} 0.001830198 0.2500000 0.007320793 2.2936101 18
## [5391] {root_vegetables,
## sugar} => {yogurt} 0.002135231 0.3333333 0.006405694 2.3894558 21
## [5392] {sugar,
## yogurt} => {root_vegetables} 0.002135231 0.3088235 0.006914082 2.8332830 21
## [5393] {root_vegetables,
## sugar} => {rolls/buns} 0.001626843 0.2539683 0.006405694 1.3807506 16
## [5394] {rolls/buns,
## sugar} => {root_vegetables} 0.001626843 0.2318841 0.007015760 2.1274064 16
## [5395] {root_vegetables,
## sugar} => {other_vegetables} 0.003457041 0.5396825 0.006405694 2.7891633 34
## [5396] {other_vegetables,
## sugar} => {root_vegetables} 0.003457041 0.3207547 0.010777834 2.9427450 34
## [5397] {root_vegetables,
## sugar} => {whole_milk} 0.003457041 0.5396825 0.006405694 2.1121280 34
## [5398] {sugar,
## whole_milk} => {root_vegetables} 0.003457041 0.2297297 0.015048297 2.1076417 34
## [5399] {soda,
## sugar} => {yogurt} 0.001728521 0.2361111 0.007320793 1.6925312 17
## [5400] {sugar,
## yogurt} => {soda} 0.001728521 0.2500000 0.006914082 1.4336735 17
## [5401] {soda,
## sugar} => {rolls/buns} 0.001728521 0.2361111 0.007320793 1.2836665 17
## [5402] {rolls/buns,
## sugar} => {soda} 0.001728521 0.2463768 0.007015760 1.4128956 17
## [5403] {soda,
## sugar} => {other_vegetables} 0.002846975 0.3888889 0.007320793 2.0098383 28
## [5404] {other_vegetables,
## sugar} => {soda} 0.002846975 0.2641509 0.010777834 1.5148248 28
## [5405] {soda,
## sugar} => {whole_milk} 0.003762074 0.5138889 0.007320793 2.0111807 37
## [5406] {sugar,
## whole_milk} => {soda} 0.003762074 0.2500000 0.015048297 1.4336735 37
## [5407] {sugar,
## yogurt} => {rolls/buns} 0.001423488 0.2058824 0.006914082 1.1193217 14
## [5408] {rolls/buns,
## sugar} => {yogurt} 0.001423488 0.2028986 0.007015760 1.4544513 14
## [5409] {sugar,
## yogurt} => {other_vegetables} 0.002846975 0.4117647 0.006914082 2.1280640 28
## [5410] {other_vegetables,
## sugar} => {yogurt} 0.002846975 0.2641509 0.010777834 1.8935310 28
## [5411] {sugar,
## yogurt} => {whole_milk} 0.003660397 0.5294118 0.006914082 2.0719318 36
## [5412] {sugar,
## whole_milk} => {yogurt} 0.003660397 0.2432432 0.015048297 1.7436569 36
## [5413] {rolls/buns,
## sugar} => {other_vegetables} 0.002846975 0.4057971 0.007015760 2.0972225 28
## [5414] {other_vegetables,
## sugar} => {rolls/buns} 0.002846975 0.2641509 0.010777834 1.4361109 28
## [5415] {rolls/buns,
## sugar} => {whole_milk} 0.003355363 0.4782609 0.007015760 1.8717452 33
## [5416] {sugar,
## whole_milk} => {rolls/buns} 0.003355363 0.2229730 0.015048297 1.2122384 33
## [5417] {other_vegetables,
## sugar} => {whole_milk} 0.006304016 0.5849057 0.010777834 2.2891155 62
## [5418] {sugar,
## whole_milk} => {other_vegetables} 0.006304016 0.4189189 0.015048297 2.1650381 62
## [5419] {long_life_bakery_product,
## waffles} => {pastry} 0.001321810 0.3250000 0.004067107 3.6530000 13
## [5420] {long_life_bakery_product,
## pastry} => {waffles} 0.001321810 0.2241379 0.005897306 5.8317369 13
## [5421] {long_life_bakery_product,
## waffles} => {shopping_bags} 0.001118454 0.2750000 0.004067107 2.7911507 11
## [5422] {shopping_bags,
## waffles} => {long_life_bakery_product} 0.001118454 0.2037037 0.005490595 5.4440922 11
## [5423] {long_life_bakery_product,
## shopping_bags} => {waffles} 0.001118454 0.2075472 0.005388917 5.4000699 11
## [5424] {long_life_bakery_product,
## waffles} => {sausage} 0.001118454 0.2750000 0.004067107 2.9270833 11
## [5425] {sausage,
## waffles} => {long_life_bakery_product} 0.001118454 0.2244898 0.004982206 5.9996118 11
## [5426] {long_life_bakery_product,
## sausage} => {waffles} 0.001118454 0.2075472 0.005388917 5.4000699 11
## [5427] {long_life_bakery_product,
## waffles} => {soda} 0.001118454 0.2750000 0.004067107 1.5770408 11
## [5428] {long_life_bakery_product,
## waffles} => {whole_milk} 0.001525165 0.3750000 0.004067107 1.4676184 15
## [5429] {dessert,
## waffles} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [5430] {dessert,
## waffles} => {other_vegetables} 0.001321810 0.4642857 0.002846975 2.3995008 13
## [5431] {dessert,
## waffles} => {whole_milk} 0.001016777 0.3571429 0.002846975 1.3977318 10
## [5432] {cream_cheese_,
## waffles} => {whipped/sour_cream} 0.001016777 0.3333333 0.003050330 4.6501182 10
## [5433] {waffles,
## whipped/sour_cream} => {cream_cheese_} 0.001016777 0.2000000 0.005083884 5.0435897 10
## [5434] {cream_cheese_,
## waffles} => {root_vegetables} 0.001220132 0.4000000 0.003050330 3.6697761 12
## [5435] {cream_cheese_,
## waffles} => {yogurt} 0.001118454 0.3666667 0.003050330 2.6284014 11
## [5436] {cream_cheese_,
## waffles} => {other_vegetables} 0.001118454 0.3666667 0.003050330 1.8949904 11
## [5437] {cream_cheese_,
## waffles} => {whole_milk} 0.001525165 0.5000000 0.003050330 1.9568245 15
## [5438] {chicken,
## waffles} => {soda} 0.001220132 0.5714286 0.002135231 3.2769679 12
## [5439] {chicken,
## waffles} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [5440] {waffles,
## white_bread} => {pip_fruit} 0.001118454 0.3142857 0.003558719 4.1545699 11
## [5441] {pip_fruit,
## waffles} => {white_bread} 0.001118454 0.2500000 0.004473818 5.9390097 11
## [5442] {waffles,
## white_bread} => {pastry} 0.001423488 0.4000000 0.003558719 4.4960000 14
## [5443] {pastry,
## waffles} => {white_bread} 0.001423488 0.2028986 0.007015760 4.8200658 14
## [5444] {pastry,
## white_bread} => {waffles} 0.001423488 0.2545455 0.005592272 6.6228956 14
## [5445] {waffles,
## white_bread} => {sausage} 0.001016777 0.2857143 0.003558719 3.0411255 10
## [5446] {sausage,
## waffles} => {white_bread} 0.001016777 0.2040816 0.004982206 4.8481712 10
## [5447] {waffles,
## white_bread} => {soda} 0.001321810 0.3714286 0.003558719 2.1300292 13
## [5448] {waffles,
## white_bread} => {other_vegetables} 0.001220132 0.3428571 0.003558719 1.7719390 12
## [5449] {waffles,
## white_bread} => {whole_milk} 0.001525165 0.4285714 0.003558719 1.6772782 15
## [5450] {pip_fruit,
## waffles} => {chocolate} 0.001016777 0.2272727 0.004473818 4.5803838 10
## [5451] {chocolate,
## waffles} => {pastry} 0.001321810 0.2280702 0.005795628 2.5635088 13
## [5452] {shopping_bags,
## waffles} => {chocolate} 0.001118454 0.2037037 0.005490595 4.1053810 11
## [5453] {bottled_water,
## waffles} => {chocolate} 0.001118454 0.2619048 0.004270463 5.2783470 11
## [5454] {chocolate,
## waffles} => {soda} 0.001728521 0.2982456 0.005795628 1.7103473 17
## [5455] {chocolate,
## waffles} => {rolls/buns} 0.002033554 0.3508772 0.005795628 1.9076159 20
## [5456] {rolls/buns,
## waffles} => {chocolate} 0.002033554 0.2222222 0.009150991 4.4785974 20
## [5457] {chocolate,
## waffles} => {other_vegetables} 0.001626843 0.2807018 0.005795628 1.4507103 16
## [5458] {chocolate,
## waffles} => {whole_milk} 0.001728521 0.2982456 0.005795628 1.1672287 17
## [5459] {coffee,
## waffles} => {soda} 0.001016777 0.3333333 0.003050330 1.9115646 10
## [5460] {coffee,
## waffles} => {whole_milk} 0.001525165 0.5000000 0.003050330 1.9568245 15
## [5461] {frozen_vegetables,
## waffles} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [5462] {frozen_vegetables,
## waffles} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [5463] {beef,
## waffles} => {pork} 0.001118454 0.3666667 0.003050330 6.3600823 11
## [5464] {pork,
## waffles} => {beef} 0.001118454 0.3235294 0.003457041 6.1664957 11
## [5465] {beef,
## waffles} => {butter} 0.001016777 0.3333333 0.003050330 6.0152905 10
## [5466] {butter,
## waffles} => {beef} 0.001016777 0.2857143 0.003558719 5.4457364 10
## [5467] {beef,
## waffles} => {root_vegetables} 0.001626843 0.5333333 0.003050330 4.8930348 16
## [5468] {root_vegetables,
## waffles} => {beef} 0.001626843 0.2461538 0.006609049 4.6917114 16
## [5469] {beef,
## waffles} => {rolls/buns} 0.001118454 0.3666667 0.003050330 1.9934586 11
## [5470] {beef,
## waffles} => {other_vegetables} 0.001525165 0.5000000 0.003050330 2.5840778 15
## [5471] {beef,
## waffles} => {whole_milk} 0.001931876 0.6333333 0.003050330 2.4786444 19
## [5472] {curd,
## waffles} => {yogurt} 0.001321810 0.3939394 0.003355363 2.8239023 13
## [5473] {curd,
## waffles} => {other_vegetables} 0.001423488 0.4242424 0.003355363 2.1925508 14
## [5474] {curd,
## waffles} => {whole_milk} 0.001728521 0.5151515 0.003355363 2.0161222 17
## [5475] {napkins,
## waffles} => {soda} 0.001016777 0.3030303 0.003355363 1.7377860 10
## [5476] {napkins,
## waffles} => {whole_milk} 0.001830198 0.5454545 0.003355363 2.1347177 18
## [5477] {pork,
## waffles} => {whipped/sour_cream} 0.001016777 0.2941176 0.003457041 4.1030455 10
## [5478] {waffles,
## whipped/sour_cream} => {pork} 0.001016777 0.2000000 0.005083884 3.4691358 10
## [5479] {pork,
## waffles} => {root_vegetables} 0.001118454 0.3235294 0.003457041 2.9682013 11
## [5480] {pork,
## waffles} => {soda} 0.001118454 0.3235294 0.003457041 1.8553421 11
## [5481] {pork,
## waffles} => {rolls/buns} 0.001118454 0.3235294 0.003457041 1.7589341 11
## [5482] {pork,
## waffles} => {other_vegetables} 0.002135231 0.6176471 0.003457041 3.1920961 21
## [5483] {other_vegetables,
## waffles} => {pork} 0.002135231 0.2121212 0.010066090 3.6793865 21
## [5484] {pork,
## waffles} => {whole_milk} 0.001728521 0.5000000 0.003457041 1.9568245 17
## [5485] {frankfurter,
## waffles} => {yogurt} 0.001016777 0.3225806 0.003152008 2.3123766 10
## [5486] {frankfurter,
## waffles} => {other_vegetables} 0.001118454 0.3548387 0.003152008 1.8338616 11
## [5487] {frankfurter,
## waffles} => {whole_milk} 0.001321810 0.4193548 0.003152008 1.6412077 13
## [5488] {bottled_beer,
## waffles} => {bottled_water} 0.001016777 0.4545455 0.002236909 4.1126537 10
## [5489] {bottled_water,
## waffles} => {bottled_beer} 0.001016777 0.2380952 0.004270463 2.9566498 10
## [5490] {brown_bread,
## waffles} => {sausage} 0.001016777 0.4347826 0.002338587 4.6277997 10
## [5491] {sausage,
## waffles} => {brown_bread} 0.001016777 0.2040816 0.004982206 3.1459919 10
## [5492] {brown_bread,
## waffles} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [5493] {brown_bread,
## waffles} => {whole_milk} 0.001220132 0.5217391 0.002338587 2.0419038 12
## [5494] {margarine,
## waffles} => {pip_fruit} 0.001016777 0.2702703 0.003762074 3.5727260 10
## [5495] {pip_fruit,
## waffles} => {margarine} 0.001016777 0.2272727 0.004473818 3.8806029 10
## [5496] {margarine,
## waffles} => {root_vegetables} 0.001016777 0.2702703 0.003762074 2.4795785 10
## [5497] {margarine,
## waffles} => {soda} 0.001118454 0.2972973 0.003762074 1.7049090 11
## [5498] {margarine,
## waffles} => {yogurt} 0.001321810 0.3513514 0.003762074 2.5186156 13
## [5499] {margarine,
## waffles} => {rolls/buns} 0.001220132 0.3243243 0.003762074 1.7632558 12
## [5500] {margarine,
## waffles} => {other_vegetables} 0.001728521 0.4594595 0.003762074 2.3745580 17
## [5501] {margarine,
## waffles} => {whole_milk} 0.001931876 0.5135135 0.003762074 2.0097117 19
## [5502] {butter,
## waffles} => {whipped/sour_cream} 0.001118454 0.3142857 0.003558719 4.3843972 11
## [5503] {waffles,
## whipped/sour_cream} => {butter} 0.001118454 0.2200000 0.005083884 3.9700917 11
## [5504] {butter,
## waffles} => {sausage} 0.001016777 0.2857143 0.003558719 3.0411255 10
## [5505] {sausage,
## waffles} => {butter} 0.001016777 0.2040816 0.004982206 3.6828309 10
## [5506] {butter,
## waffles} => {root_vegetables} 0.001118454 0.3142857 0.003558719 2.8833955 11
## [5507] {butter,
## waffles} => {yogurt} 0.001220132 0.3428571 0.003558719 2.4577259 12
## [5508] {butter,
## waffles} => {rolls/buns} 0.001118454 0.3142857 0.003558719 1.7086788 11
## [5509] {butter,
## waffles} => {other_vegetables} 0.002033554 0.5714286 0.003558719 2.9532317 20
## [5510] {other_vegetables,
## waffles} => {butter} 0.002033554 0.2020202 0.010066090 3.6456306 20
## [5511] {butter,
## waffles} => {whole_milk} 0.001830198 0.5142857 0.003558719 2.0127338 18
## [5512] {newspapers,
## waffles} => {root_vegetables} 0.001016777 0.2439024 0.004168785 2.2376684 10
## [5513] {newspapers,
## waffles} => {yogurt} 0.001016777 0.2439024 0.004168785 1.7483823 10
## [5514] {newspapers,
## waffles} => {rolls/buns} 0.001728521 0.4146341 0.004168785 2.2542437 17
## [5515] {newspapers,
## waffles} => {other_vegetables} 0.001016777 0.2439024 0.004168785 1.2605257 10
## [5516] {newspapers,
## waffles} => {whole_milk} 0.001931876 0.4634146 0.004168785 1.8136422 19
## [5517] {domestic_eggs,
## waffles} => {root_vegetables} 0.001118454 0.3437500 0.003253686 3.1537139 11
## [5518] {domestic_eggs,
## waffles} => {soda} 0.001016777 0.3125000 0.003253686 1.7920918 10
## [5519] {domestic_eggs,
## waffles} => {yogurt} 0.001321810 0.4062500 0.003253686 2.9121492 13
## [5520] {domestic_eggs,
## waffles} => {other_vegetables} 0.001220132 0.3750000 0.003253686 1.9380583 12
## [5521] {domestic_eggs,
## waffles} => {whole_milk} 0.001830198 0.5625000 0.003253686 2.2014276 18
## [5522] {fruit/vegetable_juice,
## waffles} => {sausage} 0.001016777 0.2702703 0.003762074 2.8767404 10
## [5523] {sausage,
## waffles} => {fruit/vegetable_juice} 0.001016777 0.2040816 0.004982206 2.8229857 10
## [5524] {fruit/vegetable_juice,
## waffles} => {soda} 0.001016777 0.2702703 0.003762074 1.5499173 10
## [5525] {fruit/vegetable_juice,
## waffles} => {yogurt} 0.001016777 0.2702703 0.003762074 1.9373966 10
## [5526] {fruit/vegetable_juice,
## waffles} => {whole_milk} 0.001626843 0.4324324 0.003762074 1.6923888 16
## [5527] {waffles,
## whipped/sour_cream} => {pip_fruit} 0.001118454 0.2200000 0.005083884 2.9081989 11
## [5528] {pip_fruit,
## waffles} => {whipped/sour_cream} 0.001118454 0.2500000 0.004473818 3.4875887 11
## [5529] {waffles,
## whipped/sour_cream} => {tropical_fruit} 0.001118454 0.2200000 0.005083884 2.0966085 11
## [5530] {waffles,
## whipped/sour_cream} => {root_vegetables} 0.001525165 0.3000000 0.005083884 2.7523321 15
## [5531] {root_vegetables,
## waffles} => {whipped/sour_cream} 0.001525165 0.2307692 0.006609049 3.2193126 15
## [5532] {waffles,
## whipped/sour_cream} => {soda} 0.001220132 0.2400000 0.005083884 1.3763265 12
## [5533] {waffles,
## whipped/sour_cream} => {yogurt} 0.002033554 0.4000000 0.005083884 2.8673469 20
## [5534] {waffles,
## yogurt} => {whipped/sour_cream} 0.002033554 0.2702703 0.007524148 3.7703661 20
## [5535] {waffles,
## whipped/sour_cream} => {rolls/buns} 0.002135231 0.4200000 0.005083884 2.2834163 21
## [5536] {rolls/buns,
## waffles} => {whipped/sour_cream} 0.002135231 0.2333333 0.009150991 3.2550827 21
## [5537] {waffles,
## whipped/sour_cream} => {other_vegetables} 0.002338587 0.4600000 0.005083884 2.3773516 23
## [5538] {other_vegetables,
## waffles} => {whipped/sour_cream} 0.002338587 0.2323232 0.010066090 3.2409915 23
## [5539] {waffles,
## whipped/sour_cream} => {whole_milk} 0.003152008 0.6200000 0.005083884 2.4264624 31
## [5540] {waffles,
## whole_milk} => {whipped/sour_cream} 0.003152008 0.2480000 0.012709710 3.4596879 31
## [5541] {pip_fruit,
## waffles} => {pastry} 0.001220132 0.2727273 0.004473818 3.0654545 12
## [5542] {pip_fruit,
## waffles} => {tropical_fruit} 0.001423488 0.3181818 0.004473818 3.0322851 14
## [5543] {tropical_fruit,
## waffles} => {pip_fruit} 0.001423488 0.2333333 0.006100661 3.0844534 14
## [5544] {pip_fruit,
## waffles} => {root_vegetables} 0.001118454 0.2500000 0.004473818 2.2936101 11
## [5545] {pip_fruit,
## waffles} => {soda} 0.001525165 0.3409091 0.004473818 1.9550093 15
## [5546] {pip_fruit,
## waffles} => {yogurt} 0.001728521 0.3863636 0.004473818 2.7695965 17
## [5547] {waffles,
## yogurt} => {pip_fruit} 0.001728521 0.2297297 0.007524148 3.0368171 17
## [5548] {pip_fruit,
## waffles} => {rolls/buns} 0.001423488 0.3181818 0.004473818 1.7298608 14
## [5549] {pip_fruit,
## waffles} => {other_vegetables} 0.002033554 0.4545455 0.004473818 2.3491616 20
## [5550] {other_vegetables,
## waffles} => {pip_fruit} 0.002033554 0.2020202 0.010066090 2.6705224 20
## [5551] {pip_fruit,
## waffles} => {whole_milk} 0.002033554 0.4545455 0.004473818 1.7789314 20
## [5552] {pastry,
## waffles} => {shopping_bags} 0.001626843 0.2318841 0.007015760 2.3535394 16
## [5553] {shopping_bags,
## waffles} => {pastry} 0.001626843 0.2962963 0.005490595 3.3303704 16
## [5554] {sausage,
## waffles} => {pastry} 0.001220132 0.2448980 0.004982206 2.7526531 12
## [5555] {pastry,
## waffles} => {tropical_fruit} 0.001830198 0.2608696 0.007015760 2.4860971 18
## [5556] {tropical_fruit,
## waffles} => {pastry} 0.001830198 0.3000000 0.006100661 3.3720000 18
## [5557] {pastry,
## waffles} => {soda} 0.002236909 0.3188406 0.007015760 1.8284531 22
## [5558] {soda,
## waffles} => {pastry} 0.002236909 0.2340426 0.009557702 2.6306383 22
## [5559] {pastry,
## waffles} => {yogurt} 0.001728521 0.2463768 0.007015760 1.7661195 17
## [5560] {waffles,
## yogurt} => {pastry} 0.001728521 0.2297297 0.007524148 2.5821622 17
## [5561] {pastry,
## waffles} => {rolls/buns} 0.001830198 0.2608696 0.007015760 1.4182710 18
## [5562] {rolls/buns,
## waffles} => {pastry} 0.001830198 0.2000000 0.009150991 2.2480000 18
## [5563] {pastry,
## waffles} => {other_vegetables} 0.002033554 0.2898551 0.007015760 1.4980161 20
## [5564] {other_vegetables,
## waffles} => {pastry} 0.002033554 0.2020202 0.010066090 2.2707071 20
## [5565] {pastry,
## waffles} => {whole_milk} 0.002846975 0.4057971 0.007015760 1.5881474 28
## [5566] {waffles,
## whole_milk} => {pastry} 0.002846975 0.2240000 0.012709710 2.5177600 28
## [5567] {citrus_fruit,
## waffles} => {root_vegetables} 0.001321810 0.3095238 0.004270463 2.8397077 13
## [5568] {root_vegetables,
## waffles} => {citrus_fruit} 0.001321810 0.2000000 0.006609049 2.4164619 13
## [5569] {citrus_fruit,
## waffles} => {yogurt} 0.001118454 0.2619048 0.004270463 1.8774295 11
## [5570] {citrus_fruit,
## waffles} => {other_vegetables} 0.001525165 0.3571429 0.004270463 1.8457698 15
## [5571] {citrus_fruit,
## waffles} => {whole_milk} 0.001525165 0.3571429 0.004270463 1.3977318 15
## [5572] {shopping_bags,
## waffles} => {sausage} 0.001118454 0.2037037 0.005490595 2.1682099 11
## [5573] {sausage,
## waffles} => {shopping_bags} 0.001118454 0.2244898 0.004982206 2.2784903 11
## [5574] {shopping_bags,
## waffles} => {root_vegetables} 0.001118454 0.2037037 0.005490595 1.8688675 11
## [5575] {shopping_bags,
## waffles} => {soda} 0.001525165 0.2777778 0.005490595 1.5929705 15
## [5576] {shopping_bags,
## waffles} => {rolls/buns} 0.001321810 0.2407407 0.005490595 1.3088365 13
## [5577] {shopping_bags,
## waffles} => {other_vegetables} 0.001423488 0.2592593 0.005490595 1.3398922 14
## [5578] {shopping_bags,
## waffles} => {whole_milk} 0.001423488 0.2592593 0.005490595 1.0146497 14
## [5579] {sausage,
## waffles} => {soda} 0.001423488 0.2857143 0.004982206 1.6384840 14
## [5580] {sausage,
## waffles} => {yogurt} 0.001220132 0.2448980 0.004982206 1.7555185 12
## [5581] {sausage,
## waffles} => {rolls/buns} 0.001118454 0.2244898 0.004982206 1.2204849 11
## [5582] {sausage,
## waffles} => {other_vegetables} 0.001728521 0.3469388 0.004982206 1.7930336 17
## [5583] {sausage,
## waffles} => {whole_milk} 0.001728521 0.3469388 0.004982206 1.3577966 17
## [5584] {bottled_water,
## waffles} => {soda} 0.002033554 0.4761905 0.004270463 2.7308066 20
## [5585] {soda,
## waffles} => {bottled_water} 0.002033554 0.2127660 0.009557702 1.9250719 20
## [5586] {bottled_water,
## waffles} => {yogurt} 0.001016777 0.2380952 0.004270463 1.7067541 10
## [5587] {bottled_water,
## waffles} => {rolls/buns} 0.001321810 0.3095238 0.004270463 1.6827898 13
## [5588] {bottled_water,
## waffles} => {other_vegetables} 0.001626843 0.3809524 0.004270463 1.9688212 16
## [5589] {bottled_water,
## waffles} => {whole_milk} 0.001423488 0.3333333 0.004270463 1.3045497 14
## [5590] {tropical_fruit,
## waffles} => {root_vegetables} 0.001830198 0.3000000 0.006100661 2.7523321 18
## [5591] {root_vegetables,
## waffles} => {tropical_fruit} 0.001830198 0.2769231 0.006609049 2.6390877 18
## [5592] {tropical_fruit,
## waffles} => {soda} 0.001830198 0.3000000 0.006100661 1.7204082 18
## [5593] {tropical_fruit,
## waffles} => {yogurt} 0.002643620 0.4333333 0.006100661 3.1062925 26
## [5594] {waffles,
## yogurt} => {tropical_fruit} 0.002643620 0.3513514 0.007524148 3.3483920 26
## [5595] {tropical_fruit,
## waffles} => {rolls/buns} 0.002135231 0.3500000 0.006100661 1.9028469 21
## [5596] {rolls/buns,
## waffles} => {tropical_fruit} 0.002135231 0.2333333 0.009150991 2.2236757 21
## [5597] {tropical_fruit,
## waffles} => {other_vegetables} 0.002541942 0.4166667 0.006100661 2.1533981 25
## [5598] {other_vegetables,
## waffles} => {tropical_fruit} 0.002541942 0.2525253 0.010066090 2.4065754 25
## [5599] {tropical_fruit,
## waffles} => {whole_milk} 0.002643620 0.4333333 0.006100661 1.6959146 26
## [5600] {waffles,
## whole_milk} => {tropical_fruit} 0.002643620 0.2080000 0.012709710 1.9822481 26
## [5601] {root_vegetables,
## waffles} => {soda} 0.001728521 0.2615385 0.006609049 1.4998430 17
## [5602] {root_vegetables,
## waffles} => {yogurt} 0.002033554 0.3076923 0.006609049 2.2056515 20
## [5603] {waffles,
## yogurt} => {root_vegetables} 0.002033554 0.2702703 0.007524148 2.4795785 20
## [5604] {root_vegetables,
## waffles} => {rolls/buns} 0.001931876 0.2923077 0.006609049 1.5891908 19
## [5605] {rolls/buns,
## waffles} => {root_vegetables} 0.001931876 0.2111111 0.009150991 1.9368263 19
## [5606] {root_vegetables,
## waffles} => {other_vegetables} 0.003253686 0.4923077 0.006609049 2.5443227 32
## [5607] {other_vegetables,
## waffles} => {root_vegetables} 0.003253686 0.3232323 0.010066090 2.9654757 32
## [5608] {root_vegetables,
## waffles} => {whole_milk} 0.003863752 0.5846154 0.006609049 2.2879794 38
## [5609] {waffles,
## whole_milk} => {root_vegetables} 0.003863752 0.3040000 0.012709710 2.7890299 38
## [5610] {soda,
## waffles} => {yogurt} 0.001931876 0.2021277 0.009557702 1.4489253 19
## [5611] {waffles,
## yogurt} => {soda} 0.001931876 0.2567568 0.007524148 1.4724214 19
## [5612] {soda,
## waffles} => {rolls/buns} 0.002745297 0.2872340 0.009557702 1.5616069 27
## [5613] {rolls/buns,
## waffles} => {soda} 0.002745297 0.3000000 0.009150991 1.7204082 27
## [5614] {soda,
## waffles} => {other_vegetables} 0.002541942 0.2659574 0.009557702 1.3745095 25
## [5615] {other_vegetables,
## waffles} => {soda} 0.002541942 0.2525253 0.010066090 1.4481550 25
## [5616] {soda,
## waffles} => {whole_milk} 0.002643620 0.2765957 0.009557702 1.0824987 26
## [5617] {waffles,
## whole_milk} => {soda} 0.002643620 0.2080000 0.012709710 1.1928163 26
## [5618] {waffles,
## yogurt} => {rolls/buns} 0.002745297 0.3648649 0.007524148 1.9836628 27
## [5619] {rolls/buns,
## waffles} => {yogurt} 0.002745297 0.3000000 0.009150991 2.1505102 27
## [5620] {waffles,
## yogurt} => {other_vegetables} 0.003152008 0.4189189 0.007524148 2.1650381 31
## [5621] {other_vegetables,
## waffles} => {yogurt} 0.003152008 0.3131313 0.010066090 2.2446403 31
## [5622] {waffles,
## yogurt} => {whole_milk} 0.003558719 0.4729730 0.007524148 1.8510502 35
## [5623] {waffles,
## whole_milk} => {yogurt} 0.003558719 0.2800000 0.012709710 2.0071429 35
## [5624] {rolls/buns,
## waffles} => {other_vegetables} 0.002948653 0.3222222 0.009150991 1.6652946 29
## [5625] {other_vegetables,
## waffles} => {rolls/buns} 0.002948653 0.2929293 0.010066090 1.5925703 29
## [5626] {rolls/buns,
## waffles} => {whole_milk} 0.004677173 0.5111111 0.009150991 2.0003095 46
## [5627] {waffles,
## whole_milk} => {rolls/buns} 0.004677173 0.3680000 0.012709710 2.0007076 46
## [5628] {other_vegetables,
## waffles} => {whole_milk} 0.004677173 0.4646465 0.010066090 1.8184632 46
## [5629] {waffles,
## whole_milk} => {other_vegetables} 0.004677173 0.3680000 0.012709710 1.9018812 46
## [5630] {dessert,
## long_life_bakery_product} => {chocolate} 0.001016777 0.3448276 0.002948653 6.9495478 10
## [5631] {chocolate,
## dessert} => {long_life_bakery_product} 0.001016777 0.2777778 0.003660397 7.4237621 10
## [5632] {dessert,
## long_life_bakery_product} => {soda} 0.001423488 0.4827586 0.002948653 2.7684729 14
## [5633] {dessert,
## long_life_bakery_product} => {yogurt} 0.001525165 0.5172414 0.002948653 3.7077762 15
## [5634] {dessert,
## long_life_bakery_product} => {whole_milk} 0.001830198 0.6206897 0.002948653 2.4291615 18
## [5635] {cream_cheese_,
## long_life_bakery_product} => {whipped/sour_cream} 0.001016777 0.3571429 0.002846975 4.9822695 10
## [5636] {cream_cheese_,
## long_life_bakery_product} => {yogurt} 0.001118454 0.3928571 0.002846975 2.8161443 11
## [5637] {cream_cheese_,
## long_life_bakery_product} => {other_vegetables} 0.001830198 0.6428571 0.002846975 3.3223857 18
## [5638] {cream_cheese_,
## long_life_bakery_product} => {whole_milk} 0.001423488 0.5000000 0.002846975 1.9568245 14
## [5639] {chicken,
## long_life_bakery_product} => {frozen_vegetables} 0.001016777 0.3125000 0.003253686 6.4977537 10
## [5640] {frozen_vegetables,
## long_life_bakery_product} => {chicken} 0.001016777 0.2631579 0.003863752 6.1330756 10
## [5641] {chicken,
## long_life_bakery_product} => {whipped/sour_cream} 0.001016777 0.3125000 0.003253686 4.3594858 10
## [5642] {chicken,
## long_life_bakery_product} => {rolls/buns} 0.001016777 0.3125000 0.003253686 1.6989704 10
## [5643] {chicken,
## long_life_bakery_product} => {other_vegetables} 0.001220132 0.3750000 0.003253686 1.9380583 12
## [5644] {chicken,
## long_life_bakery_product} => {whole_milk} 0.001525165 0.4687500 0.003253686 1.8345230 15
## [5645] {long_life_bakery_product,
## white_bread} => {chocolate} 0.001016777 0.2325581 0.004372140 4.6869043 10
## [5646] {chocolate,
## white_bread} => {long_life_bakery_product} 0.001016777 0.2380952 0.004270463 6.3632246 10
## [5647] {long_life_bakery_product,
## white_bread} => {napkins} 0.001016777 0.2325581 0.004372140 4.4411831 10
## [5648] {long_life_bakery_product,
## napkins} => {white_bread} 0.001016777 0.2127660 0.004778851 5.0544763 10
## [5649] {napkins,
## white_bread} => {long_life_bakery_product} 0.001016777 0.2941176 0.003457041 7.8604540 10
## [5650] {long_life_bakery_product,
## white_bread} => {fruit/vegetable_juice} 0.001220132 0.2790698 0.004372140 3.8602689 12
## [5651] {long_life_bakery_product,
## white_bread} => {whipped/sour_cream} 0.001016777 0.2325581 0.004372140 3.2442685 10
## [5652] {long_life_bakery_product,
## white_bread} => {pip_fruit} 0.001321810 0.3023256 0.004372140 3.9964679 13
## [5653] {long_life_bakery_product,
## pip_fruit} => {white_bread} 0.001321810 0.2888889 0.004575496 6.8628556 13
## [5654] {pip_fruit,
## white_bread} => {long_life_bakery_product} 0.001321810 0.2000000 0.006609049 5.3451087 13
## [5655] {long_life_bakery_product,
## white_bread} => {sausage} 0.001016777 0.2325581 0.004372140 2.4753347 10
## [5656] {long_life_bakery_product,
## white_bread} => {tropical_fruit} 0.001321810 0.3023256 0.004372140 2.8811745 13
## [5657] {long_life_bakery_product,
## tropical_fruit} => {white_bread} 0.001321810 0.2096774 0.006304016 4.9811049 13
## [5658] {long_life_bakery_product,
## white_bread} => {soda} 0.001220132 0.2790698 0.004372140 1.6003797 12
## [5659] {long_life_bakery_product,
## white_bread} => {yogurt} 0.001626843 0.3720930 0.004372140 2.6672995 16
## [5660] {long_life_bakery_product,
## white_bread} => {rolls/buns} 0.001220132 0.2790698 0.004372140 1.5172201 12
## [5661] {long_life_bakery_product,
## white_bread} => {other_vegetables} 0.001423488 0.3255814 0.004372140 1.6826553 14
## [5662] {long_life_bakery_product,
## white_bread} => {whole_milk} 0.002440264 0.5581395 0.004372140 2.1843622 24
## [5663] {chocolate,
## long_life_bakery_product} => {napkins} 0.001118454 0.2115385 0.005287239 4.0397685 11
## [5664] {long_life_bakery_product,
## napkins} => {chocolate} 0.001118454 0.2340426 0.004778851 4.7168207 11
## [5665] {chocolate,
## napkins} => {long_life_bakery_product} 0.001118454 0.2291667 0.004880529 6.1246037 11
## [5666] {butter,
## long_life_bakery_product} => {chocolate} 0.001016777 0.2325581 0.004372140 4.6869043 10
## [5667] {chocolate,
## long_life_bakery_product} => {fruit/vegetable_juice} 0.001118454 0.2115385 0.005287239 2.9261333 11
## [5668] {chocolate,
## long_life_bakery_product} => {pip_fruit} 0.001321810 0.2500000 0.005287239 3.3047715 13
## [5669] {long_life_bakery_product,
## pip_fruit} => {chocolate} 0.001321810 0.2888889 0.004575496 5.8221767 13
## [5670] {chocolate,
## pip_fruit} => {long_life_bakery_product} 0.001321810 0.2166667 0.006100661 5.7905344 13
## [5671] {chocolate,
## long_life_bakery_product} => {pastry} 0.001118454 0.2115385 0.005287239 2.3776923 11
## [5672] {chocolate,
## long_life_bakery_product} => {tropical_fruit} 0.001830198 0.3461538 0.005287239 3.2988596 18
## [5673] {long_life_bakery_product,
## tropical_fruit} => {chocolate} 0.001830198 0.2903226 0.006304016 5.8510709 18
## [5674] {chocolate,
## tropical_fruit} => {long_life_bakery_product} 0.001830198 0.2250000 0.008134215 6.0132473 18
## [5675] {chocolate,
## long_life_bakery_product} => {soda} 0.001423488 0.2692308 0.005287239 1.5439560 14
## [5676] {chocolate,
## long_life_bakery_product} => {yogurt} 0.001728521 0.3269231 0.005287239 2.3435047 17
## [5677] {chocolate,
## long_life_bakery_product} => {rolls/buns} 0.001321810 0.2500000 0.005287239 1.3591763 13
## [5678] {chocolate,
## long_life_bakery_product} => {other_vegetables} 0.002338587 0.4423077 0.005287239 2.2859150 23
## [5679] {long_life_bakery_product,
## other_vegetables} => {chocolate} 0.002338587 0.2190476 0.010676157 4.4146175 23
## [5680] {chocolate,
## long_life_bakery_product} => {whole_milk} 0.003050330 0.5769231 0.005287239 2.2578744 30
## [5681] {long_life_bakery_product,
## whole_milk} => {chocolate} 0.003050330 0.2255639 0.013523132 4.5459448 30
## [5682] {coffee,
## long_life_bakery_product} => {whipped/sour_cream} 0.001016777 0.2941176 0.003457041 4.1030455 10
## [5683] {coffee,
## long_life_bakery_product} => {yogurt} 0.001118454 0.3235294 0.003457041 2.3191777 11
## [5684] {coffee,
## long_life_bakery_product} => {other_vegetables} 0.001423488 0.4117647 0.003457041 2.1280640 14
## [5685] {coffee,
## long_life_bakery_product} => {whole_milk} 0.001525165 0.4411765 0.003457041 1.7266099 15
## [5686] {frozen_vegetables,
## long_life_bakery_product} => {fruit/vegetable_juice} 0.001118454 0.2894737 0.003863752 4.0041824 11
## [5687] {frozen_vegetables,
## long_life_bakery_product} => {whipped/sour_cream} 0.001423488 0.3684211 0.003863752 5.1396043 14
## [5688] {long_life_bakery_product,
## whipped/sour_cream} => {frozen_vegetables} 0.001423488 0.2456140 0.005795628 5.1070064 14
## [5689] {frozen_vegetables,
## long_life_bakery_product} => {pip_fruit} 0.001118454 0.2894737 0.003863752 3.8265775 11
## [5690] {long_life_bakery_product,
## pip_fruit} => {frozen_vegetables} 0.001118454 0.2444444 0.004575496 5.0826873 11
## [5691] {frozen_vegetables,
## long_life_bakery_product} => {root_vegetables} 0.001016777 0.2631579 0.003863752 2.4143264 10
## [5692] {frozen_vegetables,
## long_life_bakery_product} => {soda} 0.001016777 0.2631579 0.003863752 1.5091300 10
## [5693] {frozen_vegetables,
## long_life_bakery_product} => {yogurt} 0.001321810 0.3421053 0.003863752 2.4523362 13
## [5694] {frozen_vegetables,
## long_life_bakery_product} => {other_vegetables} 0.002033554 0.5263158 0.003863752 2.7200819 20
## [5695] {frozen_vegetables,
## long_life_bakery_product} => {whole_milk} 0.002033554 0.5263158 0.003863752 2.0598153 20
## [5696] {beef,
## long_life_bakery_product} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [5697] {curd,
## long_life_bakery_product} => {whipped/sour_cream} 0.001220132 0.3750000 0.003253686 5.2313830 12
## [5698] {long_life_bakery_product,
## whipped/sour_cream} => {curd} 0.001220132 0.2105263 0.005795628 3.9513861 12
## [5699] {curd,
## long_life_bakery_product} => {yogurt} 0.001118454 0.3437500 0.003253686 2.4641263 11
## [5700] {curd,
## long_life_bakery_product} => {other_vegetables} 0.001118454 0.3437500 0.003253686 1.7765535 11
## [5701] {curd,
## long_life_bakery_product} => {whole_milk} 0.001728521 0.5312500 0.003253686 2.0791260 17
## [5702] {long_life_bakery_product,
## napkins} => {domestic_eggs} 0.001118454 0.2340426 0.004778851 3.6887957 11
## [5703] {domestic_eggs,
## long_life_bakery_product} => {napkins} 0.001118454 0.2894737 0.003863752 5.5281042 11
## [5704] {long_life_bakery_product,
## napkins} => {whipped/sour_cream} 0.001118454 0.2340426 0.004778851 3.2649766 11
## [5705] {long_life_bakery_product,
## napkins} => {pip_fruit} 0.001220132 0.2553191 0.004778851 3.3750858 12
## [5706] {long_life_bakery_product,
## pip_fruit} => {napkins} 0.001220132 0.2666667 0.004575496 5.0925566 12
## [5707] {long_life_bakery_product,
## napkins} => {pastry} 0.001525165 0.3191489 0.004778851 3.5872340 15
## [5708] {long_life_bakery_product,
## pastry} => {napkins} 0.001525165 0.2586207 0.005897306 4.9389019 15
## [5709] {napkins,
## pastry} => {long_life_bakery_product} 0.001525165 0.2173913 0.007015760 5.8099008 15
## [5710] {long_life_bakery_product,
## napkins} => {citrus_fruit} 0.001220132 0.2553191 0.004778851 3.0848450 12
## [5711] {citrus_fruit,
## long_life_bakery_product} => {napkins} 0.001220132 0.2926829 0.004168785 5.5893914 12
## [5712] {long_life_bakery_product,
## napkins} => {tropical_fruit} 0.001321810 0.2765957 0.004778851 2.6359682 13
## [5713] {long_life_bakery_product,
## tropical_fruit} => {napkins} 0.001321810 0.2096774 0.006304016 4.0042280 13
## [5714] {long_life_bakery_product,
## napkins} => {soda} 0.001830198 0.3829787 0.004778851 2.1962657 18
## [5715] {long_life_bakery_product,
## soda} => {napkins} 0.001830198 0.2400000 0.007625826 4.5833010 18
## [5716] {long_life_bakery_product,
## napkins} => {yogurt} 0.001626843 0.3404255 0.004778851 2.4402953 16
## [5717] {long_life_bakery_product,
## napkins} => {rolls/buns} 0.001220132 0.2553191 0.004778851 1.3880950 12
## [5718] {long_life_bakery_product,
## napkins} => {other_vegetables} 0.001423488 0.2978723 0.004778851 1.5394506 14
## [5719] {long_life_bakery_product,
## napkins} => {whole_milk} 0.002643620 0.5531915 0.004778851 2.1649973 26
## [5720] {long_life_bakery_product,
## pork} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [5721] {frankfurter,
## long_life_bakery_product} => {soda} 0.001118454 0.4074074 0.002745297 2.3363568 11
## [5722] {bottled_beer,
## long_life_bakery_product} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [5723] {brown_bread,
## long_life_bakery_product} => {fruit/vegetable_juice} 0.001118454 0.3333333 0.003355363 4.6108767 11
## [5724] {brown_bread,
## long_life_bakery_product} => {soda} 0.001423488 0.4242424 0.003355363 2.4329004 14
## [5725] {brown_bread,
## long_life_bakery_product} => {yogurt} 0.001220132 0.3636364 0.003355363 2.6066790 12
## [5726] {brown_bread,
## long_life_bakery_product} => {rolls/buns} 0.001016777 0.3030303 0.003355363 1.6474865 10
## [5727] {brown_bread,
## long_life_bakery_product} => {other_vegetables} 0.001220132 0.3636364 0.003355363 1.8793293 12
## [5728] {brown_bread,
## long_life_bakery_product} => {whole_milk} 0.001626843 0.4848485 0.003355363 1.8975268 16
## [5729] {long_life_bakery_product,
## margarine} => {whole_milk} 0.001016777 0.3125000 0.003253686 1.2230153 10
## [5730] {butter,
## long_life_bakery_product} => {fruit/vegetable_juice} 0.001118454 0.2558140 0.004372140 3.5385798 11
## [5731] {butter,
## long_life_bakery_product} => {whipped/sour_cream} 0.001525165 0.3488372 0.004372140 4.8664028 15
## [5732] {long_life_bakery_product,
## whipped/sour_cream} => {butter} 0.001525165 0.2631579 0.005795628 4.7489136 15
## [5733] {butter,
## long_life_bakery_product} => {pip_fruit} 0.001321810 0.3023256 0.004372140 3.9964679 13
## [5734] {long_life_bakery_product,
## pip_fruit} => {butter} 0.001321810 0.2888889 0.004575496 5.2132518 13
## [5735] {butter,
## long_life_bakery_product} => {sausage} 0.001118454 0.2558140 0.004372140 2.7228682 11
## [5736] {long_life_bakery_product,
## sausage} => {butter} 0.001118454 0.2075472 0.005388917 3.7453696 11
## [5737] {butter,
## long_life_bakery_product} => {bottled_water} 0.001016777 0.2325581 0.004372140 2.1041484 10
## [5738] {bottled_water,
## long_life_bakery_product} => {butter} 0.001016777 0.2380952 0.004270463 4.2966361 10
## [5739] {butter,
## long_life_bakery_product} => {tropical_fruit} 0.001423488 0.3255814 0.004372140 3.1028033 14
## [5740] {long_life_bakery_product,
## tropical_fruit} => {butter} 0.001423488 0.2258065 0.006304016 4.0748742 14
## [5741] {butter,
## long_life_bakery_product} => {root_vegetables} 0.001830198 0.4186047 0.004372140 3.8404634 18
## [5742] {long_life_bakery_product,
## root_vegetables} => {butter} 0.001830198 0.3461538 0.005287239 6.2466478 18
## [5743] {butter,
## long_life_bakery_product} => {yogurt} 0.001220132 0.2790698 0.004372140 2.0004746 12
## [5744] {butter,
## long_life_bakery_product} => {rolls/buns} 0.001423488 0.3255814 0.004372140 1.7700901 14
## [5745] {butter,
## long_life_bakery_product} => {other_vegetables} 0.002440264 0.5581395 0.004372140 2.8845519 24
## [5746] {long_life_bakery_product,
## other_vegetables} => {butter} 0.002440264 0.2285714 0.010676157 4.1247706 24
## [5747] {butter,
## long_life_bakery_product} => {whole_milk} 0.002541942 0.5813953 0.004372140 2.2753773 25
## [5748] {long_life_bakery_product,
## newspapers} => {tropical_fruit} 0.001321810 0.3823529 0.003457041 3.6438383 13
## [5749] {long_life_bakery_product,
## tropical_fruit} => {newspapers} 0.001321810 0.2096774 0.006304016 2.6269776 13
## [5750] {long_life_bakery_product,
## newspapers} => {yogurt} 0.001220132 0.3529412 0.003457041 2.5300120 12
## [5751] {long_life_bakery_product,
## newspapers} => {rolls/buns} 0.001016777 0.2941176 0.003457041 1.5990310 10
## [5752] {long_life_bakery_product,
## newspapers} => {whole_milk} 0.001728521 0.5000000 0.003457041 1.9568245 17
## [5753] {domestic_eggs,
## long_life_bakery_product} => {pastry} 0.001016777 0.2631579 0.003863752 2.9578947 10
## [5754] {domestic_eggs,
## long_life_bakery_product} => {citrus_fruit} 0.001016777 0.2631579 0.003863752 3.1795552 10
## [5755] {citrus_fruit,
## long_life_bakery_product} => {domestic_eggs} 0.001016777 0.2439024 0.004168785 3.8441995 10
## [5756] {domestic_eggs,
## long_life_bakery_product} => {shopping_bags} 0.001016777 0.2631579 0.003863752 2.6709576 10
## [5757] {domestic_eggs,
## long_life_bakery_product} => {root_vegetables} 0.001220132 0.3157895 0.003863752 2.8971917 12
## [5758] {long_life_bakery_product,
## root_vegetables} => {domestic_eggs} 0.001220132 0.2307692 0.005287239 3.6372041 12
## [5759] {domestic_eggs,
## long_life_bakery_product} => {soda} 0.001016777 0.2631579 0.003863752 1.5091300 10
## [5760] {domestic_eggs,
## long_life_bakery_product} => {yogurt} 0.001626843 0.4210526 0.003863752 3.0182599 16
## [5761] {domestic_eggs,
## long_life_bakery_product} => {rolls/buns} 0.001525165 0.3947368 0.003863752 2.1460679 15
## [5762] {domestic_eggs,
## long_life_bakery_product} => {other_vegetables} 0.001321810 0.3421053 0.003863752 1.7680532 13
## [5763] {domestic_eggs,
## long_life_bakery_product} => {whole_milk} 0.002033554 0.5263158 0.003863752 2.0598153 20
## [5764] {long_life_bakery_product,
## pip_fruit} => {fruit/vegetable_juice} 0.001016777 0.2222222 0.004575496 3.0739178 10
## [5765] {fruit/vegetable_juice,
## long_life_bakery_product} => {sausage} 0.001321810 0.2131148 0.006202339 2.2683805 13
## [5766] {long_life_bakery_product,
## sausage} => {fruit/vegetable_juice} 0.001321810 0.2452830 0.005388917 3.3929093 13
## [5767] {fruit/vegetable_juice,
## long_life_bakery_product} => {bottled_water} 0.001321810 0.2131148 0.006202339 1.9282278 13
## [5768] {bottled_water,
## long_life_bakery_product} => {fruit/vegetable_juice} 0.001321810 0.3095238 0.004270463 4.2815284 13
## [5769] {fruit/vegetable_juice,
## long_life_bakery_product} => {tropical_fruit} 0.001321810 0.2131148 0.006202339 2.0309919 13
## [5770] {long_life_bakery_product,
## tropical_fruit} => {fruit/vegetable_juice} 0.001321810 0.2096774 0.006304016 2.9003902 13
## [5771] {fruit/vegetable_juice,
## long_life_bakery_product} => {root_vegetables} 0.001321810 0.2131148 0.006202339 1.9552086 13
## [5772] {long_life_bakery_product,
## root_vegetables} => {fruit/vegetable_juice} 0.001321810 0.2500000 0.005287239 3.4581575 13
## [5773] {fruit/vegetable_juice,
## long_life_bakery_product} => {soda} 0.001525165 0.2459016 0.006202339 1.4101706 15
## [5774] {long_life_bakery_product,
## soda} => {fruit/vegetable_juice} 0.001525165 0.2000000 0.007625826 2.7665260 15
## [5775] {fruit/vegetable_juice,
## long_life_bakery_product} => {yogurt} 0.001830198 0.2950820 0.006202339 2.1152559 18
## [5776] {long_life_bakery_product,
## yogurt} => {fruit/vegetable_juice} 0.001830198 0.2093023 0.008744281 2.8952016 18
## [5777] {fruit/vegetable_juice,
## long_life_bakery_product} => {rolls/buns} 0.001423488 0.2295082 0.006202339 1.2477684 14
## [5778] {fruit/vegetable_juice,
## long_life_bakery_product} => {other_vegetables} 0.002541942 0.4098361 0.006202339 2.1180965 25
## [5779] {long_life_bakery_product,
## other_vegetables} => {fruit/vegetable_juice} 0.002541942 0.2380952 0.010676157 3.2934834 25
## [5780] {fruit/vegetable_juice,
## long_life_bakery_product} => {whole_milk} 0.003355363 0.5409836 0.006202339 2.1172200 33
## [5781] {long_life_bakery_product,
## whole_milk} => {fruit/vegetable_juice} 0.003355363 0.2481203 0.013523132 3.4321563 33
## [5782] {long_life_bakery_product,
## whipped/sour_cream} => {sausage} 0.001220132 0.2105263 0.005795628 2.2408293 12
## [5783] {long_life_bakery_product,
## sausage} => {whipped/sour_cream} 0.001220132 0.2264151 0.005388917 3.1585709 12
## [5784] {bottled_water,
## long_life_bakery_product} => {whipped/sour_cream} 0.001118454 0.2619048 0.004270463 3.6536643 11
## [5785] {long_life_bakery_product,
## whipped/sour_cream} => {tropical_fruit} 0.001626843 0.2807018 0.005795628 2.6750986 16
## [5786] {long_life_bakery_product,
## tropical_fruit} => {whipped/sour_cream} 0.001626843 0.2580645 0.006304016 3.6000915 16
## [5787] {long_life_bakery_product,
## whipped/sour_cream} => {root_vegetables} 0.001423488 0.2456140 0.005795628 2.2533713 14
## [5788] {long_life_bakery_product,
## root_vegetables} => {whipped/sour_cream} 0.001423488 0.2692308 0.005287239 3.7558647 14
## [5789] {long_life_bakery_product,
## whipped/sour_cream} => {soda} 0.001321810 0.2280702 0.005795628 1.3079126 13
## [5790] {long_life_bakery_product,
## whipped/sour_cream} => {yogurt} 0.002135231 0.3684211 0.005795628 2.6409774 21
## [5791] {long_life_bakery_product,
## yogurt} => {whipped/sour_cream} 0.002135231 0.2441860 0.008744281 3.4064819 21
## [5792] {long_life_bakery_product,
## whipped/sour_cream} => {rolls/buns} 0.001626843 0.2807018 0.005795628 1.5260927 16
## [5793] {long_life_bakery_product,
## rolls/buns} => {whipped/sour_cream} 0.001626843 0.2051282 0.007930859 2.8616112 16
## [5794] {long_life_bakery_product,
## whipped/sour_cream} => {other_vegetables} 0.002745297 0.4736842 0.005795628 2.4480737 27
## [5795] {long_life_bakery_product,
## other_vegetables} => {whipped/sour_cream} 0.002745297 0.2571429 0.010676157 3.5872340 27
## [5796] {long_life_bakery_product,
## whipped/sour_cream} => {whole_milk} 0.003253686 0.5614035 0.005795628 2.1971363 32
## [5797] {long_life_bakery_product,
## whole_milk} => {whipped/sour_cream} 0.003253686 0.2406015 0.013523132 3.3564763 32
## [5798] {long_life_bakery_product,
## pip_fruit} => {pastry} 0.001321810 0.2888889 0.004575496 3.2471111 13
## [5799] {long_life_bakery_product,
## pastry} => {pip_fruit} 0.001321810 0.2241379 0.005897306 2.9628986 13
## [5800] {long_life_bakery_product,
## pip_fruit} => {citrus_fruit} 0.001321810 0.2888889 0.004575496 3.4904450 13
## [5801] {citrus_fruit,
## long_life_bakery_product} => {pip_fruit} 0.001321810 0.3170732 0.004168785 4.1914175 13
## [5802] {long_life_bakery_product,
## pip_fruit} => {sausage} 0.001118454 0.2444444 0.004575496 2.6018519 11
## [5803] {long_life_bakery_product,
## sausage} => {pip_fruit} 0.001118454 0.2075472 0.005388917 2.7435839 11
## [5804] {long_life_bakery_product,
## pip_fruit} => {tropical_fruit} 0.001728521 0.3777778 0.004575496 3.6002369 17
## [5805] {long_life_bakery_product,
## tropical_fruit} => {pip_fruit} 0.001728521 0.2741935 0.006304016 3.6245881 17
## [5806] {long_life_bakery_product,
## pip_fruit} => {root_vegetables} 0.001016777 0.2222222 0.004575496 2.0387645 10
## [5807] {long_life_bakery_product,
## pip_fruit} => {soda} 0.001016777 0.2222222 0.004575496 1.2743764 10
## [5808] {long_life_bakery_product,
## pip_fruit} => {yogurt} 0.001931876 0.4222222 0.004575496 3.0266440 19
## [5809] {long_life_bakery_product,
## yogurt} => {pip_fruit} 0.001931876 0.2209302 0.008744281 2.9204957 19
## [5810] {long_life_bakery_product,
## pip_fruit} => {other_vegetables} 0.001830198 0.4000000 0.004575496 2.0672622 18
## [5811] {long_life_bakery_product,
## pip_fruit} => {whole_milk} 0.002440264 0.5333333 0.004575496 2.0872795 24
## [5812] {long_life_bakery_product,
## pastry} => {shopping_bags} 0.001220132 0.2068966 0.005897306 2.0999253 12
## [5813] {long_life_bakery_product,
## shopping_bags} => {pastry} 0.001220132 0.2264151 0.005388917 2.5449057 12
## [5814] {long_life_bakery_product,
## pastry} => {soda} 0.002135231 0.3620690 0.005897306 2.0763547 21
## [5815] {long_life_bakery_product,
## soda} => {pastry} 0.002135231 0.2800000 0.007625826 3.1472000 21
## [5816] {long_life_bakery_product,
## pastry} => {yogurt} 0.001321810 0.2241379 0.005897306 1.6067030 13
## [5817] {long_life_bakery_product,
## pastry} => {other_vegetables} 0.001830198 0.3103448 0.005897306 1.6039103 18
## [5818] {long_life_bakery_product,
## pastry} => {whole_milk} 0.002135231 0.3620690 0.005897306 1.4170109 21
## [5819] {citrus_fruit,
## long_life_bakery_product} => {tropical_fruit} 0.001118454 0.2682927 0.004168785 2.5568397 11
## [5820] {citrus_fruit,
## long_life_bakery_product} => {root_vegetables} 0.001016777 0.2439024 0.004168785 2.2376684 10
## [5821] {citrus_fruit,
## long_life_bakery_product} => {yogurt} 0.001321810 0.3170732 0.004168785 2.2728970 13
## [5822] {citrus_fruit,
## long_life_bakery_product} => {other_vegetables} 0.001931876 0.4634146 0.004168785 2.3949989 19
## [5823] {citrus_fruit,
## long_life_bakery_product} => {whole_milk} 0.001525165 0.3658537 0.004168785 1.4318228 15
## [5824] {long_life_bakery_product,
## shopping_bags} => {soda} 0.001525165 0.2830189 0.005388917 1.6230266 15
## [5825] {long_life_bakery_product,
## soda} => {shopping_bags} 0.001525165 0.2000000 0.007625826 2.0299278 15
## [5826] {long_life_bakery_product,
## shopping_bags} => {yogurt} 0.001321810 0.2452830 0.005388917 1.7582788 13
## [5827] {long_life_bakery_product,
## shopping_bags} => {other_vegetables} 0.001626843 0.3018868 0.005388917 1.5601979 16
## [5828] {long_life_bakery_product,
## shopping_bags} => {whole_milk} 0.001931876 0.3584906 0.005388917 1.4030063 19
## [5829] {long_life_bakery_product,
## sausage} => {tropical_fruit} 0.001525165 0.2830189 0.005388917 2.6971808 15
## [5830] {long_life_bakery_product,
## tropical_fruit} => {sausage} 0.001525165 0.2419355 0.006304016 2.5751466 15
## [5831] {long_life_bakery_product,
## sausage} => {root_vegetables} 0.001220132 0.2264151 0.005388917 2.0772318 12
## [5832] {long_life_bakery_product,
## root_vegetables} => {sausage} 0.001220132 0.2307692 0.005287239 2.4562937 12
## [5833] {long_life_bakery_product,
## sausage} => {soda} 0.001321810 0.2452830 0.005388917 1.4066230 13
## [5834] {long_life_bakery_product,
## sausage} => {yogurt} 0.001830198 0.3396226 0.005388917 2.4345399 18
## [5835] {long_life_bakery_product,
## yogurt} => {sausage} 0.001830198 0.2093023 0.008744281 2.2278013 18
## [5836] {long_life_bakery_product,
## sausage} => {rolls/buns} 0.001220132 0.2264151 0.005388917 1.2309522 12
## [5837] {long_life_bakery_product,
## sausage} => {other_vegetables} 0.001830198 0.3396226 0.005388917 1.7552226 18
## [5838] {long_life_bakery_product,
## sausage} => {whole_milk} 0.002745297 0.5094340 0.005388917 1.9937457 27
## [5839] {long_life_bakery_product,
## whole_milk} => {sausage} 0.002745297 0.2030075 0.013523132 2.1607997 27
## [5840] {bottled_water,
## long_life_bakery_product} => {tropical_fruit} 0.001321810 0.3095238 0.004270463 2.9497739 13
## [5841] {long_life_bakery_product,
## tropical_fruit} => {bottled_water} 0.001321810 0.2096774 0.006304016 1.8971273 13
## [5842] {bottled_water,
## long_life_bakery_product} => {soda} 0.001016777 0.2380952 0.004270463 1.3654033 10
## [5843] {bottled_water,
## long_life_bakery_product} => {yogurt} 0.001626843 0.3809524 0.004270463 2.7308066 16
## [5844] {bottled_water,
## long_life_bakery_product} => {rolls/buns} 0.001016777 0.2380952 0.004270463 1.2944537 10
## [5845] {bottled_water,
## long_life_bakery_product} => {other_vegetables} 0.001525165 0.3571429 0.004270463 1.8457698 15
## [5846] {bottled_water,
## long_life_bakery_product} => {whole_milk} 0.002135231 0.5000000 0.004270463 1.9568245 21
## [5847] {long_life_bakery_product,
## tropical_fruit} => {root_vegetables} 0.001321810 0.2096774 0.006304016 1.9236730 13
## [5848] {long_life_bakery_product,
## root_vegetables} => {tropical_fruit} 0.001321810 0.2500000 0.005287239 2.3825097 13
## [5849] {long_life_bakery_product,
## tropical_fruit} => {soda} 0.001321810 0.2096774 0.006304016 1.2024358 13
## [5850] {long_life_bakery_product,
## tropical_fruit} => {yogurt} 0.002440264 0.3870968 0.006304016 2.7748519 24
## [5851] {long_life_bakery_product,
## yogurt} => {tropical_fruit} 0.002440264 0.2790698 0.008744281 2.6595457 24
## [5852] {long_life_bakery_product,
## tropical_fruit} => {rolls/buns} 0.001525165 0.2419355 0.006304016 1.3153319 15
## [5853] {long_life_bakery_product,
## tropical_fruit} => {other_vegetables} 0.002643620 0.4193548 0.006304016 2.1672910 26
## [5854] {long_life_bakery_product,
## other_vegetables} => {tropical_fruit} 0.002643620 0.2476190 0.010676157 2.3598191 26
## [5855] {long_life_bakery_product,
## tropical_fruit} => {whole_milk} 0.003253686 0.5161290 0.006304016 2.0199479 32
## [5856] {long_life_bakery_product,
## whole_milk} => {tropical_fruit} 0.003253686 0.2406015 0.013523132 2.2929417 32
## [5857] {long_life_bakery_product,
## root_vegetables} => {yogurt} 0.001931876 0.3653846 0.005287239 2.6192111 19
## [5858] {long_life_bakery_product,
## yogurt} => {root_vegetables} 0.001931876 0.2209302 0.008744281 2.0269112 19
## [5859] {long_life_bakery_product,
## root_vegetables} => {rolls/buns} 0.001423488 0.2692308 0.005287239 1.4637284 14
## [5860] {long_life_bakery_product,
## root_vegetables} => {other_vegetables} 0.003355363 0.6346154 0.005287239 3.2797910 33
## [5861] {long_life_bakery_product,
## other_vegetables} => {root_vegetables} 0.003355363 0.3142857 0.010676157 2.8833955 33
## [5862] {long_life_bakery_product,
## root_vegetables} => {whole_milk} 0.002948653 0.5576923 0.005287239 2.1826120 29
## [5863] {long_life_bakery_product,
## whole_milk} => {root_vegetables} 0.002948653 0.2180451 0.013523132 2.0004419 29
## [5864] {long_life_bakery_product,
## soda} => {yogurt} 0.001931876 0.2533333 0.007625826 1.8159864 19
## [5865] {long_life_bakery_product,
## yogurt} => {soda} 0.001931876 0.2209302 0.008744281 1.2669673 19
## [5866] {long_life_bakery_product,
## soda} => {rolls/buns} 0.002338587 0.3066667 0.007625826 1.6672563 23
## [5867] {long_life_bakery_product,
## rolls/buns} => {soda} 0.002338587 0.2948718 0.007930859 1.6909995 23
## [5868] {long_life_bakery_product,
## soda} => {other_vegetables} 0.001626843 0.2133333 0.007625826 1.1025398 16
## [5869] {long_life_bakery_product,
## soda} => {whole_milk} 0.003050330 0.4000000 0.007625826 1.5654596 30
## [5870] {long_life_bakery_product,
## whole_milk} => {soda} 0.003050330 0.2255639 0.013523132 1.2935400 30
## [5871] {long_life_bakery_product,
## yogurt} => {rolls/buns} 0.002033554 0.2325581 0.008744281 1.2643501 20
## [5872] {long_life_bakery_product,
## rolls/buns} => {yogurt} 0.002033554 0.2564103 0.007930859 1.8380429 20
## [5873] {long_life_bakery_product,
## yogurt} => {other_vegetables} 0.003660397 0.4186047 0.008744281 2.1634139 36
## [5874] {long_life_bakery_product,
## other_vegetables} => {yogurt} 0.003660397 0.3428571 0.010676157 2.4577259 36
## [5875] {long_life_bakery_product,
## yogurt} => {whole_milk} 0.004575496 0.5232558 0.008744281 2.0478396 45
## [5876] {long_life_bakery_product,
## whole_milk} => {yogurt} 0.004575496 0.3383459 0.013523132 2.4253874 45
## [5877] {long_life_bakery_product,
## rolls/buns} => {other_vegetables} 0.002135231 0.2692308 0.007930859 1.3914265 21
## [5878] {long_life_bakery_product,
## other_vegetables} => {rolls/buns} 0.002135231 0.2000000 0.010676157 1.0873411 21
## [5879] {long_life_bakery_product,
## rolls/buns} => {whole_milk} 0.003457041 0.4358974 0.007930859 1.7059496 34
## [5880] {long_life_bakery_product,
## whole_milk} => {rolls/buns} 0.003457041 0.2556391 0.013523132 1.3898345 34
## [5881] {long_life_bakery_product,
## other_vegetables} => {whole_milk} 0.005693950 0.5333333 0.010676157 2.0872795 56
## [5882] {long_life_bakery_product,
## whole_milk} => {other_vegetables} 0.005693950 0.4210526 0.013523132 2.1760655 56
## [5883] {cream_cheese_,
## dessert} => {pip_fruit} 0.001016777 0.2857143 0.003558719 3.7768817 10
## [5884] {dessert,
## pip_fruit} => {cream_cheese_} 0.001016777 0.2040816 0.004982206 5.1465201 10
## [5885] {cream_cheese_,
## dessert} => {tropical_fruit} 0.001118454 0.3142857 0.003558719 2.9951550 11
## [5886] {cream_cheese_,
## dessert} => {yogurt} 0.001220132 0.3428571 0.003558719 2.4577259 12
## [5887] {cream_cheese_,
## dessert} => {rolls/buns} 0.001118454 0.3142857 0.003558719 1.7086788 11
## [5888] {cream_cheese_,
## dessert} => {other_vegetables} 0.001728521 0.4857143 0.003558719 2.5102470 17
## [5889] {cream_cheese_,
## dessert} => {whole_milk} 0.001423488 0.4000000 0.003558719 1.5654596 14
## [5890] {chicken,
## dessert} => {soda} 0.001016777 0.4347826 0.002338587 2.4933452 10
## [5891] {chicken,
## dessert} => {other_vegetables} 0.001525165 0.6521739 0.002338587 3.3705362 15
## [5892] {dessert,
## white_bread} => {fruit/vegetable_juice} 0.001016777 0.2564103 0.003965430 3.5468282 10
## [5893] {dessert,
## white_bread} => {pip_fruit} 0.001016777 0.2564103 0.003965430 3.3895092 10
## [5894] {dessert,
## pip_fruit} => {white_bread} 0.001016777 0.2040816 0.004982206 4.8481712 10
## [5895] {dessert,
## white_bread} => {shopping_bags} 0.001016777 0.2564103 0.003965430 2.6024715 10
## [5896] {dessert,
## white_bread} => {sausage} 0.001118454 0.2820513 0.003965430 3.0021368 11
## [5897] {dessert,
## white_bread} => {soda} 0.001016777 0.2564103 0.003965430 1.4704343 10
## [5898] {dessert,
## white_bread} => {yogurt} 0.001220132 0.3076923 0.003965430 2.2056515 12
## [5899] {dessert,
## white_bread} => {other_vegetables} 0.001626843 0.4102564 0.003965430 2.1202689 16
## [5900] {dessert,
## white_bread} => {whole_milk} 0.001525165 0.3846154 0.003965430 1.5052496 15
## [5901] {chocolate,
## dessert} => {fruit/vegetable_juice} 0.001016777 0.2777778 0.003660397 3.8423972 10
## [5902] {chocolate,
## dessert} => {pip_fruit} 0.001016777 0.2777778 0.003660397 3.6719683 10
## [5903] {dessert,
## pip_fruit} => {chocolate} 0.001016777 0.2040816 0.004982206 4.1129977 10
## [5904] {chocolate,
## dessert} => {pastry} 0.001016777 0.2777778 0.003660397 3.1222222 10
## [5905] {chocolate,
## dessert} => {soda} 0.001321810 0.3611111 0.003660397 2.0708617 13
## [5906] {chocolate,
## dessert} => {yogurt} 0.001423488 0.3888889 0.003660397 2.7876984 14
## [5907] {chocolate,
## dessert} => {rolls/buns} 0.001118454 0.3055556 0.003660397 1.6612155 11
## [5908] {chocolate,
## dessert} => {other_vegetables} 0.001321810 0.3611111 0.003660397 1.8662784 13
## [5909] {chocolate,
## dessert} => {whole_milk} 0.001931876 0.5277778 0.003660397 2.0655370 19
## [5910] {coffee,
## dessert} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [5911] {dessert,
## frozen_vegetables} => {yogurt} 0.001525165 0.4838710 0.003152008 3.4685648 15
## [5912] {dessert,
## frozen_vegetables} => {other_vegetables} 0.001423488 0.4516129 0.003152008 2.3340057 14
## [5913] {dessert,
## frozen_vegetables} => {whole_milk} 0.001118454 0.3548387 0.003152008 1.3887142 11
## [5914] {beef,
## dessert} => {root_vegetables} 0.001321810 0.5000000 0.002643620 4.5872201 13
## [5915] {dessert,
## root_vegetables} => {beef} 0.001321810 0.2280702 0.005795628 4.3470352 13
## [5916] {beef,
## dessert} => {yogurt} 0.001118454 0.4230769 0.002643620 3.0327708 11
## [5917] {beef,
## dessert} => {rolls/buns} 0.001016777 0.3846154 0.002643620 2.0910405 10
## [5918] {beef,
## dessert} => {other_vegetables} 0.001423488 0.5384615 0.002643620 2.7828530 14
## [5919] {beef,
## dessert} => {whole_milk} 0.001118454 0.4230769 0.002643620 1.6557746 11
## [5920] {dessert,
## napkins} => {curd} 0.001016777 0.2857143 0.003558719 5.3625954 10
## [5921] {curd,
## napkins} => {dessert} 0.001016777 0.2127660 0.004778851 5.7330224 10
## [5922] {brown_bread,
## dessert} => {curd} 0.001016777 0.2127660 0.004778851 3.9934221 10
## [5923] {brown_bread,
## curd} => {dessert} 0.001016777 0.2083333 0.004880529 5.6135845 10
## [5924] {curd,
## dessert} => {fruit/vegetable_juice} 0.001118454 0.2156863 0.005185562 2.9835085 11
## [5925] {curd,
## fruit/vegetable_juice} => {dessert} 0.001118454 0.2291667 0.004880529 6.1749429 11
## [5926] {curd,
## dessert} => {whipped/sour_cream} 0.001118454 0.2156863 0.005185562 3.0089000 11
## [5927] {dessert,
## whipped/sour_cream} => {curd} 0.001118454 0.2291667 0.004880529 4.3012484 11
## [5928] {curd,
## dessert} => {pip_fruit} 0.001220132 0.2352941 0.005185562 3.1103732 12
## [5929] {dessert,
## pip_fruit} => {curd} 0.001220132 0.2448980 0.004982206 4.5965104 12
## [5930] {curd,
## dessert} => {shopping_bags} 0.001118454 0.2156863 0.005185562 2.1891378 11
## [5931] {curd,
## shopping_bags} => {dessert} 0.001118454 0.2075472 0.005388917 5.5924011 11
## [5932] {curd,
## dessert} => {tropical_fruit} 0.001626843 0.3137255 0.005185562 2.9898161 16
## [5933] {dessert,
## tropical_fruit} => {curd} 0.001626843 0.2580645 0.006304016 4.8436346 16
## [5934] {curd,
## dessert} => {root_vegetables} 0.001118454 0.2156863 0.005185562 1.9788008 11
## [5935] {curd,
## dessert} => {soda} 0.001220132 0.2352941 0.005185562 1.3493397 12
## [5936] {curd,
## dessert} => {yogurt} 0.002033554 0.3921569 0.005185562 2.8111244 20
## [5937] {dessert,
## yogurt} => {curd} 0.002033554 0.2061856 0.009862735 3.8699142 20
## [5938] {curd,
## dessert} => {rolls/buns} 0.001118454 0.2156863 0.005185562 1.1726227 11
## [5939] {curd,
## dessert} => {other_vegetables} 0.002033554 0.3921569 0.005185562 2.0267277 20
## [5940] {curd,
## dessert} => {whole_milk} 0.002745297 0.5294118 0.005185562 2.0719318 27
## [5941] {dessert,
## whole_milk} => {curd} 0.002745297 0.2000000 0.013726487 3.7538168 27
## [5942] {dessert,
## napkins} => {tropical_fruit} 0.001118454 0.3142857 0.003558719 2.9951550 11
## [5943] {dessert,
## napkins} => {root_vegetables} 0.001016777 0.2857143 0.003558719 2.6212687 10
## [5944] {dessert,
## napkins} => {soda} 0.001728521 0.4857143 0.003558719 2.7854227 17
## [5945] {dessert,
## napkins} => {yogurt} 0.001626843 0.4571429 0.003558719 3.2769679 16
## [5946] {dessert,
## napkins} => {rolls/buns} 0.001321810 0.3714286 0.003558719 2.0193477 13
## [5947] {dessert,
## napkins} => {other_vegetables} 0.001423488 0.4000000 0.003558719 2.0672622 14
## [5948] {dessert,
## napkins} => {whole_milk} 0.001423488 0.4000000 0.003558719 1.5654596 14
## [5949] {dessert,
## pork} => {root_vegetables} 0.001016777 0.3225806 0.003152008 2.9594969 10
## [5950] {dessert,
## pork} => {other_vegetables} 0.001626843 0.5161290 0.003152008 2.6674351 16
## [5951] {dessert,
## pork} => {whole_milk} 0.001321810 0.4193548 0.003152008 1.6412077 13
## [5952] {dessert,
## frankfurter} => {pastry} 0.001220132 0.3428571 0.003558719 3.8537143 12
## [5953] {dessert,
## pastry} => {frankfurter} 0.001220132 0.2264151 0.005388917 3.8392973 12
## [5954] {dessert,
## frankfurter} => {tropical_fruit} 0.001220132 0.3428571 0.003558719 3.2674419 12
## [5955] {dessert,
## frankfurter} => {other_vegetables} 0.001321810 0.3714286 0.003558719 1.9196006 13
## [5956] {dessert,
## frankfurter} => {whole_milk} 0.001220132 0.3428571 0.003558719 1.3418225 12
## [5957] {bottled_beer,
## dessert} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [5958] {brown_bread,
## dessert} => {pip_fruit} 0.001016777 0.2127660 0.004778851 2.8125715 10
## [5959] {dessert,
## pip_fruit} => {brown_bread} 0.001016777 0.2040816 0.004982206 3.1459919 10
## [5960] {brown_bread,
## dessert} => {pastry} 0.001321810 0.2765957 0.004778851 3.1089362 13
## [5961] {dessert,
## pastry} => {brown_bread} 0.001321810 0.2452830 0.005388917 3.7811262 13
## [5962] {brown_bread,
## dessert} => {shopping_bags} 0.001016777 0.2127660 0.004778851 2.1594976 10
## [5963] {brown_bread,
## dessert} => {sausage} 0.001220132 0.2553191 0.004778851 2.7176015 12
## [5964] {dessert,
## sausage} => {brown_bread} 0.001220132 0.2068966 0.005897306 3.1893849 12
## [5965] {brown_bread,
## dessert} => {tropical_fruit} 0.001118454 0.2340426 0.004778851 2.2304346 11
## [5966] {brown_bread,
## dessert} => {soda} 0.001423488 0.2978723 0.004778851 1.7082067 14
## [5967] {brown_bread,
## dessert} => {yogurt} 0.001728521 0.3617021 0.004778851 2.5928137 17
## [5968] {brown_bread,
## dessert} => {rolls/buns} 0.001016777 0.2127660 0.004778851 1.1567458 10
## [5969] {brown_bread,
## dessert} => {other_vegetables} 0.001728521 0.3617021 0.004778851 1.8693329 17
## [5970] {brown_bread,
## dessert} => {whole_milk} 0.001525165 0.3191489 0.004778851 1.2490369 15
## [5971] {dessert,
## margarine} => {whole_milk} 0.001525165 0.5000000 0.003050330 1.9568245 15
## [5972] {butter,
## dessert} => {pastry} 0.001118454 0.4074074 0.002745297 4.5792593 11
## [5973] {dessert,
## pastry} => {butter} 0.001118454 0.2075472 0.005388917 3.7453696 11
## [5974] {butter,
## dessert} => {yogurt} 0.001016777 0.3703704 0.002745297 2.6549509 10
## [5975] {butter,
## dessert} => {other_vegetables} 0.001118454 0.4074074 0.002745297 2.1055449 11
## [5976] {butter,
## dessert} => {whole_milk} 0.001728521 0.6296296 0.002745297 2.4641494 17
## [5977] {dessert,
## newspapers} => {shopping_bags} 0.001118454 0.3142857 0.003558719 3.1898865 11
## [5978] {dessert,
## newspapers} => {root_vegetables} 0.001016777 0.2857143 0.003558719 2.6212687 10
## [5979] {dessert,
## newspapers} => {soda} 0.001016777 0.2857143 0.003558719 1.6384840 10
## [5980] {dessert,
## newspapers} => {yogurt} 0.001118454 0.3142857 0.003558719 2.2529155 11
## [5981] {dessert,
## newspapers} => {other_vegetables} 0.001321810 0.3714286 0.003558719 1.9196006 13
## [5982] {dessert,
## newspapers} => {whole_milk} 0.001525165 0.4285714 0.003558719 1.6772782 15
## [5983] {dessert,
## domestic_eggs} => {whipped/sour_cream} 0.001016777 0.2564103 0.003965430 3.5770140 10
## [5984] {dessert,
## whipped/sour_cream} => {domestic_eggs} 0.001016777 0.2083333 0.004880529 3.2835871 10
## [5985] {dessert,
## domestic_eggs} => {pip_fruit} 0.001626843 0.4102564 0.003965430 5.4232148 16
## [5986] {dessert,
## pip_fruit} => {domestic_eggs} 0.001626843 0.3265306 0.004982206 5.1465201 16
## [5987] {dessert,
## domestic_eggs} => {sausage} 0.001118454 0.2820513 0.003965430 3.0021368 11
## [5988] {dessert,
## domestic_eggs} => {soda} 0.001423488 0.3589744 0.003965430 2.0586081 14
## [5989] {dessert,
## domestic_eggs} => {yogurt} 0.001321810 0.3333333 0.003965430 2.3894558 13
## [5990] {dessert,
## domestic_eggs} => {other_vegetables} 0.001626843 0.4102564 0.003965430 2.1202689 16
## [5991] {dessert,
## domestic_eggs} => {whole_milk} 0.001728521 0.4358974 0.003965430 1.7059496 17
## [5992] {dessert,
## fruit/vegetable_juice} => {whipped/sour_cream} 0.001626843 0.2711864 0.005998983 3.7831470 16
## [5993] {dessert,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001626843 0.3333333 0.004880529 4.6108767 16
## [5994] {dessert,
## pip_fruit} => {fruit/vegetable_juice} 0.001016777 0.2040816 0.004982206 2.8229857 10
## [5995] {citrus_fruit,
## dessert} => {fruit/vegetable_juice} 0.001016777 0.2380952 0.004270463 3.2934834 10
## [5996] {dessert,
## fruit/vegetable_juice} => {bottled_water} 0.001525165 0.2542373 0.005998983 2.3002978 15
## [5997] {bottled_water,
## dessert} => {fruit/vegetable_juice} 0.001525165 0.2941176 0.005185562 4.0684206 15
## [5998] {dessert,
## fruit/vegetable_juice} => {tropical_fruit} 0.001931876 0.3220339 0.005998983 3.0689955 19
## [5999] {dessert,
## tropical_fruit} => {fruit/vegetable_juice} 0.001931876 0.3064516 0.006304016 4.2390318 19
## [6000] {dessert,
## fruit/vegetable_juice} => {root_vegetables} 0.001728521 0.2881356 0.005998983 2.6434828 17
## [6001] {dessert,
## root_vegetables} => {fruit/vegetable_juice} 0.001728521 0.2982456 0.005795628 4.1255213 17
## [6002] {dessert,
## fruit/vegetable_juice} => {soda} 0.001728521 0.2881356 0.005998983 1.6523694 17
## [6003] {dessert,
## fruit/vegetable_juice} => {yogurt} 0.002338587 0.3898305 0.005998983 2.7944483 23
## [6004] {dessert,
## yogurt} => {fruit/vegetable_juice} 0.002338587 0.2371134 0.009862735 3.2799020 23
## [6005] {dessert,
## fruit/vegetable_juice} => {other_vegetables} 0.002643620 0.4406780 0.005998983 2.2774923 26
## [6006] {dessert,
## other_vegetables} => {fruit/vegetable_juice} 0.002643620 0.2280702 0.011591256 3.1548104 26
## [6007] {dessert,
## fruit/vegetable_juice} => {whole_milk} 0.002643620 0.4406780 0.005998983 1.7246589 26
## [6008] {dessert,
## whipped/sour_cream} => {pip_fruit} 0.001626843 0.3333333 0.004880529 4.4063620 16
## [6009] {dessert,
## pip_fruit} => {whipped/sour_cream} 0.001626843 0.3265306 0.004982206 4.5552178 16
## [6010] {dessert,
## whipped/sour_cream} => {pastry} 0.001016777 0.2083333 0.004880529 2.3416667 10
## [6011] {dessert,
## whipped/sour_cream} => {shopping_bags} 0.001016777 0.2083333 0.004880529 2.1145081 10
## [6012] {dessert,
## whipped/sour_cream} => {sausage} 0.001220132 0.2500000 0.004880529 2.6609848 12
## [6013] {dessert,
## sausage} => {whipped/sour_cream} 0.001220132 0.2068966 0.005897306 2.8862803 12
## [6014] {dessert,
## whipped/sour_cream} => {bottled_water} 0.001220132 0.2500000 0.004880529 2.2619595 12
## [6015] {bottled_water,
## dessert} => {whipped/sour_cream} 0.001220132 0.2352941 0.005185562 3.2824364 12
## [6016] {dessert,
## whipped/sour_cream} => {tropical_fruit} 0.001220132 0.2500000 0.004880529 2.3825097 12
## [6017] {dessert,
## whipped/sour_cream} => {root_vegetables} 0.001423488 0.2916667 0.004880529 2.6758784 14
## [6018] {dessert,
## root_vegetables} => {whipped/sour_cream} 0.001423488 0.2456140 0.005795628 3.4264029 14
## [6019] {dessert,
## whipped/sour_cream} => {soda} 0.001525165 0.3125000 0.004880529 1.7920918 15
## [6020] {dessert,
## whipped/sour_cream} => {yogurt} 0.002135231 0.4375000 0.004880529 3.1361607 21
## [6021] {dessert,
## yogurt} => {whipped/sour_cream} 0.002135231 0.2164948 0.009862735 3.0201799 21
## [6022] {dessert,
## whipped/sour_cream} => {rolls/buns} 0.001016777 0.2083333 0.004880529 1.1326470 10
## [6023] {dessert,
## whipped/sour_cream} => {other_vegetables} 0.002846975 0.5833333 0.004880529 3.0147574 28
## [6024] {dessert,
## other_vegetables} => {whipped/sour_cream} 0.002846975 0.2456140 0.011591256 3.4264029 28
## [6025] {dessert,
## whipped/sour_cream} => {whole_milk} 0.002643620 0.5416667 0.004880529 2.1198932 26
## [6026] {dessert,
## pip_fruit} => {sausage} 0.001321810 0.2653061 0.004982206 2.8239023 13
## [6027] {dessert,
## sausage} => {pip_fruit} 0.001321810 0.2241379 0.005897306 2.9628986 13
## [6028] {dessert,
## pip_fruit} => {tropical_fruit} 0.001728521 0.3469388 0.004982206 3.3063400 17
## [6029] {dessert,
## tropical_fruit} => {pip_fruit} 0.001728521 0.2741935 0.006304016 3.6245881 17
## [6030] {dessert,
## pip_fruit} => {root_vegetables} 0.001525165 0.3061224 0.004982206 2.8085021 15
## [6031] {dessert,
## root_vegetables} => {pip_fruit} 0.001525165 0.2631579 0.005795628 3.4787068 15
## [6032] {dessert,
## pip_fruit} => {soda} 0.001118454 0.2244898 0.004982206 1.2873803 11
## [6033] {dessert,
## pip_fruit} => {yogurt} 0.002135231 0.4285714 0.004982206 3.0721574 21
## [6034] {dessert,
## yogurt} => {pip_fruit} 0.002135231 0.2164948 0.009862735 2.8618640 21
## [6035] {dessert,
## pip_fruit} => {rolls/buns} 0.001525165 0.3061224 0.004982206 1.6642976 15
## [6036] {dessert,
## rolls/buns} => {pip_fruit} 0.001525165 0.2238806 0.006812405 2.9594969 15
## [6037] {dessert,
## pip_fruit} => {other_vegetables} 0.002745297 0.5510204 0.004982206 2.8477592 27
## [6038] {dessert,
## other_vegetables} => {pip_fruit} 0.002745297 0.2368421 0.011591256 3.1308362 27
## [6039] {dessert,
## pip_fruit} => {whole_milk} 0.002846975 0.5714286 0.004982206 2.2363709 28
## [6040] {dessert,
## whole_milk} => {pip_fruit} 0.002846975 0.2074074 0.013726487 2.7417364 28
## [6041] {dessert,
## pastry} => {shopping_bags} 0.001220132 0.2264151 0.005388917 2.2980314 12
## [6042] {dessert,
## pastry} => {sausage} 0.001423488 0.2641509 0.005388917 2.8116066 14
## [6043] {dessert,
## sausage} => {pastry} 0.001423488 0.2413793 0.005897306 2.7131034 14
## [6044] {dessert,
## pastry} => {tropical_fruit} 0.001423488 0.2641509 0.005388917 2.5173687 14
## [6045] {dessert,
## tropical_fruit} => {pastry} 0.001423488 0.2258065 0.006304016 2.5380645 14
## [6046] {dessert,
## pastry} => {root_vegetables} 0.001220132 0.2264151 0.005388917 2.0772318 12
## [6047] {dessert,
## root_vegetables} => {pastry} 0.001220132 0.2105263 0.005795628 2.3663158 12
## [6048] {dessert,
## pastry} => {soda} 0.002236909 0.4150943 0.005388917 2.3804390 22
## [6049] {dessert,
## soda} => {pastry} 0.002236909 0.2268041 0.009862735 2.5492784 22
## [6050] {dessert,
## pastry} => {yogurt} 0.001728521 0.3207547 0.005388917 2.2992876 17
## [6051] {dessert,
## pastry} => {other_vegetables} 0.001931876 0.3584906 0.005388917 1.8527350 19
## [6052] {dessert,
## pastry} => {whole_milk} 0.002236909 0.4150943 0.005388917 1.6245336 22
## [6053] {citrus_fruit,
## dessert} => {tropical_fruit} 0.001118454 0.2619048 0.004270463 2.4959625 11
## [6054] {citrus_fruit,
## dessert} => {root_vegetables} 0.001220132 0.2857143 0.004270463 2.6212687 12
## [6055] {dessert,
## root_vegetables} => {citrus_fruit} 0.001220132 0.2105263 0.005795628 2.5436441 12
## [6056] {citrus_fruit,
## dessert} => {yogurt} 0.001321810 0.3095238 0.004270463 2.2187804 13
## [6057] {citrus_fruit,
## dessert} => {other_vegetables} 0.001931876 0.4523810 0.004270463 2.3379751 19
## [6058] {citrus_fruit,
## dessert} => {whole_milk} 0.001423488 0.3333333 0.004270463 1.3045497 14
## [6059] {dessert,
## root_vegetables} => {shopping_bags} 0.001220132 0.2105263 0.005795628 2.1367661 12
## [6060] {dessert,
## shopping_bags} => {soda} 0.002440264 0.3934426 0.006202339 2.2562730 24
## [6061] {dessert,
## soda} => {shopping_bags} 0.002440264 0.2474227 0.009862735 2.5112508 24
## [6062] {dessert,
## shopping_bags} => {yogurt} 0.001423488 0.2295082 0.006202339 1.6451991 14
## [6063] {dessert,
## shopping_bags} => {other_vegetables} 0.001830198 0.2950820 0.006202339 1.5250295 18
## [6064] {dessert,
## shopping_bags} => {whole_milk} 0.001931876 0.3114754 0.006202339 1.2190054 19
## [6065] {dessert,
## sausage} => {soda} 0.002236909 0.3793103 0.005897306 2.1752287 22
## [6066] {dessert,
## soda} => {sausage} 0.002236909 0.2268041 0.009862735 2.4140893 22
## [6067] {dessert,
## sausage} => {yogurt} 0.001830198 0.3103448 0.005897306 2.2246657 18
## [6068] {dessert,
## sausage} => {rolls/buns} 0.001220132 0.2068966 0.005897306 1.1248356 12
## [6069] {dessert,
## sausage} => {other_vegetables} 0.003253686 0.5517241 0.005897306 2.8513962 32
## [6070] {dessert,
## other_vegetables} => {sausage} 0.003253686 0.2807018 0.011591256 2.9877725 32
## [6071] {dessert,
## sausage} => {whole_milk} 0.002846975 0.4827586 0.005897306 1.8893478 28
## [6072] {dessert,
## whole_milk} => {sausage} 0.002846975 0.2074074 0.013726487 2.2076319 28
## [6073] {bottled_water,
## dessert} => {tropical_fruit} 0.001118454 0.2156863 0.005185562 2.0554986 11
## [6074] {bottled_water,
## dessert} => {soda} 0.001830198 0.3529412 0.005185562 2.0240096 18
## [6075] {bottled_water,
## dessert} => {yogurt} 0.001728521 0.3333333 0.005185562 2.3894558 17
## [6076] {bottled_water,
## dessert} => {rolls/buns} 0.001220132 0.2352941 0.005185562 1.2792248 12
## [6077] {bottled_water,
## dessert} => {other_vegetables} 0.002236909 0.4313725 0.005185562 2.2294004 22
## [6078] {bottled_water,
## dessert} => {whole_milk} 0.002236909 0.4313725 0.005185562 1.6882408 22
## [6079] {dessert,
## tropical_fruit} => {root_vegetables} 0.001423488 0.2258065 0.006304016 2.0716478 14
## [6080] {dessert,
## root_vegetables} => {tropical_fruit} 0.001423488 0.2456140 0.005795628 2.3407113 14
## [6081] {dessert,
## tropical_fruit} => {soda} 0.001525165 0.2419355 0.006304016 1.3874259 15
## [6082] {dessert,
## tropical_fruit} => {yogurt} 0.002440264 0.3870968 0.006304016 2.7748519 24
## [6083] {dessert,
## yogurt} => {tropical_fruit} 0.002440264 0.2474227 0.009862735 2.3579477 24
## [6084] {dessert,
## tropical_fruit} => {other_vegetables} 0.002846975 0.4516129 0.006304016 2.3340057 28
## [6085] {dessert,
## other_vegetables} => {tropical_fruit} 0.002846975 0.2456140 0.011591256 2.3407113 28
## [6086] {dessert,
## tropical_fruit} => {whole_milk} 0.002846975 0.4516129 0.006304016 1.7674544 28
## [6087] {dessert,
## whole_milk} => {tropical_fruit} 0.002846975 0.2074074 0.013726487 1.9766006 28
## [6088] {dessert,
## root_vegetables} => {soda} 0.001423488 0.2456140 0.005795628 1.4085213 14
## [6089] {dessert,
## root_vegetables} => {yogurt} 0.002440264 0.4210526 0.005795628 3.0182599 24
## [6090] {dessert,
## yogurt} => {root_vegetables} 0.002440264 0.2474227 0.009862735 2.2699646 24
## [6091] {dessert,
## root_vegetables} => {other_vegetables} 0.003457041 0.5964912 0.005795628 3.0827594 34
## [6092] {dessert,
## other_vegetables} => {root_vegetables} 0.003457041 0.2982456 0.011591256 2.7362366 34
## [6093] {dessert,
## root_vegetables} => {whole_milk} 0.002440264 0.4210526 0.005795628 1.6478522 24
## [6094] {dessert,
## soda} => {yogurt} 0.003050330 0.3092784 0.009862735 2.2170208 30
## [6095] {dessert,
## yogurt} => {soda} 0.003050330 0.3092784 0.009862735 1.7736167 30
## [6096] {dessert,
## soda} => {rolls/buns} 0.002033554 0.2061856 0.009862735 1.1209702 20
## [6097] {dessert,
## rolls/buns} => {soda} 0.002033554 0.2985075 0.006812405 1.7118489 20
## [6098] {dessert,
## soda} => {other_vegetables} 0.003253686 0.3298969 0.009862735 1.7049585 32
## [6099] {dessert,
## other_vegetables} => {soda} 0.003253686 0.2807018 0.011591256 1.6097386 32
## [6100] {dessert,
## soda} => {whole_milk} 0.003660397 0.3711340 0.009862735 1.4524883 36
## [6101] {dessert,
## whole_milk} => {soda} 0.003660397 0.2666667 0.013726487 1.5292517 36
## [6102] {dessert,
## yogurt} => {rolls/buns} 0.002338587 0.2371134 0.009862735 1.2891157 23
## [6103] {dessert,
## rolls/buns} => {yogurt} 0.002338587 0.3432836 0.006812405 2.4607828 23
## [6104] {dessert,
## yogurt} => {other_vegetables} 0.004575496 0.4639175 0.009862735 2.3975979 45
## [6105] {dessert,
## other_vegetables} => {yogurt} 0.004575496 0.3947368 0.011591256 2.8296187 45
## [6106] {dessert,
## yogurt} => {whole_milk} 0.004778851 0.4845361 0.009862735 1.8963042 47
## [6107] {dessert,
## whole_milk} => {yogurt} 0.004778851 0.3481481 0.013726487 2.4956538 47
## [6108] {dessert,
## rolls/buns} => {other_vegetables} 0.002236909 0.3283582 0.006812405 1.6970063 22
## [6109] {dessert,
## rolls/buns} => {whole_milk} 0.002440264 0.3582090 0.006812405 1.4019041 24
## [6110] {dessert,
## other_vegetables} => {whole_milk} 0.004982206 0.4298246 0.011591256 1.6821825 49
## [6111] {dessert,
## whole_milk} => {other_vegetables} 0.004982206 0.3629630 0.013726487 1.8758490 49
## [6112] {canned_beer,
## chicken} => {soda} 0.001525165 0.4687500 0.003253686 2.6881378 15
## [6113] {canned_beer,
## chicken} => {other_vegetables} 0.001728521 0.5312500 0.003253686 2.7455826 17
## [6114] {canned_beer,
## chicken} => {whole_milk} 0.001220132 0.3750000 0.003253686 1.4676184 12
## [6115] {canned_beer,
## chocolate} => {soda} 0.001423488 0.4666667 0.003050330 2.6761905 14
## [6116] {canned_beer,
## coffee} => {shopping_bags} 0.001423488 0.3414634 0.004168785 3.4657303 14
## [6117] {canned_beer,
## coffee} => {soda} 0.001931876 0.4634146 0.004168785 2.6575411 19
## [6118] {canned_beer,
## coffee} => {other_vegetables} 0.001016777 0.2439024 0.004168785 1.2605257 10
## [6119] {beef,
## canned_beer} => {root_vegetables} 0.001016777 0.4761905 0.002135231 4.3687811 10
## [6120] {canned_beer,
## root_vegetables} => {beef} 0.001016777 0.2500000 0.004067107 4.7650194 10
## [6121] {canned_beer,
## pork} => {soda} 0.001525165 0.5172414 0.002948653 2.9662210 15
## [6122] {canned_beer,
## frankfurter} => {rolls/buns} 0.001118454 0.3928571 0.002846975 2.1358485 11
## [6123] {canned_beer,
## frankfurter} => {other_vegetables} 0.001118454 0.3928571 0.002846975 2.0303468 11
## [6124] {bottled_beer,
## canned_beer} => {other_vegetables} 0.001118454 0.4230769 0.002643620 2.1865273 11
## [6125] {bottled_beer,
## canned_beer} => {whole_milk} 0.001016777 0.3846154 0.002643620 1.5052496 10
## [6126] {brown_bread,
## canned_beer} => {shopping_bags} 0.001525165 0.3191489 0.004778851 3.2392464 15
## [6127] {brown_bread,
## canned_beer} => {sausage} 0.001016777 0.2127660 0.004778851 2.2646680 10
## [6128] {brown_bread,
## canned_beer} => {bottled_water} 0.001321810 0.2765957 0.004778851 2.5025935 13
## [6129] {brown_bread,
## canned_beer} => {soda} 0.001931876 0.4042553 0.004778851 2.3182805 19
## [6130] {brown_bread,
## canned_beer} => {yogurt} 0.001220132 0.2553191 0.004778851 1.8302215 12
## [6131] {canned_beer,
## yogurt} => {brown_bread} 0.001220132 0.2264151 0.005388917 3.4902703 12
## [6132] {brown_bread,
## canned_beer} => {rolls/buns} 0.001118454 0.2340426 0.004778851 1.2724204 11
## [6133] {brown_bread,
## canned_beer} => {other_vegetables} 0.001525165 0.3191489 0.004778851 1.6494113 15
## [6134] {brown_bread,
## canned_beer} => {whole_milk} 0.001220132 0.2553191 0.004778851 0.9992295 12
## [6135] {canned_beer,
## margarine} => {other_vegetables} 0.001423488 0.4666667 0.003050330 2.4118059 14
## [6136] {canned_beer,
## margarine} => {whole_milk} 0.001423488 0.4666667 0.003050330 1.8263695 14
## [6137] {butter,
## canned_beer} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [6138] {canned_beer,
## newspapers} => {soda} 0.001830198 0.3673469 0.004982206 2.1066222 18
## [6139] {canned_beer,
## newspapers} => {other_vegetables} 0.001016777 0.2040816 0.004982206 1.0547256 10
## [6140] {canned_beer,
## domestic_eggs} => {shopping_bags} 0.001423488 0.4000000 0.003558719 4.0598555 14
## [6141] {canned_beer,
## domestic_eggs} => {other_vegetables} 0.001626843 0.4571429 0.003558719 2.3625854 16
## [6142] {canned_beer,
## domestic_eggs} => {whole_milk} 0.001830198 0.5142857 0.003558719 2.0127338 18
## [6143] {canned_beer,
## whole_milk} => {domestic_eggs} 0.001830198 0.2068966 0.008845958 3.2609416 18
## [6144] {canned_beer,
## fruit/vegetable_juice} => {shopping_bags} 0.001118454 0.2820513 0.003965430 2.8627186 11
## [6145] {canned_beer,
## fruit/vegetable_juice} => {bottled_water} 0.001321810 0.3333333 0.003965430 3.0159460 13
## [6146] {canned_beer,
## fruit/vegetable_juice} => {soda} 0.001321810 0.3333333 0.003965430 1.9115646 13
## [6147] {canned_beer,
## fruit/vegetable_juice} => {yogurt} 0.001118454 0.2820513 0.003965430 2.0218472 11
## [6148] {canned_beer,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.2075472 0.005388917 2.8709232 11
## [6149] {canned_beer,
## fruit/vegetable_juice} => {rolls/buns} 0.001220132 0.3076923 0.003965430 1.6728324 12
## [6150] {canned_beer,
## fruit/vegetable_juice} => {other_vegetables} 0.001220132 0.3076923 0.003965430 1.5902017 12
## [6151] {canned_beer,
## fruit/vegetable_juice} => {whole_milk} 0.001321810 0.3333333 0.003965430 1.3045497 13
## [6152] {canned_beer,
## pip_fruit} => {soda} 0.001220132 0.3750000 0.003253686 2.1505102 12
## [6153] {canned_beer,
## pip_fruit} => {rolls/buns} 0.001220132 0.3750000 0.003253686 2.0387645 12
## [6154] {canned_beer,
## pip_fruit} => {other_vegetables} 0.001016777 0.3125000 0.003253686 1.6150486 10
## [6155] {canned_beer,
## pastry} => {shopping_bags} 0.001016777 0.2272727 0.004473818 2.3067361 10
## [6156] {canned_beer,
## pastry} => {bottled_water} 0.001016777 0.2272727 0.004473818 2.0563268 10
## [6157] {canned_beer,
## pastry} => {soda} 0.001525165 0.3409091 0.004473818 1.9550093 15
## [6158] {canned_beer,
## pastry} => {rolls/buns} 0.001118454 0.2500000 0.004473818 1.3591763 11
## [6159] {canned_beer,
## pastry} => {whole_milk} 0.001220132 0.2727273 0.004473818 1.0673588 12
## [6160] {canned_beer,
## citrus_fruit} => {shopping_bags} 0.001016777 0.2380952 0.004270463 2.4165807 10
## [6161] {canned_beer,
## citrus_fruit} => {soda} 0.001525165 0.3571429 0.004270463 2.0481050 15
## [6162] {canned_beer,
## citrus_fruit} => {rolls/buns} 0.001016777 0.2380952 0.004270463 1.2944537 10
## [6163] {canned_beer,
## citrus_fruit} => {other_vegetables} 0.001321810 0.3095238 0.004270463 1.5996672 13
## [6164] {canned_beer,
## citrus_fruit} => {whole_milk} 0.001016777 0.2380952 0.004270463 0.9318212 10
## [6165] {canned_beer,
## shopping_bags} => {sausage} 0.002643620 0.2321429 0.011387900 2.4709145 26
## [6166] {canned_beer,
## sausage} => {shopping_bags} 0.002643620 0.4193548 0.006304016 4.2563001 26
## [6167] {bottled_water,
## canned_beer} => {shopping_bags} 0.001626843 0.2025316 0.008032537 2.0556230 16
## [6168] {canned_beer,
## shopping_bags} => {soda} 0.003558719 0.3125000 0.011387900 1.7920918 35
## [6169] {canned_beer,
## soda} => {shopping_bags} 0.003558719 0.2573529 0.013828165 2.6120394 35
## [6170] {canned_beer,
## yogurt} => {shopping_bags} 0.001118454 0.2075472 0.005388917 2.1065288 11
## [6171] {canned_beer,
## shopping_bags} => {rolls/buns} 0.003253686 0.2857143 0.011387900 1.5533444 32
## [6172] {canned_beer,
## rolls/buns} => {shopping_bags} 0.003253686 0.2882883 0.011286223 2.9260220 32
## [6173] {canned_beer,
## other_vegetables} => {shopping_bags} 0.002033554 0.2247191 0.009049314 2.2808177 20
## [6174] {canned_beer,
## sausage} => {bottled_water} 0.001525165 0.2419355 0.006304016 2.1889931 15
## [6175] {canned_beer,
## sausage} => {soda} 0.002440264 0.3870968 0.006304016 2.2198815 24
## [6176] {canned_beer,
## yogurt} => {sausage} 0.001220132 0.2264151 0.005388917 2.4099485 12
## [6177] {canned_beer,
## sausage} => {rolls/buns} 0.002745297 0.4354839 0.006304016 2.3675975 27
## [6178] {canned_beer,
## rolls/buns} => {sausage} 0.002745297 0.2432432 0.011286223 2.5890663 27
## [6179] {canned_beer,
## sausage} => {other_vegetables} 0.001423488 0.2258065 0.006304016 1.1670029 14
## [6180] {bottled_water,
## canned_beer} => {soda} 0.002948653 0.3670886 0.008032537 2.1051408 29
## [6181] {canned_beer,
## soda} => {bottled_water} 0.002948653 0.2132353 0.013828165 1.9293184 29
## [6182] {bottled_water,
## canned_beer} => {yogurt} 0.001830198 0.2278481 0.008032537 1.6332989 18
## [6183] {canned_beer,
## yogurt} => {bottled_water} 0.001830198 0.3396226 0.005388917 3.0728507 18
## [6184] {bottled_water,
## canned_beer} => {rolls/buns} 0.001931876 0.2405063 0.008032537 1.3075620 19
## [6185] {bottled_water,
## canned_beer} => {other_vegetables} 0.002033554 0.2531646 0.008032537 1.3083938 20
## [6186] {canned_beer,
## other_vegetables} => {bottled_water} 0.002033554 0.2247191 0.009049314 2.0332220 20
## [6187] {bottled_water,
## canned_beer} => {whole_milk} 0.002135231 0.2658228 0.008032537 1.0403371 21
## [6188] {canned_beer,
## whole_milk} => {bottled_water} 0.002135231 0.2413793 0.008845958 2.1839609 21
## [6189] {canned_beer,
## tropical_fruit} => {soda} 0.001728521 0.5666667 0.003050330 3.2496599 17
## [6190] {canned_beer,
## tropical_fruit} => {whole_milk} 0.001118454 0.3666667 0.003050330 1.4350046 11
## [6191] {canned_beer,
## root_vegetables} => {rolls/buns} 0.001626843 0.4000000 0.004067107 2.1746821 16
## [6192] {canned_beer,
## root_vegetables} => {other_vegetables} 0.002033554 0.5000000 0.004067107 2.5840778 20
## [6193] {canned_beer,
## other_vegetables} => {root_vegetables} 0.002033554 0.2247191 0.009049314 2.0616720 20
## [6194] {canned_beer,
## root_vegetables} => {whole_milk} 0.001220132 0.3000000 0.004067107 1.1740947 12
## [6195] {canned_beer,
## yogurt} => {soda} 0.002135231 0.3962264 0.005388917 2.2722372 21
## [6196] {canned_beer,
## soda} => {rolls/buns} 0.003050330 0.2205882 0.013828165 1.1992732 30
## [6197] {canned_beer,
## rolls/buns} => {soda} 0.003050330 0.2702703 0.011286223 1.5499173 30
## [6198] {canned_beer,
## other_vegetables} => {soda} 0.002541942 0.2808989 0.009049314 1.6108691 25
## [6199] {canned_beer,
## soda} => {whole_milk} 0.003050330 0.2205882 0.013828165 0.8633049 30
## [6200] {canned_beer,
## whole_milk} => {soda} 0.003050330 0.3448276 0.008845958 1.9774806 30
## [6201] {canned_beer,
## yogurt} => {rolls/buns} 0.001728521 0.3207547 0.005388917 1.7438489 17
## [6202] {canned_beer,
## yogurt} => {other_vegetables} 0.001931876 0.3584906 0.005388917 1.8527350 19
## [6203] {canned_beer,
## other_vegetables} => {yogurt} 0.001931876 0.2134831 0.009049314 1.5303256 19
## [6204] {canned_beer,
## yogurt} => {whole_milk} 0.002236909 0.4150943 0.005388917 1.6245336 22
## [6205] {canned_beer,
## whole_milk} => {yogurt} 0.002236909 0.2528736 0.008845958 1.8126906 22
## [6206] {canned_beer,
## rolls/buns} => {other_vegetables} 0.002440264 0.2162162 0.011286223 1.1174390 24
## [6207] {canned_beer,
## other_vegetables} => {rolls/buns} 0.002440264 0.2696629 0.009049314 1.4660779 24
## [6208] {canned_beer,
## whole_milk} => {rolls/buns} 0.002236909 0.2528736 0.008845958 1.3747991 22
## [6209] {canned_beer,
## other_vegetables} => {whole_milk} 0.002846975 0.3146067 0.009049314 1.2312604 28
## [6210] {canned_beer,
## whole_milk} => {other_vegetables} 0.002846975 0.3218391 0.008845958 1.6633144 28
## [6211] {chicken,
## cream_cheese_} => {root_vegetables} 0.001118454 0.4074074 0.002745297 3.7377349 11
## [6212] {chicken,
## cream_cheese_} => {yogurt} 0.001118454 0.4074074 0.002745297 2.9204460 11
## [6213] {chicken,
## cream_cheese_} => {other_vegetables} 0.001321810 0.4814815 0.002745297 2.4883712 13
## [6214] {chicken,
## cream_cheese_} => {whole_milk} 0.001626843 0.5925926 0.002745297 2.3191994 16
## [6215] {cream_cheese_,
## white_bread} => {fruit/vegetable_juice} 0.001016777 0.2941176 0.003457041 4.0684206 10
## [6216] {cream_cheese_,
## white_bread} => {pip_fruit} 0.001016777 0.2941176 0.003457041 3.8879665 10
## [6217] {cream_cheese_,
## white_bread} => {tropical_fruit} 0.001321810 0.3823529 0.003457041 3.6438383 13
## [6218] {cream_cheese_,
## white_bread} => {root_vegetables} 0.001016777 0.2941176 0.003457041 2.6983648 10
## [6219] {cream_cheese_,
## white_bread} => {yogurt} 0.001118454 0.3235294 0.003457041 2.3191777 11
## [6220] {cream_cheese_,
## white_bread} => {other_vegetables} 0.001220132 0.3529412 0.003457041 1.8240549 12
## [6221] {cream_cheese_,
## white_bread} => {whole_milk} 0.001423488 0.4117647 0.003457041 1.6115025 14
## [6222] {chocolate,
## cream_cheese_} => {yogurt} 0.001321810 0.3513514 0.003762074 2.5186156 13
## [6223] {chocolate,
## cream_cheese_} => {rolls/buns} 0.001118454 0.2972973 0.003762074 1.6163178 11
## [6224] {chocolate,
## cream_cheese_} => {other_vegetables} 0.001220132 0.3243243 0.003762074 1.6761586 12
## [6225] {chocolate,
## cream_cheese_} => {whole_milk} 0.001931876 0.5135135 0.003762074 2.0097117 19
## [6226] {coffee,
## cream_cheese_} => {other_vegetables} 0.001423488 0.3783784 0.003762074 1.9555183 14
## [6227] {coffee,
## cream_cheese_} => {whole_milk} 0.001423488 0.3783784 0.003762074 1.4808402 14
## [6228] {cream_cheese_,
## frozen_vegetables} => {soda} 0.001016777 0.3448276 0.002948653 1.9774806 10
## [6229] {cream_cheese_,
## frozen_vegetables} => {yogurt} 0.001321810 0.4482759 0.002948653 3.2134061 13
## [6230] {cream_cheese_,
## frozen_vegetables} => {other_vegetables} 0.001423488 0.4827586 0.002948653 2.4949716 14
## [6231] {cream_cheese_,
## frozen_vegetables} => {whole_milk} 0.001525165 0.5172414 0.002948653 2.0243012 15
## [6232] {beef,
## cream_cheese_} => {curd} 0.001016777 0.2702703 0.003762074 5.0727254 10
## [6233] {cream_cheese_,
## curd} => {beef} 0.001016777 0.2000000 0.005083884 3.8120155 10
## [6234] {beef,
## curd} => {cream_cheese_} 0.001016777 0.2173913 0.004677173 5.4821628 10
## [6235] {beef,
## cream_cheese_} => {whipped/sour_cream} 0.001321810 0.3513514 0.003762074 4.9014759 13
## [6236] {cream_cheese_,
## whipped/sour_cream} => {beef} 0.001321810 0.2063492 0.006405694 3.9330319 13
## [6237] {beef,
## cream_cheese_} => {citrus_fruit} 0.001016777 0.2702703 0.003762074 3.2654891 10
## [6238] {beef,
## cream_cheese_} => {root_vegetables} 0.001626843 0.4324324 0.003762074 3.9673255 16
## [6239] {cream_cheese_,
## root_vegetables} => {beef} 0.001626843 0.2162162 0.007524148 4.1210978 16
## [6240] {beef,
## cream_cheese_} => {yogurt} 0.001830198 0.4864865 0.003762074 3.4873138 18
## [6241] {beef,
## cream_cheese_} => {rolls/buns} 0.001016777 0.2702703 0.003762074 1.4693798 10
## [6242] {beef,
## cream_cheese_} => {other_vegetables} 0.001525165 0.4054054 0.003762074 2.0951982 15
## [6243] {beef,
## cream_cheese_} => {whole_milk} 0.002135231 0.5675676 0.003762074 2.2212603 21
## [6244] {cream_cheese_,
## curd} => {margarine} 0.001016777 0.2000000 0.005083884 3.4149306 10
## [6245] {cream_cheese_,
## margarine} => {curd} 0.001016777 0.2173913 0.004677173 4.0802356 10
## [6246] {cream_cheese_,
## curd} => {domestic_eggs} 0.001016777 0.2000000 0.005083884 3.1522436 10
## [6247] {cream_cheese_,
## domestic_eggs} => {curd} 0.001016777 0.2000000 0.005083884 3.7538168 10
## [6248] {cream_cheese_,
## curd} => {whipped/sour_cream} 0.001728521 0.3400000 0.005083884 4.7431206 17
## [6249] {cream_cheese_,
## whipped/sour_cream} => {curd} 0.001728521 0.2698413 0.006405694 5.0646735 17
## [6250] {cream_cheese_,
## curd} => {pastry} 0.001016777 0.2000000 0.005083884 2.2480000 10
## [6251] {cream_cheese_,
## pastry} => {curd} 0.001016777 0.2272727 0.004473818 4.2657009 10
## [6252] {cream_cheese_,
## curd} => {sausage} 0.001118454 0.2200000 0.005083884 2.3416667 11
## [6253] {cream_cheese_,
## sausage} => {curd} 0.001118454 0.2000000 0.005592272 3.7538168 11
## [6254] {cream_cheese_,
## curd} => {root_vegetables} 0.002033554 0.4000000 0.005083884 3.6697761 20
## [6255] {cream_cheese_,
## root_vegetables} => {curd} 0.002033554 0.2702703 0.007524148 5.0727254 20
## [6256] {cream_cheese_,
## curd} => {yogurt} 0.002440264 0.4800000 0.005083884 3.4408163 24
## [6257] {cream_cheese_,
## curd} => {other_vegetables} 0.002745297 0.5400000 0.005083884 2.7908040 27
## [6258] {cream_cheese_,
## other_vegetables} => {curd} 0.002745297 0.2000000 0.013726487 3.7538168 27
## [6259] {cream_cheese_,
## curd} => {whole_milk} 0.002846975 0.5600000 0.005083884 2.1916435 28
## [6260] {cream_cheese_,
## napkins} => {domestic_eggs} 0.001118454 0.2750000 0.004067107 4.3343349 11
## [6261] {cream_cheese_,
## domestic_eggs} => {napkins} 0.001118454 0.2200000 0.005083884 4.2013592 11
## [6262] {cream_cheese_,
## napkins} => {root_vegetables} 0.001321810 0.3250000 0.004067107 2.9816931 13
## [6263] {cream_cheese_,
## napkins} => {yogurt} 0.001830198 0.4500000 0.004067107 3.2257653 18
## [6264] {cream_cheese_,
## napkins} => {rolls/buns} 0.001220132 0.3000000 0.004067107 1.6310116 12
## [6265] {cream_cheese_,
## napkins} => {other_vegetables} 0.001728521 0.4250000 0.004067107 2.1964661 17
## [6266] {cream_cheese_,
## napkins} => {whole_milk} 0.002338587 0.5750000 0.004067107 2.2503482 23
## [6267] {cream_cheese_,
## pork} => {whipped/sour_cream} 0.001016777 0.3448276 0.002948653 4.8104671 10
## [6268] {cream_cheese_,
## pork} => {root_vegetables} 0.001220132 0.4137931 0.002948653 3.7963201 12
## [6269] {cream_cheese_,
## pork} => {yogurt} 0.001220132 0.4137931 0.002948653 2.9662210 12
## [6270] {cream_cheese_,
## pork} => {other_vegetables} 0.001626843 0.5517241 0.002948653 2.8513962 16
## [6271] {cream_cheese_,
## pork} => {whole_milk} 0.001830198 0.6206897 0.002948653 2.4291615 18
## [6272] {cream_cheese_,
## frankfurter} => {domestic_eggs} 0.001016777 0.3030303 0.003355363 4.7761267 10
## [6273] {cream_cheese_,
## domestic_eggs} => {frankfurter} 0.001016777 0.2000000 0.005083884 3.3913793 10
## [6274] {cream_cheese_,
## frankfurter} => {whipped/sour_cream} 0.001118454 0.3333333 0.003355363 4.6501182 11
## [6275] {cream_cheese_,
## frankfurter} => {pip_fruit} 0.001016777 0.3030303 0.003355363 4.0057836 10
## [6276] {cream_cheese_,
## frankfurter} => {tropical_fruit} 0.001118454 0.3333333 0.003355363 3.1766796 11
## [6277] {cream_cheese_,
## frankfurter} => {yogurt} 0.001220132 0.3636364 0.003355363 2.6066790 12
## [6278] {cream_cheese_,
## frankfurter} => {rolls/buns} 0.001423488 0.4242424 0.003355363 2.3064811 14
## [6279] {cream_cheese_,
## frankfurter} => {other_vegetables} 0.001525165 0.4545455 0.003355363 2.3491616 15
## [6280] {cream_cheese_,
## frankfurter} => {whole_milk} 0.002135231 0.6363636 0.003355363 2.4905039 21
## [6281] {bottled_beer,
## cream_cheese_} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [6282] {brown_bread,
## cream_cheese_} => {pip_fruit} 0.001220132 0.2500000 0.004880529 3.3047715 12
## [6283] {cream_cheese_,
## pip_fruit} => {brown_bread} 0.001220132 0.2000000 0.006100661 3.0830721 12
## [6284] {brown_bread,
## cream_cheese_} => {sausage} 0.001016777 0.2083333 0.004880529 2.2174874 10
## [6285] {brown_bread,
## cream_cheese_} => {tropical_fruit} 0.001220132 0.2500000 0.004880529 2.3825097 12
## [6286] {brown_bread,
## cream_cheese_} => {yogurt} 0.001931876 0.3958333 0.004880529 2.8374787 19
## [6287] {brown_bread,
## cream_cheese_} => {rolls/buns} 0.001220132 0.2500000 0.004880529 1.3591763 12
## [6288] {brown_bread,
## cream_cheese_} => {other_vegetables} 0.001728521 0.3541667 0.004880529 1.8303884 17
## [6289] {brown_bread,
## cream_cheese_} => {whole_milk} 0.002440264 0.5000000 0.004880529 1.9568245 24
## [6290] {cream_cheese_,
## margarine} => {domestic_eggs} 0.001118454 0.2391304 0.004677173 3.7689869 11
## [6291] {cream_cheese_,
## domestic_eggs} => {margarine} 0.001118454 0.2200000 0.005083884 3.7564236 11
## [6292] {cream_cheese_,
## margarine} => {whipped/sour_cream} 0.001220132 0.2608696 0.004677173 3.6392229 12
## [6293] {cream_cheese_,
## margarine} => {pip_fruit} 0.001118454 0.2391304 0.004677173 3.1610858 11
## [6294] {cream_cheese_,
## margarine} => {citrus_fruit} 0.001118454 0.2391304 0.004677173 2.8892479 11
## [6295] {cream_cheese_,
## margarine} => {root_vegetables} 0.001321810 0.2826087 0.004677173 2.5927766 13
## [6296] {cream_cheese_,
## margarine} => {yogurt} 0.001931876 0.4130435 0.004677173 2.9608474 19
## [6297] {cream_cheese_,
## margarine} => {rolls/buns} 0.001220132 0.2608696 0.004677173 1.4182710 12
## [6298] {cream_cheese_,
## margarine} => {other_vegetables} 0.002236909 0.4782609 0.004677173 2.4717266 22
## [6299] {cream_cheese_,
## margarine} => {whole_milk} 0.001830198 0.3913043 0.004677173 1.5314279 18
## [6300] {butter,
## cream_cheese_} => {domestic_eggs} 0.001525165 0.3750000 0.004067107 5.9104567 15
## [6301] {cream_cheese_,
## domestic_eggs} => {butter} 0.001525165 0.3000000 0.005083884 5.4137615 15
## [6302] {butter,
## cream_cheese_} => {fruit/vegetable_juice} 0.001118454 0.2750000 0.004067107 3.8039733 11
## [6303] {butter,
## cream_cheese_} => {whipped/sour_cream} 0.001321810 0.3250000 0.004067107 4.5338652 13
## [6304] {cream_cheese_,
## whipped/sour_cream} => {butter} 0.001321810 0.2063492 0.006405694 3.7237513 13
## [6305] {butter,
## cream_cheese_} => {root_vegetables} 0.001118454 0.2750000 0.004067107 2.5229711 11
## [6306] {butter,
## cream_cheese_} => {yogurt} 0.002135231 0.5250000 0.004067107 3.7633929 21
## [6307] {butter,
## cream_cheese_} => {rolls/buns} 0.001016777 0.2500000 0.004067107 1.3591763 10
## [6308] {butter,
## cream_cheese_} => {other_vegetables} 0.001728521 0.4250000 0.004067107 2.1964661 17
## [6309] {butter,
## cream_cheese_} => {whole_milk} 0.002745297 0.6750000 0.004067107 2.6417131 27
## [6310] {cream_cheese_,
## newspapers} => {bottled_water} 0.001118454 0.3437500 0.003253686 3.1101943 11
## [6311] {cream_cheese_,
## newspapers} => {yogurt} 0.001423488 0.4375000 0.003253686 3.1361607 14
## [6312] {cream_cheese_,
## newspapers} => {rolls/buns} 0.001220132 0.3750000 0.003253686 2.0387645 12
## [6313] {cream_cheese_,
## newspapers} => {other_vegetables} 0.001118454 0.3437500 0.003253686 1.7765535 11
## [6314] {cream_cheese_,
## newspapers} => {whole_milk} 0.001423488 0.4375000 0.003253686 1.7122214 14
## [6315] {cream_cheese_,
## domestic_eggs} => {fruit/vegetable_juice} 0.001321810 0.2600000 0.005083884 3.5964838 13
## [6316] {cream_cheese_,
## fruit/vegetable_juice} => {domestic_eggs} 0.001321810 0.2321429 0.005693950 3.6588542 13
## [6317] {cream_cheese_,
## domestic_eggs} => {whipped/sour_cream} 0.001423488 0.2800000 0.005083884 3.9060993 14
## [6318] {cream_cheese_,
## whipped/sour_cream} => {domestic_eggs} 0.001423488 0.2222222 0.006405694 3.5024929 14
## [6319] {cream_cheese_,
## domestic_eggs} => {pip_fruit} 0.001321810 0.2600000 0.005083884 3.4369624 13
## [6320] {cream_cheese_,
## pip_fruit} => {domestic_eggs} 0.001321810 0.2166667 0.006100661 3.4149306 13
## [6321] {cream_cheese_,
## domestic_eggs} => {citrus_fruit} 0.001830198 0.3600000 0.005083884 4.3496314 18
## [6322] {citrus_fruit,
## cream_cheese_} => {domestic_eggs} 0.001830198 0.3214286 0.005693950 5.0661058 18
## [6323] {cream_cheese_,
## domestic_eggs} => {shopping_bags} 0.001220132 0.2400000 0.005083884 2.4359133 12
## [6324] {cream_cheese_,
## shopping_bags} => {domestic_eggs} 0.001220132 0.2181818 0.005592272 3.4388112 12
## [6325] {cream_cheese_,
## domestic_eggs} => {sausage} 0.001525165 0.3000000 0.005083884 3.1931818 15
## [6326] {cream_cheese_,
## sausage} => {domestic_eggs} 0.001525165 0.2727273 0.005592272 4.2985140 15
## [6327] {cream_cheese_,
## domestic_eggs} => {tropical_fruit} 0.001321810 0.2600000 0.005083884 2.4778101 13
## [6328] {cream_cheese_,
## domestic_eggs} => {root_vegetables} 0.001626843 0.3200000 0.005083884 2.9358209 16
## [6329] {cream_cheese_,
## root_vegetables} => {domestic_eggs} 0.001626843 0.2162162 0.007524148 3.4078309 16
## [6330] {cream_cheese_,
## domestic_eggs} => {yogurt} 0.001626843 0.3200000 0.005083884 2.2938776 16
## [6331] {cream_cheese_,
## domestic_eggs} => {rolls/buns} 0.001525165 0.3000000 0.005083884 1.6310116 15
## [6332] {cream_cheese_,
## domestic_eggs} => {other_vegetables} 0.002846975 0.5600000 0.005083884 2.8941671 28
## [6333] {cream_cheese_,
## other_vegetables} => {domestic_eggs} 0.002846975 0.2074074 0.013726487 3.2689934 28
## [6334] {cream_cheese_,
## domestic_eggs} => {whole_milk} 0.003457041 0.6800000 0.005083884 2.6612813 34
## [6335] {cream_cheese_,
## whole_milk} => {domestic_eggs} 0.003457041 0.2098765 0.016471784 3.3079099 34
## [6336] {cream_cheese_,
## fruit/vegetable_juice} => {whipped/sour_cream} 0.001220132 0.2142857 0.005693950 2.9893617 12
## [6337] {cream_cheese_,
## fruit/vegetable_juice} => {pip_fruit} 0.001830198 0.3214286 0.005693950 4.2489919 18
## [6338] {cream_cheese_,
## pip_fruit} => {fruit/vegetable_juice} 0.001830198 0.3000000 0.006100661 4.1497890 18
## [6339] {cream_cheese_,
## fruit/vegetable_juice} => {citrus_fruit} 0.001321810 0.2321429 0.005693950 2.8048219 13
## [6340] {citrus_fruit,
## cream_cheese_} => {fruit/vegetable_juice} 0.001321810 0.2321429 0.005693950 3.2111463 13
## [6341] {cream_cheese_,
## fruit/vegetable_juice} => {bottled_water} 0.001423488 0.2500000 0.005693950 2.2619595 14
## [6342] {bottled_water,
## cream_cheese_} => {fruit/vegetable_juice} 0.001423488 0.2413793 0.005897306 3.3389107 14
## [6343] {cream_cheese_,
## fruit/vegetable_juice} => {tropical_fruit} 0.001525165 0.2678571 0.005693950 2.5526890 15
## [6344] {cream_cheese_,
## tropical_fruit} => {fruit/vegetable_juice} 0.001525165 0.2112676 0.007219115 2.9223866 15
## [6345] {cream_cheese_,
## fruit/vegetable_juice} => {root_vegetables} 0.001525165 0.2678571 0.005693950 2.4574394 15
## [6346] {cream_cheese_,
## root_vegetables} => {fruit/vegetable_juice} 0.001525165 0.2027027 0.007524148 2.8039115 15
## [6347] {cream_cheese_,
## fruit/vegetable_juice} => {soda} 0.001525165 0.2678571 0.005693950 1.5360787 15
## [6348] {cream_cheese_,
## soda} => {fruit/vegetable_juice} 0.001525165 0.2238806 0.006812405 3.0968575 15
## [6349] {cream_cheese_,
## fruit/vegetable_juice} => {yogurt} 0.002440264 0.4285714 0.005693950 3.0721574 24
## [6350] {cream_cheese_,
## fruit/vegetable_juice} => {other_vegetables} 0.001830198 0.3214286 0.005693950 1.6611929 18
## [6351] {cream_cheese_,
## fruit/vegetable_juice} => {whole_milk} 0.002948653 0.5178571 0.005693950 2.0267111 29
## [6352] {cream_cheese_,
## whipped/sour_cream} => {pip_fruit} 0.001423488 0.2222222 0.006405694 2.9375747 14
## [6353] {cream_cheese_,
## pip_fruit} => {whipped/sour_cream} 0.001423488 0.2333333 0.006100661 3.2550827 14
## [6354] {cream_cheese_,
## whipped/sour_cream} => {citrus_fruit} 0.001626843 0.2539683 0.006405694 3.0685231 16
## [6355] {citrus_fruit,
## cream_cheese_} => {whipped/sour_cream} 0.001626843 0.2857143 0.005693950 3.9858156 16
## [6356] {cream_cheese_,
## whipped/sour_cream} => {sausage} 0.001321810 0.2063492 0.006405694 2.1963684 13
## [6357] {cream_cheese_,
## sausage} => {whipped/sour_cream} 0.001321810 0.2363636 0.005592272 3.2973565 13
## [6358] {cream_cheese_,
## whipped/sour_cream} => {tropical_fruit} 0.001626843 0.2539683 0.006405694 2.4203273 16
## [6359] {cream_cheese_,
## tropical_fruit} => {whipped/sour_cream} 0.001626843 0.2253521 0.007219115 3.1437419 16
## [6360] {cream_cheese_,
## whipped/sour_cream} => {root_vegetables} 0.002135231 0.3333333 0.006405694 3.0581468 21
## [6361] {cream_cheese_,
## root_vegetables} => {whipped/sour_cream} 0.002135231 0.2837838 0.007524148 3.9588844 21
## [6362] {cream_cheese_,
## whipped/sour_cream} => {yogurt} 0.003355363 0.5238095 0.006405694 3.7548591 33
## [6363] {cream_cheese_,
## yogurt} => {whipped/sour_cream} 0.003355363 0.2704918 0.012404677 3.7734566 33
## [6364] {cream_cheese_,
## whipped/sour_cream} => {rolls/buns} 0.001321810 0.2063492 0.006405694 1.1218598 13
## [6365] {cream_cheese_,
## whipped/sour_cream} => {other_vegetables} 0.003355363 0.5238095 0.006405694 2.7071291 33
## [6366] {cream_cheese_,
## other_vegetables} => {whipped/sour_cream} 0.003355363 0.2444444 0.013726487 3.4100867 33
## [6367] {cream_cheese_,
## whipped/sour_cream} => {whole_milk} 0.003965430 0.6190476 0.006405694 2.4227351 39
## [6368] {cream_cheese_,
## whole_milk} => {whipped/sour_cream} 0.003965430 0.2407407 0.016471784 3.3584187 39
## [6369] {cream_cheese_,
## pip_fruit} => {citrus_fruit} 0.001423488 0.2333333 0.006100661 2.8192056 14
## [6370] {citrus_fruit,
## cream_cheese_} => {pip_fruit} 0.001423488 0.2500000 0.005693950 3.3047715 14
## [6371] {cream_cheese_,
## shopping_bags} => {pip_fruit} 0.001118454 0.2000000 0.005592272 2.6438172 11
## [6372] {cream_cheese_,
## sausage} => {pip_fruit} 0.001118454 0.2000000 0.005592272 2.6438172 11
## [6373] {cream_cheese_,
## pip_fruit} => {tropical_fruit} 0.001728521 0.2833333 0.006100661 2.7001776 17
## [6374] {cream_cheese_,
## tropical_fruit} => {pip_fruit} 0.001728521 0.2394366 0.007219115 3.1651333 17
## [6375] {cream_cheese_,
## pip_fruit} => {root_vegetables} 0.001830198 0.3000000 0.006100661 2.7523321 18
## [6376] {cream_cheese_,
## root_vegetables} => {pip_fruit} 0.001830198 0.2432432 0.007524148 3.2154534 18
## [6377] {cream_cheese_,
## pip_fruit} => {yogurt} 0.002541942 0.4166667 0.006100661 2.9868197 25
## [6378] {cream_cheese_,
## yogurt} => {pip_fruit} 0.002541942 0.2049180 0.012404677 2.7088291 25
## [6379] {cream_cheese_,
## pip_fruit} => {rolls/buns} 0.001321810 0.2166667 0.006100661 1.1779528 13
## [6380] {cream_cheese_,
## pip_fruit} => {other_vegetables} 0.002440264 0.4000000 0.006100661 2.0672622 24
## [6381] {cream_cheese_,
## pip_fruit} => {whole_milk} 0.003965430 0.6500000 0.006100661 2.5438719 39
## [6382] {cream_cheese_,
## whole_milk} => {pip_fruit} 0.003965430 0.2407407 0.016471784 3.1823726 39
## [6383] {cream_cheese_,
## pastry} => {sausage} 0.001423488 0.3181818 0.004473818 3.3867080 14
## [6384] {cream_cheese_,
## sausage} => {pastry} 0.001423488 0.2545455 0.005592272 2.8610909 14
## [6385] {cream_cheese_,
## pastry} => {yogurt} 0.002135231 0.4772727 0.004473818 3.4212662 21
## [6386] {cream_cheese_,
## pastry} => {rolls/buns} 0.001423488 0.3181818 0.004473818 1.7298608 14
## [6387] {cream_cheese_,
## pastry} => {other_vegetables} 0.002338587 0.5227273 0.004473818 2.7015359 23
## [6388] {cream_cheese_,
## pastry} => {whole_milk} 0.002440264 0.5454545 0.004473818 2.1347177 24
## [6389] {cream_cheese_,
## sausage} => {citrus_fruit} 0.001118454 0.2000000 0.005592272 2.4164619 11
## [6390] {citrus_fruit,
## cream_cheese_} => {tropical_fruit} 0.001626843 0.2857143 0.005693950 2.7228682 16
## [6391] {cream_cheese_,
## tropical_fruit} => {citrus_fruit} 0.001626843 0.2253521 0.007219115 2.7227740 16
## [6392] {citrus_fruit,
## cream_cheese_} => {root_vegetables} 0.001321810 0.2321429 0.005693950 2.1297808 13
## [6393] {citrus_fruit,
## cream_cheese_} => {yogurt} 0.001830198 0.3214286 0.005693950 2.3041181 18
## [6394] {citrus_fruit,
## cream_cheese_} => {rolls/buns} 0.001220132 0.2142857 0.005693950 1.1650083 12
## [6395] {citrus_fruit,
## cream_cheese_} => {other_vegetables} 0.002948653 0.5178571 0.005693950 2.6763663 29
## [6396] {cream_cheese_,
## other_vegetables} => {citrus_fruit} 0.002948653 0.2148148 0.013726487 2.5954591 29
## [6397] {citrus_fruit,
## cream_cheese_} => {whole_milk} 0.002846975 0.5000000 0.005693950 1.9568245 28
## [6398] {cream_cheese_,
## shopping_bags} => {root_vegetables} 0.001220132 0.2181818 0.005592272 2.0016961 12
## [6399] {cream_cheese_,
## shopping_bags} => {soda} 0.001118454 0.2000000 0.005592272 1.1469388 11
## [6400] {cream_cheese_,
## shopping_bags} => {yogurt} 0.001525165 0.2727273 0.005592272 1.9550093 15
## [6401] {cream_cheese_,
## shopping_bags} => {other_vegetables} 0.001626843 0.2909091 0.005592272 1.5034634 16
## [6402] {cream_cheese_,
## shopping_bags} => {whole_milk} 0.002440264 0.4363636 0.005592272 1.7077741 24
## [6403] {cream_cheese_,
## sausage} => {tropical_fruit} 0.001423488 0.2545455 0.005592272 2.4258280 14
## [6404] {cream_cheese_,
## sausage} => {root_vegetables} 0.001321810 0.2363636 0.005592272 2.1685041 13
## [6405] {cream_cheese_,
## sausage} => {soda} 0.001321810 0.2363636 0.005592272 1.3554731 13
## [6406] {cream_cheese_,
## sausage} => {yogurt} 0.002135231 0.3818182 0.005592272 2.7370130 21
## [6407] {cream_cheese_,
## sausage} => {rolls/buns} 0.001423488 0.2545455 0.005592272 1.3838886 14
## [6408] {cream_cheese_,
## sausage} => {other_vegetables} 0.002643620 0.4727273 0.005592272 2.4431281 26
## [6409] {cream_cheese_,
## sausage} => {whole_milk} 0.002745297 0.4909091 0.005592272 1.9212459 27
## [6410] {bottled_water,
## cream_cheese_} => {tropical_fruit} 0.001931876 0.3275862 0.005897306 3.1219092 19
## [6411] {cream_cheese_,
## tropical_fruit} => {bottled_water} 0.001931876 0.2676056 0.007219115 2.4212524 19
## [6412] {bottled_water,
## cream_cheese_} => {root_vegetables} 0.001220132 0.2068966 0.005897306 1.8981601 12
## [6413] {bottled_water,
## cream_cheese_} => {soda} 0.002033554 0.3448276 0.005897306 1.9774806 20
## [6414] {cream_cheese_,
## soda} => {bottled_water} 0.002033554 0.2985075 0.006812405 2.7008472 20
## [6415] {bottled_water,
## cream_cheese_} => {yogurt} 0.002033554 0.3448276 0.005897306 2.4718508 20
## [6416] {bottled_water,
## cream_cheese_} => {rolls/buns} 0.001728521 0.2931034 0.005897306 1.5935171 17
## [6417] {bottled_water,
## cream_cheese_} => {other_vegetables} 0.001931876 0.3275862 0.005897306 1.6930165 19
## [6418] {bottled_water,
## cream_cheese_} => {whole_milk} 0.002541942 0.4310345 0.005897306 1.6869177 25
## [6419] {cream_cheese_,
## tropical_fruit} => {root_vegetables} 0.002033554 0.2816901 0.007219115 2.5843494 20
## [6420] {cream_cheese_,
## root_vegetables} => {tropical_fruit} 0.002033554 0.2702703 0.007524148 2.5756862 20
## [6421] {cream_cheese_,
## tropical_fruit} => {yogurt} 0.002846975 0.3943662 0.007219115 2.8269618 28
## [6422] {cream_cheese_,
## yogurt} => {tropical_fruit} 0.002846975 0.2295082 0.012404677 2.1872220 28
## [6423] {cream_cheese_,
## tropical_fruit} => {rolls/buns} 0.002135231 0.2957746 0.007219115 1.6080396 21
## [6424] {cream_cheese_,
## rolls/buns} => {tropical_fruit} 0.002135231 0.2142857 0.009964413 2.0421512 21
## [6425] {cream_cheese_,
## tropical_fruit} => {other_vegetables} 0.003152008 0.4366197 0.007219115 2.2565186 31
## [6426] {cream_cheese_,
## other_vegetables} => {tropical_fruit} 0.003152008 0.2296296 0.013726487 2.1883793 31
## [6427] {cream_cheese_,
## tropical_fruit} => {whole_milk} 0.003355363 0.4647887 0.007219115 1.8190200 33
## [6428] {cream_cheese_,
## whole_milk} => {tropical_fruit} 0.003355363 0.2037037 0.016471784 1.9413042 33
## [6429] {cream_cheese_,
## root_vegetables} => {soda} 0.001525165 0.2027027 0.007524148 1.1624379 15
## [6430] {cream_cheese_,
## soda} => {root_vegetables} 0.001525165 0.2238806 0.006812405 2.0539792 15
## [6431] {cream_cheese_,
## root_vegetables} => {yogurt} 0.003762074 0.5000000 0.007524148 3.5841837 37
## [6432] {cream_cheese_,
## yogurt} => {root_vegetables} 0.003762074 0.3032787 0.012404677 2.7824122 37
## [6433] {cream_cheese_,
## root_vegetables} => {other_vegetables} 0.004473818 0.5945946 0.007524148 3.0729574 44
## [6434] {cream_cheese_,
## other_vegetables} => {root_vegetables} 0.004473818 0.3259259 0.013726487 2.9901879 44
## [6435] {cream_cheese_,
## root_vegetables} => {whole_milk} 0.003965430 0.5270270 0.007524148 2.0625988 39
## [6436] {cream_cheese_,
## whole_milk} => {root_vegetables} 0.003965430 0.2407407 0.016471784 2.2086616 39
## [6437] {cream_cheese_,
## soda} => {yogurt} 0.002745297 0.4029851 0.006812405 2.8887451 27
## [6438] {cream_cheese_,
## yogurt} => {soda} 0.002745297 0.2213115 0.012404677 1.2691536 27
## [6439] {cream_cheese_,
## soda} => {rolls/buns} 0.002033554 0.2985075 0.006812405 1.6228971 20
## [6440] {cream_cheese_,
## rolls/buns} => {soda} 0.002033554 0.2040816 0.009964413 1.1703457 20
## [6441] {cream_cheese_,
## soda} => {other_vegetables} 0.002440264 0.3582090 0.006812405 1.8512796 24
## [6442] {cream_cheese_,
## soda} => {whole_milk} 0.002338587 0.3432836 0.006812405 1.3434915 23
## [6443] {cream_cheese_,
## yogurt} => {rolls/buns} 0.003965430 0.3196721 0.012404677 1.7379632 39
## [6444] {cream_cheese_,
## rolls/buns} => {yogurt} 0.003965430 0.3979592 0.009964413 2.8527176 39
## [6445] {cream_cheese_,
## yogurt} => {other_vegetables} 0.005287239 0.4262295 0.012404677 2.2028204 52
## [6446] {cream_cheese_,
## other_vegetables} => {yogurt} 0.005287239 0.3851852 0.013726487 2.7611489 52
## [6447] {cream_cheese_,
## yogurt} => {whole_milk} 0.006609049 0.5327869 0.012404677 2.0851409 65
## [6448] {cream_cheese_,
## whole_milk} => {yogurt} 0.006609049 0.4012346 0.016471784 2.8761968 65
## [6449] {cream_cheese_,
## rolls/buns} => {other_vegetables} 0.003457041 0.3469388 0.009964413 1.7930336 34
## [6450] {cream_cheese_,
## other_vegetables} => {rolls/buns} 0.003457041 0.2518519 0.013726487 1.3692443 34
## [6451] {cream_cheese_,
## rolls/buns} => {whole_milk} 0.003660397 0.3673469 0.009964413 1.4376670 36
## [6452] {cream_cheese_,
## whole_milk} => {rolls/buns} 0.003660397 0.2222222 0.016471784 1.2081567 36
## [6453] {cream_cheese_,
## other_vegetables} => {whole_milk} 0.006710727 0.4888889 0.013726487 1.9133395 66
## [6454] {cream_cheese_,
## whole_milk} => {other_vegetables} 0.006710727 0.4074074 0.016471784 2.1055449 66
## [6455] {chicken,
## white_bread} => {whipped/sour_cream} 0.001016777 0.4000000 0.002541942 5.5801418 10
## [6456] {chicken,
## white_bread} => {other_vegetables} 0.001321810 0.5200000 0.002541942 2.6874409 13
## [6457] {chicken,
## white_bread} => {whole_milk} 0.001626843 0.6400000 0.002541942 2.5047354 16
## [6458] {chicken,
## chocolate} => {butter} 0.001016777 0.3703704 0.002745297 6.6836561 10
## [6459] {chicken,
## chocolate} => {soda} 0.001220132 0.4444444 0.002745297 2.5487528 12
## [6460] {chicken,
## chocolate} => {yogurt} 0.001118454 0.4074074 0.002745297 2.9204460 11
## [6461] {chicken,
## chocolate} => {other_vegetables} 0.001016777 0.3703704 0.002745297 1.9141317 10
## [6462] {chicken,
## chocolate} => {whole_milk} 0.001321810 0.4814815 0.002745297 1.8843495 13
## [6463] {chicken,
## coffee} => {root_vegetables} 0.001016777 0.2631579 0.003863752 2.4143264 10
## [6464] {chicken,
## coffee} => {other_vegetables} 0.001728521 0.4473684 0.003863752 2.3120696 17
## [6465] {chicken,
## coffee} => {whole_milk} 0.001728521 0.4473684 0.003863752 1.7508430 17
## [6466] {chicken,
## pork} => {frozen_vegetables} 0.001220132 0.2105263 0.005795628 4.3774341 12
## [6467] {chicken,
## frankfurter} => {frozen_vegetables} 0.001016777 0.2777778 0.003660397 5.7757811 10
## [6468] {frankfurter,
## frozen_vegetables} => {chicken} 0.001016777 0.2000000 0.005083884 4.6611374 10
## [6469] {frozen_vegetables,
## newspapers} => {chicken} 0.001016777 0.2222222 0.004575496 5.1790416 10
## [6470] {chicken,
## fruit/vegetable_juice} => {frozen_vegetables} 0.001016777 0.2777778 0.003660397 5.7757811 10
## [6471] {chicken,
## pip_fruit} => {frozen_vegetables} 0.001118454 0.2340426 0.004778851 4.8664028 11
## [6472] {chicken,
## sausage} => {frozen_vegetables} 0.001118454 0.2115385 0.005287239 4.3984794 11
## [6473] {chicken,
## frozen_vegetables} => {root_vegetables} 0.001525165 0.2272727 0.006710727 2.0851001 15
## [6474] {chicken,
## frozen_vegetables} => {soda} 0.001830198 0.2727273 0.006710727 1.5640074 18
## [6475] {chicken,
## soda} => {frozen_vegetables} 0.001830198 0.2195122 0.008337570 4.5642758 18
## [6476] {frozen_vegetables,
## soda} => {chicken} 0.001830198 0.2117647 0.008642603 4.9353220 18
## [6477] {chicken,
## frozen_vegetables} => {yogurt} 0.001830198 0.2727273 0.006710727 1.9550093 18
## [6478] {chicken,
## yogurt} => {frozen_vegetables} 0.001830198 0.2195122 0.008337570 4.5642758 18
## [6479] {chicken,
## frozen_vegetables} => {rolls/buns} 0.001525165 0.2272727 0.006710727 1.2356149 15
## [6480] {chicken,
## frozen_vegetables} => {other_vegetables} 0.003558719 0.5303030 0.006710727 2.7406885 35
## [6481] {frozen_vegetables,
## other_vegetables} => {chicken} 0.003558719 0.2000000 0.017793594 4.6611374 35
## [6482] {chicken,
## frozen_vegetables} => {whole_milk} 0.002745297 0.4090909 0.006710727 1.6010382 27
## [6483] {beef,
## chicken} => {curd} 0.001016777 0.2127660 0.004778851 3.9934221 10
## [6484] {chicken,
## curd} => {beef} 0.001016777 0.2941176 0.003457041 5.6059052 10
## [6485] {beef,
## curd} => {chicken} 0.001016777 0.2173913 0.004677173 5.0664537 10
## [6486] {beef,
## chicken} => {pork} 0.001220132 0.2553191 0.004778851 4.4286840 12
## [6487] {chicken,
## pork} => {beef} 0.001220132 0.2105263 0.005795628 4.0126479 12
## [6488] {beef,
## chicken} => {butter} 0.001118454 0.2340426 0.004778851 4.2235019 11
## [6489] {beef,
## chicken} => {domestic_eggs} 0.001118454 0.2340426 0.004778851 3.6887957 11
## [6490] {beef,
## chicken} => {whipped/sour_cream} 0.001321810 0.2765957 0.004778851 3.8586087 13
## [6491] {beef,
## chicken} => {pastry} 0.001016777 0.2127660 0.004778851 2.3914894 10
## [6492] {chicken,
## pastry} => {beef} 0.001016777 0.2127660 0.004778851 4.0553356 10
## [6493] {beef,
## chicken} => {bottled_water} 0.001016777 0.2127660 0.004778851 1.9250719 10
## [6494] {beef,
## chicken} => {tropical_fruit} 0.001118454 0.2340426 0.004778851 2.2304346 11
## [6495] {beef,
## chicken} => {root_vegetables} 0.001728521 0.3617021 0.004778851 3.3184146 17
## [6496] {beef,
## chicken} => {yogurt} 0.001118454 0.2340426 0.004778851 1.6777030 11
## [6497] {beef,
## chicken} => {rolls/buns} 0.001016777 0.2127660 0.004778851 1.1567458 10
## [6498] {beef,
## chicken} => {other_vegetables} 0.002135231 0.4468085 0.004778851 2.3091759 21
## [6499] {beef,
## chicken} => {whole_milk} 0.002745297 0.5744681 0.004778851 2.2482665 27
## [6500] {chicken,
## curd} => {root_vegetables} 0.001321810 0.3823529 0.003457041 3.5078742 13
## [6501] {chicken,
## curd} => {rolls/buns} 0.001016777 0.2941176 0.003457041 1.5990310 10
## [6502] {chicken,
## curd} => {other_vegetables} 0.001728521 0.5000000 0.003457041 2.5840778 17
## [6503] {chicken,
## curd} => {whole_milk} 0.002236909 0.6470588 0.003457041 2.5323611 22
## [6504] {chicken,
## napkins} => {citrus_fruit} 0.001016777 0.2631579 0.003863752 3.1795552 10
## [6505] {chicken,
## napkins} => {root_vegetables} 0.001525165 0.3947368 0.003863752 3.6214896 15
## [6506] {chicken,
## napkins} => {soda} 0.001118454 0.2894737 0.003863752 1.6600430 11
## [6507] {chicken,
## napkins} => {yogurt} 0.001220132 0.3157895 0.003863752 2.2636950 12
## [6508] {chicken,
## napkins} => {rolls/buns} 0.001016777 0.2631579 0.003863752 1.4307119 10
## [6509] {chicken,
## napkins} => {other_vegetables} 0.001728521 0.4473684 0.003863752 2.3120696 17
## [6510] {chicken,
## napkins} => {whole_milk} 0.002236909 0.5789474 0.003863752 2.2657968 22
## [6511] {chicken,
## frankfurter} => {pork} 0.001118454 0.3055556 0.003660397 5.3000686 11
## [6512] {chicken,
## pork} => {whipped/sour_cream} 0.001220132 0.2105263 0.005795628 2.9369168 12
## [6513] {bottled_water,
## chicken} => {pork} 0.001118454 0.2115385 0.005287239 3.6692783 11
## [6514] {chicken,
## pork} => {root_vegetables} 0.001525165 0.2631579 0.005795628 2.4143264 15
## [6515] {chicken,
## pork} => {soda} 0.001525165 0.2631579 0.005795628 1.5091300 15
## [6516] {chicken,
## pork} => {rolls/buns} 0.001830198 0.3157895 0.005795628 1.7168543 18
## [6517] {chicken,
## pork} => {other_vegetables} 0.002745297 0.4736842 0.005795628 2.4480737 27
## [6518] {chicken,
## pork} => {whole_milk} 0.002948653 0.5087719 0.005795628 1.9911548 29
## [6519] {chicken,
## frankfurter} => {whipped/sour_cream} 0.001016777 0.2777778 0.003660397 3.8750985 10
## [6520] {chicken,
## frankfurter} => {pastry} 0.001016777 0.2777778 0.003660397 3.1222222 10
## [6521] {chicken,
## pastry} => {frankfurter} 0.001016777 0.2127660 0.004778851 3.6078503 10
## [6522] {chicken,
## frankfurter} => {citrus_fruit} 0.001016777 0.2777778 0.003660397 3.3561971 10
## [6523] {chicken,
## frankfurter} => {root_vegetables} 0.001830198 0.5000000 0.003660397 4.5872201 18
## [6524] {chicken,
## frankfurter} => {other_vegetables} 0.001931876 0.5277778 0.003660397 2.7276376 19
## [6525] {chicken,
## frankfurter} => {whole_milk} 0.001728521 0.4722222 0.003660397 1.8481120 17
## [6526] {bottled_beer,
## chicken} => {other_vegetables} 0.001220132 0.5000000 0.002440264 2.5840778 12
## [6527] {bottled_beer,
## chicken} => {whole_milk} 0.001220132 0.5000000 0.002440264 1.9568245 12
## [6528] {brown_bread,
## chicken} => {root_vegetables} 0.001321810 0.3611111 0.003660397 3.3129923 13
## [6529] {brown_bread,
## chicken} => {soda} 0.001118454 0.3055556 0.003660397 1.7522676 11
## [6530] {brown_bread,
## chicken} => {other_vegetables} 0.001728521 0.4722222 0.003660397 2.4405179 17
## [6531] {brown_bread,
## chicken} => {whole_milk} 0.002033554 0.5555556 0.003660397 2.1742495 20
## [6532] {chicken,
## margarine} => {butter} 0.001118454 0.2391304 0.004677173 4.3153171 11
## [6533] {chicken,
## margarine} => {whipped/sour_cream} 0.001016777 0.2173913 0.004677173 3.0326858 10
## [6534] {chicken,
## margarine} => {bottled_water} 0.001220132 0.2608696 0.004677173 2.3603056 12
## [6535] {bottled_water,
## chicken} => {margarine} 0.001220132 0.2307692 0.005287239 3.9403045 12
## [6536] {chicken,
## margarine} => {root_vegetables} 0.001423488 0.3043478 0.004677173 2.7922210 14
## [6537] {chicken,
## margarine} => {soda} 0.001626843 0.3478261 0.004677173 1.9946761 16
## [6538] {chicken,
## margarine} => {yogurt} 0.001525165 0.3260870 0.004677173 2.3375111 15
## [6539] {chicken,
## margarine} => {rolls/buns} 0.001728521 0.3695652 0.004677173 2.0092172 17
## [6540] {chicken,
## margarine} => {other_vegetables} 0.002033554 0.4347826 0.004677173 2.2470241 20
## [6541] {chicken,
## margarine} => {whole_milk} 0.002135231 0.4565217 0.004677173 1.7866659 21
## [6542] {butter,
## chicken} => {domestic_eggs} 0.001626843 0.2807018 0.005795628 4.4242015 16
## [6543] {chicken,
## domestic_eggs} => {butter} 0.001626843 0.2622951 0.006202339 4.7333434 16
## [6544] {chicken,
## fruit/vegetable_juice} => {butter} 0.001016777 0.2777778 0.003660397 5.0127421 10
## [6545] {butter,
## chicken} => {whipped/sour_cream} 0.001525165 0.2631579 0.005795628 3.6711459 15
## [6546] {chicken,
## whipped/sour_cream} => {butter} 0.001525165 0.2112676 0.007219115 3.8125081 15
## [6547] {chicken,
## pastry} => {butter} 0.001016777 0.2127660 0.004778851 3.8395471 10
## [6548] {butter,
## chicken} => {citrus_fruit} 0.001525165 0.2631579 0.005795628 3.1795552 15
## [6549] {chicken,
## citrus_fruit} => {butter} 0.001525165 0.2205882 0.006914082 3.9807070 15
## [6550] {butter,
## chicken} => {sausage} 0.001423488 0.2456140 0.005795628 2.6143009 14
## [6551] {chicken,
## sausage} => {butter} 0.001423488 0.2692308 0.005287239 4.8585039 14
## [6552] {butter,
## chicken} => {root_vegetables} 0.002135231 0.3684211 0.005795628 3.3800570 21
## [6553] {butter,
## chicken} => {yogurt} 0.001931876 0.3333333 0.005795628 2.3894558 19
## [6554] {chicken,
## yogurt} => {butter} 0.001931876 0.2317073 0.008337570 4.1813605 19
## [6555] {butter,
## chicken} => {rolls/buns} 0.001321810 0.2280702 0.005795628 1.2399503 13
## [6556] {butter,
## chicken} => {other_vegetables} 0.003050330 0.5263158 0.005795628 2.7200819 30
## [6557] {butter,
## chicken} => {whole_milk} 0.003253686 0.5614035 0.005795628 2.1971363 32
## [6558] {chicken,
## newspapers} => {bottled_water} 0.001118454 0.2156863 0.005185562 1.9514945 11
## [6559] {bottled_water,
## chicken} => {newspapers} 0.001118454 0.2115385 0.005287239 2.6502940 11
## [6560] {chicken,
## newspapers} => {root_vegetables} 0.001525165 0.2941176 0.005185562 2.6983648 15
## [6561] {chicken,
## newspapers} => {yogurt} 0.001220132 0.2352941 0.005185562 1.6866747 12
## [6562] {chicken,
## newspapers} => {rolls/buns} 0.001220132 0.2352941 0.005185562 1.2792248 12
## [6563] {chicken,
## newspapers} => {other_vegetables} 0.001830198 0.3529412 0.005185562 1.8240549 18
## [6564] {chicken,
## newspapers} => {whole_milk} 0.002033554 0.3921569 0.005185562 1.5347643 20
## [6565] {chicken,
## pip_fruit} => {domestic_eggs} 0.001220132 0.2553191 0.004778851 4.0241408 12
## [6566] {chicken,
## pastry} => {domestic_eggs} 0.001016777 0.2127660 0.004778851 3.3534506 10
## [6567] {chicken,
## domestic_eggs} => {citrus_fruit} 0.002033554 0.3278689 0.006202339 3.9614130 20
## [6568] {chicken,
## citrus_fruit} => {domestic_eggs} 0.002033554 0.2941176 0.006914082 4.6356523 20
## [6569] {chicken,
## domestic_eggs} => {sausage} 0.001423488 0.2295082 0.006202339 2.4428713 14
## [6570] {chicken,
## sausage} => {domestic_eggs} 0.001423488 0.2692308 0.005287239 4.2434048 14
## [6571] {bottled_water,
## chicken} => {domestic_eggs} 0.001220132 0.2307692 0.005287239 3.6372041 12
## [6572] {chicken,
## domestic_eggs} => {tropical_fruit} 0.001626843 0.2622951 0.006202339 2.4996823 16
## [6573] {chicken,
## tropical_fruit} => {domestic_eggs} 0.001626843 0.2539683 0.006405694 4.0028490 16
## [6574] {chicken,
## domestic_eggs} => {root_vegetables} 0.002440264 0.3934426 0.006202339 3.6096159 24
## [6575] {chicken,
## root_vegetables} => {domestic_eggs} 0.002440264 0.2242991 0.010879512 3.5352265 24
## [6576] {chicken,
## domestic_eggs} => {soda} 0.001423488 0.2295082 0.006202339 1.3161593 14
## [6577] {chicken,
## domestic_eggs} => {yogurt} 0.002033554 0.3278689 0.006202339 2.3502844 20
## [6578] {chicken,
## yogurt} => {domestic_eggs} 0.002033554 0.2439024 0.008337570 3.8441995 20
## [6579] {chicken,
## domestic_eggs} => {rolls/buns} 0.002033554 0.3278689 0.006202339 1.7825263 20
## [6580] {chicken,
## rolls/buns} => {domestic_eggs} 0.002033554 0.2105263 0.009659380 3.3181511 20
## [6581] {chicken,
## domestic_eggs} => {other_vegetables} 0.003355363 0.5409836 0.006202339 2.7958874 33
## [6582] {chicken,
## domestic_eggs} => {whole_milk} 0.003965430 0.6393443 0.006202339 2.5021690 39
## [6583] {chicken,
## whole_milk} => {domestic_eggs} 0.003965430 0.2254335 0.017590239 3.5531069 39
## [6584] {chicken,
## fruit/vegetable_juice} => {whipped/sour_cream} 0.001220132 0.3333333 0.003660397 4.6501182 12
## [6585] {chicken,
## fruit/vegetable_juice} => {bottled_water} 0.001118454 0.3055556 0.003660397 2.7646172 11
## [6586] {bottled_water,
## chicken} => {fruit/vegetable_juice} 0.001118454 0.2115385 0.005287239 2.9261333 11
## [6587] {chicken,
## fruit/vegetable_juice} => {root_vegetables} 0.001321810 0.3611111 0.003660397 3.3129923 13
## [6588] {chicken,
## fruit/vegetable_juice} => {soda} 0.001016777 0.2777778 0.003660397 1.5929705 10
## [6589] {chicken,
## fruit/vegetable_juice} => {yogurt} 0.001423488 0.3888889 0.003660397 2.7876984 14
## [6590] {chicken,
## fruit/vegetable_juice} => {rolls/buns} 0.001118454 0.3055556 0.003660397 1.6612155 11
## [6591] {chicken,
## fruit/vegetable_juice} => {other_vegetables} 0.001931876 0.5277778 0.003660397 2.7276376 19
## [6592] {chicken,
## fruit/vegetable_juice} => {whole_milk} 0.002033554 0.5555556 0.003660397 2.1742495 20
## [6593] {chicken,
## whipped/sour_cream} => {pip_fruit} 0.001525165 0.2112676 0.007219115 2.7927647 15
## [6594] {chicken,
## pip_fruit} => {whipped/sour_cream} 0.001525165 0.3191489 0.004778851 4.4522408 15
## [6595] {chicken,
## pastry} => {whipped/sour_cream} 0.001016777 0.2127660 0.004778851 2.9681606 10
## [6596] {chicken,
## whipped/sour_cream} => {citrus_fruit} 0.001525165 0.2112676 0.007219115 2.5526006 15
## [6597] {chicken,
## citrus_fruit} => {whipped/sour_cream} 0.001525165 0.2205882 0.006914082 3.0772841 15
## [6598] {chicken,
## shopping_bags} => {whipped/sour_cream} 0.001016777 0.2040816 0.004982206 2.8470111 10
## [6599] {chicken,
## whipped/sour_cream} => {sausage} 0.001626843 0.2253521 0.007219115 2.3986342 16
## [6600] {chicken,
## sausage} => {whipped/sour_cream} 0.001626843 0.3076923 0.005287239 4.2924168 16
## [6601] {chicken,
## whipped/sour_cream} => {tropical_fruit} 0.001525165 0.2112676 0.007219115 2.0133885 15
## [6602] {chicken,
## tropical_fruit} => {whipped/sour_cream} 0.001525165 0.2380952 0.006405694 3.3215130 15
## [6603] {chicken,
## whipped/sour_cream} => {root_vegetables} 0.002135231 0.2957746 0.007219115 2.7135668 21
## [6604] {chicken,
## whipped/sour_cream} => {soda} 0.002033554 0.2816901 0.007219115 1.6154067 20
## [6605] {chicken,
## soda} => {whipped/sour_cream} 0.002033554 0.2439024 0.008337570 3.4025255 20
## [6606] {chicken,
## whipped/sour_cream} => {yogurt} 0.002440264 0.3380282 0.007219115 2.4231101 24
## [6607] {chicken,
## yogurt} => {whipped/sour_cream} 0.002440264 0.2926829 0.008337570 4.0830306 24
## [6608] {chicken,
## whipped/sour_cream} => {rolls/buns} 0.002135231 0.2957746 0.007219115 1.6080396 21
## [6609] {chicken,
## rolls/buns} => {whipped/sour_cream} 0.002135231 0.2210526 0.009659380 3.0837626 21
## [6610] {chicken,
## whipped/sour_cream} => {other_vegetables} 0.003863752 0.5352113 0.007219115 2.7660551 38
## [6611] {chicken,
## other_vegetables} => {whipped/sour_cream} 0.003863752 0.2159091 0.017895272 3.0120084 38
## [6612] {chicken,
## whipped/sour_cream} => {whole_milk} 0.004168785 0.5774648 0.007219115 2.2599945 41
## [6613] {chicken,
## whole_milk} => {whipped/sour_cream} 0.004168785 0.2369942 0.017590239 3.3061534 41
## [6614] {chicken,
## pip_fruit} => {tropical_fruit} 0.001830198 0.3829787 0.004778851 3.6498021 18
## [6615] {chicken,
## tropical_fruit} => {pip_fruit} 0.001830198 0.2857143 0.006405694 3.7768817 18
## [6616] {chicken,
## pip_fruit} => {root_vegetables} 0.001626843 0.3404255 0.004778851 3.1232137 16
## [6617] {chicken,
## pip_fruit} => {soda} 0.001423488 0.2978723 0.004778851 1.7082067 14
## [6618] {chicken,
## pip_fruit} => {yogurt} 0.001423488 0.2978723 0.004778851 2.1352584 14
## [6619] {chicken,
## pip_fruit} => {rolls/buns} 0.001525165 0.3191489 0.004778851 1.7351187 15
## [6620] {chicken,
## pip_fruit} => {other_vegetables} 0.002846975 0.5957447 0.004778851 3.0789012 28
## [6621] {chicken,
## pip_fruit} => {whole_milk} 0.002541942 0.5319149 0.004778851 2.0817282 25
## [6622] {chicken,
## pastry} => {bottled_water} 0.001016777 0.2127660 0.004778851 1.9250719 10
## [6623] {chicken,
## pastry} => {tropical_fruit} 0.001525165 0.3191489 0.004778851 3.0415017 15
## [6624] {chicken,
## tropical_fruit} => {pastry} 0.001525165 0.2380952 0.006405694 2.6761905 15
## [6625] {chicken,
## pastry} => {root_vegetables} 0.001220132 0.2553191 0.004778851 2.3424103 12
## [6626] {chicken,
## pastry} => {soda} 0.001423488 0.2978723 0.004778851 1.7082067 14
## [6627] {chicken,
## pastry} => {yogurt} 0.001525165 0.3191489 0.004778851 2.2877768 15
## [6628] {chicken,
## pastry} => {rolls/buns} 0.001525165 0.3191489 0.004778851 1.7351187 15
## [6629] {chicken,
## pastry} => {other_vegetables} 0.002643620 0.5531915 0.004778851 2.8589797 26
## [6630] {chicken,
## pastry} => {whole_milk} 0.002745297 0.5744681 0.004778851 2.2482665 27
## [6631] {chicken,
## sausage} => {citrus_fruit} 0.001321810 0.2500000 0.005287239 3.0205774 13
## [6632] {chicken,
## citrus_fruit} => {tropical_fruit} 0.001626843 0.2352941 0.006914082 2.2423621 16
## [6633] {chicken,
## tropical_fruit} => {citrus_fruit} 0.001626843 0.2539683 0.006405694 3.0685231 16
## [6634] {chicken,
## citrus_fruit} => {root_vegetables} 0.003050330 0.4411765 0.006914082 4.0475472 30
## [6635] {chicken,
## root_vegetables} => {citrus_fruit} 0.003050330 0.2803738 0.010879512 3.3875634 30
## [6636] {chicken,
## citrus_fruit} => {yogurt} 0.002745297 0.3970588 0.006914082 2.8462635 27
## [6637] {chicken,
## yogurt} => {citrus_fruit} 0.002745297 0.3292683 0.008337570 3.9783214 27
## [6638] {chicken,
## citrus_fruit} => {rolls/buns} 0.002033554 0.2941176 0.006914082 1.5990310 20
## [6639] {chicken,
## rolls/buns} => {citrus_fruit} 0.002033554 0.2105263 0.009659380 2.5436441 20
## [6640] {chicken,
## citrus_fruit} => {other_vegetables} 0.003558719 0.5147059 0.006914082 2.6600801 35
## [6641] {chicken,
## citrus_fruit} => {whole_milk} 0.003152008 0.4558824 0.006914082 1.7841635 31
## [6642] {chicken,
## shopping_bags} => {tropical_fruit} 0.001016777 0.2040816 0.004982206 1.9449059 10
## [6643] {chicken,
## shopping_bags} => {root_vegetables} 0.001525165 0.3061224 0.004982206 2.8085021 15
## [6644] {chicken,
## shopping_bags} => {soda} 0.001525165 0.3061224 0.004982206 1.7555185 15
## [6645] {chicken,
## shopping_bags} => {rolls/buns} 0.001220132 0.2448980 0.004982206 1.3314380 12
## [6646] {chicken,
## shopping_bags} => {other_vegetables} 0.002236909 0.4489796 0.004982206 2.3203964 22
## [6647] {chicken,
## shopping_bags} => {whole_milk} 0.001525165 0.3061224 0.004982206 1.1980558 15
## [6648] {chicken,
## sausage} => {root_vegetables} 0.002236909 0.4230769 0.005287239 3.8814940 22
## [6649] {chicken,
## root_vegetables} => {sausage} 0.002236909 0.2056075 0.010879512 2.1884735 22
## [6650] {chicken,
## sausage} => {soda} 0.001525165 0.2884615 0.005287239 1.6542386 15
## [6651] {chicken,
## sausage} => {yogurt} 0.001728521 0.3269231 0.005287239 2.3435047 17
## [6652] {chicken,
## yogurt} => {sausage} 0.001728521 0.2073171 0.008337570 2.2066704 17
## [6653] {chicken,
## sausage} => {rolls/buns} 0.001626843 0.3076923 0.005287239 1.6728324 16
## [6654] {chicken,
## sausage} => {other_vegetables} 0.003152008 0.5961538 0.005287239 3.0810158 31
## [6655] {chicken,
## sausage} => {whole_milk} 0.003050330 0.5769231 0.005287239 2.2578744 30
## [6656] {bottled_water,
## chicken} => {root_vegetables} 0.001728521 0.3269231 0.005287239 2.9993363 17
## [6657] {bottled_water,
## chicken} => {soda} 0.001321810 0.2500000 0.005287239 1.4336735 13
## [6658] {bottled_water,
## chicken} => {yogurt} 0.001423488 0.2692308 0.005287239 1.9299451 14
## [6659] {bottled_water,
## chicken} => {rolls/buns} 0.001830198 0.3461538 0.005287239 1.8819365 18
## [6660] {bottled_water,
## chicken} => {other_vegetables} 0.002135231 0.4038462 0.005287239 2.0871397 21
## [6661] {bottled_water,
## chicken} => {whole_milk} 0.001830198 0.3461538 0.005287239 1.3547247 18
## [6662] {chicken,
## tropical_fruit} => {root_vegetables} 0.002338587 0.3650794 0.006405694 3.3493988 23
## [6663] {chicken,
## root_vegetables} => {tropical_fruit} 0.002338587 0.2149533 0.010879512 2.0485130 23
## [6664] {chicken,
## tropical_fruit} => {soda} 0.001423488 0.2222222 0.006405694 1.2743764 14
## [6665] {chicken,
## tropical_fruit} => {yogurt} 0.002135231 0.3333333 0.006405694 2.3894558 21
## [6666] {chicken,
## yogurt} => {tropical_fruit} 0.002135231 0.2560976 0.008337570 2.4406197 21
## [6667] {chicken,
## tropical_fruit} => {rolls/buns} 0.001525165 0.2380952 0.006405694 1.2944537 15
## [6668] {chicken,
## tropical_fruit} => {other_vegetables} 0.003660397 0.5714286 0.006405694 2.9532317 36
## [6669] {chicken,
## other_vegetables} => {tropical_fruit} 0.003660397 0.2045455 0.017895272 1.9493261 36
## [6670] {chicken,
## tropical_fruit} => {whole_milk} 0.002846975 0.4444444 0.006405694 1.7393996 28
## [6671] {chicken,
## soda} => {root_vegetables} 0.001830198 0.2195122 0.008337570 2.0139015 18
## [6672] {chicken,
## root_vegetables} => {yogurt} 0.003050330 0.2803738 0.010879512 2.0098226 30
## [6673] {chicken,
## yogurt} => {root_vegetables} 0.003050330 0.3658537 0.008337570 3.3565025 30
## [6674] {chicken,
## root_vegetables} => {rolls/buns} 0.002541942 0.2336449 0.010879512 1.2702583 25
## [6675] {chicken,
## rolls/buns} => {root_vegetables} 0.002541942 0.2631579 0.009659380 2.4143264 25
## [6676] {chicken,
## root_vegetables} => {other_vegetables} 0.005693950 0.5233645 0.010879512 2.7048291 56
## [6677] {chicken,
## other_vegetables} => {root_vegetables} 0.005693950 0.3181818 0.017895272 2.9191401 56
## [6678] {chicken,
## root_vegetables} => {whole_milk} 0.005998983 0.5514019 0.010879512 2.1579934 59
## [6679] {chicken,
## whole_milk} => {root_vegetables} 0.005998983 0.3410405 0.017590239 3.1288554 59
## [6680] {chicken,
## soda} => {yogurt} 0.001728521 0.2073171 0.008337570 1.4861249 17
## [6681] {chicken,
## yogurt} => {soda} 0.001728521 0.2073171 0.008337570 1.1889000 17
## [6682] {chicken,
## soda} => {rolls/buns} 0.002236909 0.2682927 0.008337570 1.4586283 22
## [6683] {chicken,
## rolls/buns} => {soda} 0.002236909 0.2315789 0.009659380 1.3280344 22
## [6684] {chicken,
## soda} => {other_vegetables} 0.003050330 0.3658537 0.008337570 1.8907886 30
## [6685] {chicken,
## soda} => {whole_milk} 0.003558719 0.4268293 0.008337570 1.6704599 35
## [6686] {chicken,
## whole_milk} => {soda} 0.003558719 0.2023121 0.017590239 1.1601982 35
## [6687] {chicken,
## yogurt} => {rolls/buns} 0.002745297 0.3292683 0.008337570 1.7901347 27
## [6688] {chicken,
## rolls/buns} => {yogurt} 0.002745297 0.2842105 0.009659380 2.0373255 27
## [6689] {chicken,
## yogurt} => {other_vegetables} 0.004880529 0.5853659 0.008337570 3.0252618 48
## [6690] {chicken,
## other_vegetables} => {yogurt} 0.004880529 0.2727273 0.017895272 1.9550093 48
## [6691] {chicken,
## yogurt} => {whole_milk} 0.003965430 0.4756098 0.008337570 1.8613697 39
## [6692] {chicken,
## whole_milk} => {yogurt} 0.003965430 0.2254335 0.017590239 1.6159903 39
## [6693] {chicken,
## rolls/buns} => {other_vegetables} 0.004982206 0.5157895 0.009659380 2.6656802 49
## [6694] {chicken,
## other_vegetables} => {rolls/buns} 0.004982206 0.2784091 0.017895272 1.5136282 49
## [6695] {chicken,
## rolls/buns} => {whole_milk} 0.005287239 0.5473684 0.009659380 2.1422079 52
## [6696] {chicken,
## whole_milk} => {rolls/buns} 0.005287239 0.3005780 0.017590239 1.6341542 52
## [6697] {chicken,
## other_vegetables} => {whole_milk} 0.008439248 0.4715909 0.017895272 1.8456413 83
## [6698] {chicken,
## whole_milk} => {other_vegetables} 0.008439248 0.4797688 0.017590239 2.4795197 83
## [6699] {chocolate,
## white_bread} => {frankfurter} 0.001016777 0.2380952 0.004270463 4.0373563 10
## [6700] {chocolate,
## frankfurter} => {white_bread} 0.001016777 0.2500000 0.004067107 5.9390097 10
## [6701] {chocolate,
## white_bread} => {butter} 0.001220132 0.2857143 0.004270463 5.1559633 12
## [6702] {butter,
## white_bread} => {chocolate} 0.001220132 0.2857143 0.004270463 5.7581967 12
## [6703] {chocolate,
## white_bread} => {fruit/vegetable_juice} 0.001525165 0.3571429 0.004270463 4.9402250 15
## [6704] {fruit/vegetable_juice,
## white_bread} => {chocolate} 0.001525165 0.2054795 0.007422471 4.1411689 15
## [6705] {chocolate,
## fruit/vegetable_juice} => {white_bread} 0.001525165 0.2238806 0.006812405 5.3185161 15
## [6706] {chocolate,
## white_bread} => {pastry} 0.001321810 0.3095238 0.004270463 3.4790476 13
## [6707] {pastry,
## white_bread} => {chocolate} 0.001321810 0.2363636 0.005592272 4.7635991 13
## [6708] {chocolate,
## white_bread} => {sausage} 0.001016777 0.2380952 0.004270463 2.5342713 10
## [6709] {chocolate,
## white_bread} => {soda} 0.001321810 0.3095238 0.004270463 1.7750243 13
## [6710] {chocolate,
## white_bread} => {yogurt} 0.001525165 0.3571429 0.004270463 2.5601312 15
## [6711] {chocolate,
## white_bread} => {rolls/buns} 0.001118454 0.2619048 0.004270463 1.4238990 11
## [6712] {chocolate,
## white_bread} => {other_vegetables} 0.002033554 0.4761905 0.004270463 2.4610264 20
## [6713] {chocolate,
## white_bread} => {whole_milk} 0.002236909 0.5238095 0.004270463 2.0500066 22
## [6714] {coffee,
## white_bread} => {yogurt} 0.001118454 0.3548387 0.003152008 2.5436142 11
## [6715] {coffee,
## white_bread} => {other_vegetables} 0.001220132 0.3870968 0.003152008 2.0005763 12
## [6716] {coffee,
## white_bread} => {whole_milk} 0.001626843 0.5161290 0.003152008 2.0199479 16
## [6717] {frozen_vegetables,
## white_bread} => {fruit/vegetable_juice} 0.001220132 0.3428571 0.003558719 4.7426160 12
## [6718] {frozen_vegetables,
## white_bread} => {whipped/sour_cream} 0.001016777 0.2857143 0.003558719 3.9858156 10
## [6719] {frozen_vegetables,
## white_bread} => {pip_fruit} 0.001118454 0.3142857 0.003558719 4.1545699 11
## [6720] {frozen_vegetables,
## white_bread} => {sausage} 0.001321810 0.3714286 0.003558719 3.9534632 13
## [6721] {frozen_vegetables,
## sausage} => {white_bread} 0.001321810 0.2203390 0.005998983 5.2343814 13
## [6722] {frozen_vegetables,
## white_bread} => {tropical_fruit} 0.001423488 0.4000000 0.003558719 3.8120155 14
## [6723] {frozen_vegetables,
## white_bread} => {root_vegetables} 0.001118454 0.3142857 0.003558719 2.8833955 11
## [6724] {frozen_vegetables,
## white_bread} => {soda} 0.001016777 0.2857143 0.003558719 1.6384840 10
## [6725] {frozen_vegetables,
## white_bread} => {yogurt} 0.001423488 0.4000000 0.003558719 2.8673469 14
## [6726] {frozen_vegetables,
## white_bread} => {rolls/buns} 0.001016777 0.2857143 0.003558719 1.5533444 10
## [6727] {frozen_vegetables,
## white_bread} => {other_vegetables} 0.001626843 0.4571429 0.003558719 2.3625854 16
## [6728] {frozen_vegetables,
## white_bread} => {whole_milk} 0.001830198 0.5142857 0.003558719 2.0127338 18
## [6729] {beef,
## white_bread} => {root_vegetables} 0.001118454 0.3666667 0.003050330 3.3639614 11
## [6730] {beef,
## white_bread} => {yogurt} 0.001118454 0.3666667 0.003050330 2.6284014 11
## [6731] {beef,
## white_bread} => {other_vegetables} 0.001118454 0.3666667 0.003050330 1.8949904 11
## [6732] {beef,
## white_bread} => {whole_milk} 0.001321810 0.4333333 0.003050330 1.6959146 13
## [6733] {curd,
## white_bread} => {whipped/sour_cream} 0.001118454 0.3235294 0.003457041 4.5133500 11
## [6734] {whipped/sour_cream,
## white_bread} => {curd} 0.001118454 0.2037037 0.005490595 3.8233319 11
## [6735] {curd,
## white_bread} => {pip_fruit} 0.001220132 0.3529412 0.003457041 4.6655598 12
## [6736] {curd,
## white_bread} => {root_vegetables} 0.001118454 0.3235294 0.003457041 2.9682013 11
## [6737] {curd,
## white_bread} => {soda} 0.001016777 0.2941176 0.003457041 1.6866747 10
## [6738] {curd,
## white_bread} => {yogurt} 0.001728521 0.5000000 0.003457041 3.5841837 17
## [6739] {curd,
## white_bread} => {other_vegetables} 0.001423488 0.4117647 0.003457041 2.1280640 14
## [6740] {curd,
## white_bread} => {whole_milk} 0.002135231 0.6176471 0.003457041 2.4172538 21
## [6741] {napkins,
## white_bread} => {shopping_bags} 0.001118454 0.3235294 0.003457041 3.2837067 11
## [6742] {napkins,
## white_bread} => {tropical_fruit} 0.001626843 0.4705882 0.003457041 4.4847241 16
## [6743] {napkins,
## white_bread} => {root_vegetables} 0.001118454 0.3235294 0.003457041 2.9682013 11
## [6744] {napkins,
## white_bread} => {soda} 0.001423488 0.4117647 0.003457041 2.3613445 14
## [6745] {napkins,
## white_bread} => {yogurt} 0.001423488 0.4117647 0.003457041 2.9516807 14
## [6746] {napkins,
## white_bread} => {rolls/buns} 0.001016777 0.2941176 0.003457041 1.5990310 10
## [6747] {napkins,
## white_bread} => {other_vegetables} 0.001220132 0.3529412 0.003457041 1.8240549 12
## [6748] {napkins,
## white_bread} => {whole_milk} 0.002338587 0.6764706 0.003457041 2.6474685 23
## [6749] {pork,
## white_bread} => {whipped/sour_cream} 0.001118454 0.2682927 0.004168785 3.7427781 11
## [6750] {whipped/sour_cream,
## white_bread} => {pork} 0.001118454 0.2037037 0.005490595 3.5333791 11
## [6751] {pork,
## white_bread} => {pip_fruit} 0.001016777 0.2439024 0.004168785 3.2241673 10
## [6752] {pork,
## white_bread} => {soda} 0.001016777 0.2439024 0.004168785 1.3987058 10
## [6753] {pork,
## white_bread} => {yogurt} 0.001016777 0.2439024 0.004168785 1.7483823 10
## [6754] {pork,
## white_bread} => {other_vegetables} 0.001525165 0.3658537 0.004168785 1.8907886 15
## [6755] {pork,
## white_bread} => {whole_milk} 0.001626843 0.3902439 0.004168785 1.5272777 16
## [6756] {frankfurter,
## white_bread} => {pastry} 0.001321810 0.2549020 0.005185562 2.8650980 13
## [6757] {pastry,
## white_bread} => {frankfurter} 0.001321810 0.2363636 0.005592272 4.0079937 13
## [6758] {frankfurter,
## white_bread} => {shopping_bags} 0.001118454 0.2156863 0.005185562 2.1891378 11
## [6759] {frankfurter,
## white_bread} => {sausage} 0.001220132 0.2352941 0.005185562 2.5044563 12
## [6760] {frankfurter,
## white_bread} => {root_vegetables} 0.001118454 0.2156863 0.005185562 1.9788008 11
## [6761] {frankfurter,
## white_bread} => {soda} 0.001728521 0.3333333 0.005185562 1.9115646 17
## [6762] {frankfurter,
## white_bread} => {yogurt} 0.001220132 0.2352941 0.005185562 1.6866747 12
## [6763] {frankfurter,
## white_bread} => {rolls/buns} 0.001118454 0.2156863 0.005185562 1.1726227 11
## [6764] {frankfurter,
## white_bread} => {other_vegetables} 0.002033554 0.3921569 0.005185562 2.0267277 20
## [6765] {frankfurter,
## white_bread} => {whole_milk} 0.002135231 0.4117647 0.005185562 1.6115025 21
## [6766] {bottled_beer,
## white_bread} => {fruit/vegetable_juice} 0.001220132 0.3076923 0.003965430 4.2561939 12
## [6767] {bottled_beer,
## white_bread} => {tropical_fruit} 0.001321810 0.3333333 0.003965430 3.1766796 13
## [6768] {bottled_beer,
## white_bread} => {soda} 0.001321810 0.3333333 0.003965430 1.9115646 13
## [6769] {bottled_beer,
## white_bread} => {yogurt} 0.001220132 0.3076923 0.003965430 2.2056515 12
## [6770] {bottled_beer,
## white_bread} => {other_vegetables} 0.001626843 0.4102564 0.003965430 2.1202689 16
## [6771] {bottled_beer,
## white_bread} => {whole_milk} 0.001830198 0.4615385 0.003965430 1.8062996 18
## [6772] {brown_bread,
## white_bread} => {margarine} 0.001016777 0.2173913 0.004677173 3.7118810 10
## [6773] {margarine,
## white_bread} => {brown_bread} 0.001016777 0.2702703 0.003762074 4.1663136 10
## [6774] {brown_bread,
## white_bread} => {pip_fruit} 0.001220132 0.2608696 0.004677173 3.4484572 12
## [6775] {brown_bread,
## white_bread} => {sausage} 0.001220132 0.2608696 0.004677173 2.7766798 12
## [6776] {brown_bread,
## white_bread} => {root_vegetables} 0.001220132 0.2608696 0.004677173 2.3933323 12
## [6777] {brown_bread,
## white_bread} => {soda} 0.001118454 0.2391304 0.004677173 1.3713398 11
## [6778] {brown_bread,
## white_bread} => {yogurt} 0.001016777 0.2173913 0.004677173 1.5583407 10
## [6779] {brown_bread,
## white_bread} => {rolls/buns} 0.001321810 0.2826087 0.004677173 1.5364602 13
## [6780] {rolls/buns,
## white_bread} => {brown_bread} 0.001321810 0.2031250 0.006507372 3.1312451 13
## [6781] {brown_bread,
## white_bread} => {other_vegetables} 0.001220132 0.2608696 0.004677173 1.3482145 12
## [6782] {brown_bread,
## white_bread} => {whole_milk} 0.002135231 0.4565217 0.004677173 1.7866659 21
## [6783] {margarine,
## white_bread} => {butter} 0.001016777 0.2702703 0.003762074 4.8772626 10
## [6784] {butter,
## white_bread} => {margarine} 0.001016777 0.2380952 0.004270463 4.0653935 10
## [6785] {margarine,
## white_bread} => {other_vegetables} 0.001423488 0.3783784 0.003762074 1.9555183 14
## [6786] {margarine,
## white_bread} => {whole_milk} 0.002541942 0.6756757 0.003762074 2.6443574 25
## [6787] {butter,
## white_bread} => {domestic_eggs} 0.001016777 0.2380952 0.004270463 3.7526709 10
## [6788] {butter,
## white_bread} => {fruit/vegetable_juice} 0.001321810 0.3095238 0.004270463 4.2815284 13
## [6789] {butter,
## white_bread} => {whipped/sour_cream} 0.001321810 0.3095238 0.004270463 4.3179669 13
## [6790] {whipped/sour_cream,
## white_bread} => {butter} 0.001321810 0.2407407 0.005490595 4.3443765 13
## [6791] {butter,
## white_bread} => {pip_fruit} 0.001016777 0.2380952 0.004270463 3.1474014 10
## [6792] {butter,
## white_bread} => {tropical_fruit} 0.001321810 0.3095238 0.004270463 2.9497739 13
## [6793] {butter,
## white_bread} => {root_vegetables} 0.001220132 0.2857143 0.004270463 2.6212687 12
## [6794] {butter,
## white_bread} => {yogurt} 0.001931876 0.4523810 0.004270463 3.2428328 19
## [6795] {white_bread,
## yogurt} => {butter} 0.001931876 0.2134831 0.009049314 3.8524894 19
## [6796] {butter,
## white_bread} => {other_vegetables} 0.002338587 0.5476190 0.004270463 2.8301804 23
## [6797] {butter,
## white_bread} => {whole_milk} 0.002338587 0.5476190 0.004270463 2.1431888 23
## [6798] {newspapers,
## white_bread} => {other_vegetables} 0.001118454 0.3235294 0.003457041 1.6720503 11
## [6799] {newspapers,
## white_bread} => {whole_milk} 0.001423488 0.4117647 0.003457041 1.6115025 14
## [6800] {domestic_eggs,
## white_bread} => {fruit/vegetable_juice} 0.001525165 0.2631579 0.005795628 3.6401658 15
## [6801] {fruit/vegetable_juice,
## white_bread} => {domestic_eggs} 0.001525165 0.2054795 0.007422471 3.2386064 15
## [6802] {domestic_eggs,
## white_bread} => {whipped/sour_cream} 0.001321810 0.2280702 0.005795628 3.1816598 13
## [6803] {whipped/sour_cream,
## white_bread} => {domestic_eggs} 0.001321810 0.2407407 0.005490595 3.7943673 13
## [6804] {domestic_eggs,
## white_bread} => {pip_fruit} 0.001321810 0.2280702 0.005795628 3.0148793 13
## [6805] {pip_fruit,
## white_bread} => {domestic_eggs} 0.001321810 0.2000000 0.006609049 3.1522436 13
## [6806] {pastry,
## white_bread} => {domestic_eggs} 0.001118454 0.2000000 0.005592272 3.1522436 11
## [6807] {domestic_eggs,
## white_bread} => {shopping_bags} 0.001220132 0.2105263 0.005795628 2.1367661 12
## [6808] {bottled_water,
## white_bread} => {domestic_eggs} 0.001016777 0.2325581 0.004372140 3.6653995 10
## [6809] {domestic_eggs,
## white_bread} => {tropical_fruit} 0.001626843 0.2807018 0.005795628 2.6750986 16
## [6810] {domestic_eggs,
## white_bread} => {root_vegetables} 0.001830198 0.3157895 0.005795628 2.8971917 18
## [6811] {root_vegetables,
## white_bread} => {domestic_eggs} 0.001830198 0.2307692 0.007930859 3.6372041 18
## [6812] {domestic_eggs,
## white_bread} => {soda} 0.001423488 0.2456140 0.005795628 1.4085213 14
## [6813] {domestic_eggs,
## white_bread} => {yogurt} 0.001931876 0.3333333 0.005795628 2.3894558 19
## [6814] {white_bread,
## yogurt} => {domestic_eggs} 0.001931876 0.2134831 0.009049314 3.3647544 19
## [6815] {domestic_eggs,
## white_bread} => {other_vegetables} 0.002236909 0.3859649 0.005795628 1.9947267 22
## [6816] {domestic_eggs,
## white_bread} => {whole_milk} 0.003253686 0.5614035 0.005795628 2.1971363 32
## [6817] {fruit/vegetable_juice,
## white_bread} => {whipped/sour_cream} 0.001626843 0.2191781 0.007422471 3.0576120 16
## [6818] {whipped/sour_cream,
## white_bread} => {fruit/vegetable_juice} 0.001626843 0.2962963 0.005490595 4.0985571 16
## [6819] {fruit/vegetable_juice,
## white_bread} => {pip_fruit} 0.001830198 0.2465753 0.007422471 3.2595007 18
## [6820] {pip_fruit,
## white_bread} => {fruit/vegetable_juice} 0.001830198 0.2769231 0.006609049 3.8305745 18
## [6821] {pastry,
## white_bread} => {fruit/vegetable_juice} 0.001423488 0.2545455 0.005592272 3.5210331 14
## [6822] {fruit/vegetable_juice,
## white_bread} => {shopping_bags} 0.001626843 0.2191781 0.007422471 2.2245784 16
## [6823] {shopping_bags,
## white_bread} => {fruit/vegetable_juice} 0.001626843 0.2191781 0.007422471 3.0318093 16
## [6824] {fruit/vegetable_juice,
## white_bread} => {sausage} 0.001525165 0.2054795 0.007422471 2.1871108 15
## [6825] {sausage,
## white_bread} => {fruit/vegetable_juice} 0.001525165 0.2112676 0.007219115 2.9223866 15
## [6826] {fruit/vegetable_juice,
## white_bread} => {bottled_water} 0.001626843 0.2191781 0.007422471 1.9830878 16
## [6827] {bottled_water,
## white_bread} => {fruit/vegetable_juice} 0.001626843 0.3720930 0.004372140 5.1470252 16
## [6828] {fruit/vegetable_juice,
## white_bread} => {tropical_fruit} 0.002440264 0.3287671 0.007422471 3.1331634 24
## [6829] {tropical_fruit,
## white_bread} => {fruit/vegetable_juice} 0.002440264 0.2790698 0.008744281 3.8602689 24
## [6830] {fruit/vegetable_juice,
## white_bread} => {soda} 0.002745297 0.3698630 0.007422471 2.1210512 27
## [6831] {soda,
## white_bread} => {fruit/vegetable_juice} 0.002745297 0.2673267 0.010269446 3.6978318 27
## [6832] {fruit/vegetable_juice,
## white_bread} => {yogurt} 0.002440264 0.3287671 0.007422471 2.3567235 24
## [6833] {white_bread,
## yogurt} => {fruit/vegetable_juice} 0.002440264 0.2696629 0.009049314 3.7301474 24
## [6834] {fruit/vegetable_juice,
## white_bread} => {other_vegetables} 0.002846975 0.3835616 0.007422471 1.9823062 28
## [6835] {other_vegetables,
## white_bread} => {fruit/vegetable_juice} 0.002846975 0.2074074 0.013726487 2.8689899 28
## [6836] {fruit/vegetable_juice,
## white_bread} => {whole_milk} 0.003660397 0.4931507 0.007422471 1.9300187 36
## [6837] {white_bread,
## whole_milk} => {fruit/vegetable_juice} 0.003660397 0.2142857 0.017081851 2.9641350 36
## [6838] {whipped/sour_cream,
## white_bread} => {pip_fruit} 0.001220132 0.2222222 0.005490595 2.9375747 12
## [6839] {whipped/sour_cream,
## white_bread} => {citrus_fruit} 0.001220132 0.2222222 0.005490595 2.6849577 12
## [6840] {citrus_fruit,
## white_bread} => {whipped/sour_cream} 0.001220132 0.2727273 0.004473818 3.8046422 12
## [6841] {whipped/sour_cream,
## white_bread} => {sausage} 0.001423488 0.2592593 0.005490595 2.7595398 14
## [6842] {whipped/sour_cream,
## white_bread} => {bottled_water} 0.001118454 0.2037037 0.005490595 1.8430781 11
## [6843] {bottled_water,
## white_bread} => {whipped/sour_cream} 0.001118454 0.2558140 0.004372140 3.5686954 11
## [6844] {whipped/sour_cream,
## white_bread} => {tropical_fruit} 0.002033554 0.3703704 0.005490595 3.5296440 20
## [6845] {tropical_fruit,
## white_bread} => {whipped/sour_cream} 0.002033554 0.2325581 0.008744281 3.2442685 20
## [6846] {whipped/sour_cream,
## white_bread} => {root_vegetables} 0.001626843 0.2962963 0.005490595 2.7183527 16
## [6847] {root_vegetables,
## white_bread} => {whipped/sour_cream} 0.001626843 0.2051282 0.007930859 2.8616112 16
## [6848] {whipped/sour_cream,
## white_bread} => {soda} 0.001220132 0.2222222 0.005490595 1.2743764 12
## [6849] {whipped/sour_cream,
## white_bread} => {yogurt} 0.002135231 0.3888889 0.005490595 2.7876984 21
## [6850] {white_bread,
## yogurt} => {whipped/sour_cream} 0.002135231 0.2359551 0.009049314 3.2916567 21
## [6851] {whipped/sour_cream,
## white_bread} => {other_vegetables} 0.003355363 0.6111111 0.005490595 3.1583173 33
## [6852] {other_vegetables,
## white_bread} => {whipped/sour_cream} 0.003355363 0.2444444 0.013726487 3.4100867 33
## [6853] {whipped/sour_cream,
## white_bread} => {whole_milk} 0.003050330 0.5555556 0.005490595 2.1742495 30
## [6854] {pip_fruit,
## white_bread} => {pastry} 0.001525165 0.2307692 0.006609049 2.5938462 15
## [6855] {pastry,
## white_bread} => {pip_fruit} 0.001525165 0.2727273 0.005592272 3.6052053 15
## [6856] {pip_fruit,
## white_bread} => {sausage} 0.001728521 0.2615385 0.006609049 2.7837995 17
## [6857] {sausage,
## white_bread} => {pip_fruit} 0.001728521 0.2394366 0.007219115 3.1651333 17
## [6858] {pip_fruit,
## white_bread} => {tropical_fruit} 0.002338587 0.3538462 0.006609049 3.3721676 23
## [6859] {tropical_fruit,
## white_bread} => {pip_fruit} 0.002338587 0.2674419 0.008744281 3.5353370 23
## [6860] {pip_fruit,
## white_bread} => {root_vegetables} 0.001728521 0.2615385 0.006609049 2.3994690 17
## [6861] {root_vegetables,
## white_bread} => {pip_fruit} 0.001728521 0.2179487 0.007930859 2.8810829 17
## [6862] {pip_fruit,
## white_bread} => {soda} 0.002033554 0.3076923 0.006609049 1.7645212 20
## [6863] {pip_fruit,
## white_bread} => {yogurt} 0.002541942 0.3846154 0.006609049 2.7570644 25
## [6864] {white_bread,
## yogurt} => {pip_fruit} 0.002541942 0.2808989 0.009049314 3.7132264 25
## [6865] {pip_fruit,
## white_bread} => {other_vegetables} 0.002643620 0.4000000 0.006609049 2.0672622 26
## [6866] {pip_fruit,
## white_bread} => {whole_milk} 0.003457041 0.5230769 0.006609049 2.0471395 34
## [6867] {white_bread,
## whole_milk} => {pip_fruit} 0.003457041 0.2023810 0.017081851 2.6752912 34
## [6868] {pastry,
## white_bread} => {shopping_bags} 0.001830198 0.3272727 0.005592272 3.3217000 18
## [6869] {shopping_bags,
## white_bread} => {pastry} 0.001830198 0.2465753 0.007422471 2.7715068 18
## [6870] {pastry,
## white_bread} => {sausage} 0.001118454 0.2000000 0.005592272 2.1287879 11
## [6871] {pastry,
## white_bread} => {root_vegetables} 0.001118454 0.2000000 0.005592272 1.8348881 11
## [6872] {pastry,
## white_bread} => {soda} 0.002440264 0.4363636 0.005592272 2.5024119 24
## [6873] {soda,
## white_bread} => {pastry} 0.002440264 0.2376238 0.010269446 2.6708911 24
## [6874] {pastry,
## white_bread} => {yogurt} 0.001321810 0.2363636 0.005592272 1.6943414 13
## [6875] {pastry,
## white_bread} => {rolls/buns} 0.001220132 0.2181818 0.005592272 1.1861903 12
## [6876] {pastry,
## white_bread} => {other_vegetables} 0.001830198 0.3272727 0.005592272 1.6913964 18
## [6877] {pastry,
## white_bread} => {whole_milk} 0.001931876 0.3454545 0.005592272 1.3519878 19
## [6878] {citrus_fruit,
## white_bread} => {shopping_bags} 0.001016777 0.2272727 0.004473818 2.3067361 10
## [6879] {citrus_fruit,
## white_bread} => {tropical_fruit} 0.001016777 0.2272727 0.004473818 2.1659179 10
## [6880] {citrus_fruit,
## white_bread} => {root_vegetables} 0.001118454 0.2500000 0.004473818 2.2936101 11
## [6881] {citrus_fruit,
## white_bread} => {yogurt} 0.001321810 0.2954545 0.004473818 2.1179267 13
## [6882] {citrus_fruit,
## white_bread} => {other_vegetables} 0.002033554 0.4545455 0.004473818 2.3491616 20
## [6883] {citrus_fruit,
## white_bread} => {whole_milk} 0.001626843 0.3636364 0.004473818 1.4231451 16
## [6884] {shopping_bags,
## white_bread} => {sausage} 0.001525165 0.2054795 0.007422471 2.1871108 15
## [6885] {sausage,
## white_bread} => {shopping_bags} 0.001525165 0.2112676 0.007219115 2.1442899 15
## [6886] {shopping_bags,
## white_bread} => {tropical_fruit} 0.001728521 0.2328767 0.007422471 2.2193241 17
## [6887] {shopping_bags,
## white_bread} => {soda} 0.002948653 0.3972603 0.007422471 2.2781661 29
## [6888] {soda,
## white_bread} => {shopping_bags} 0.002948653 0.2871287 0.010269446 2.9142527 29
## [6889] {shopping_bags,
## white_bread} => {yogurt} 0.001830198 0.2465753 0.007422471 1.7675426 18
## [6890] {white_bread,
## yogurt} => {shopping_bags} 0.001830198 0.2022472 0.009049314 2.0527359 18
## [6891] {shopping_bags,
## white_bread} => {other_vegetables} 0.002135231 0.2876712 0.007422471 1.4867297 21
## [6892] {shopping_bags,
## white_bread} => {whole_milk} 0.002846975 0.3835616 0.007422471 1.5011257 28
## [6893] {bottled_water,
## white_bread} => {sausage} 0.001118454 0.2558140 0.004372140 2.7228682 11
## [6894] {sausage,
## white_bread} => {tropical_fruit} 0.002135231 0.2957746 0.007219115 2.8187439 21
## [6895] {tropical_fruit,
## white_bread} => {sausage} 0.002135231 0.2441860 0.008744281 2.5991015 21
## [6896] {sausage,
## white_bread} => {root_vegetables} 0.001728521 0.2394366 0.007219115 2.1966970 17
## [6897] {root_vegetables,
## white_bread} => {sausage} 0.001728521 0.2179487 0.007930859 2.3198329 17
## [6898] {sausage,
## white_bread} => {soda} 0.002541942 0.3521127 0.007219115 2.0192584 25
## [6899] {soda,
## white_bread} => {sausage} 0.002541942 0.2475248 0.010269446 2.6346385 25
## [6900] {sausage,
## white_bread} => {yogurt} 0.002338587 0.3239437 0.007219115 2.3221472 23
## [6901] {white_bread,
## yogurt} => {sausage} 0.002338587 0.2584270 0.009049314 2.7506810 23
## [6902] {sausage,
## white_bread} => {other_vegetables} 0.002846975 0.3943662 0.007219115 2.0381458 28
## [6903] {other_vegetables,
## white_bread} => {sausage} 0.002846975 0.2074074 0.013726487 2.2076319 28
## [6904] {sausage,
## white_bread} => {whole_milk} 0.003457041 0.4788732 0.007219115 1.8741418 34
## [6905] {white_bread,
## whole_milk} => {sausage} 0.003457041 0.2023810 0.017081851 2.1541306 34
## [6906] {bottled_water,
## white_bread} => {tropical_fruit} 0.001118454 0.2558140 0.004372140 2.4379169 11
## [6907] {bottled_water,
## white_bread} => {soda} 0.002033554 0.4651163 0.004372140 2.6672995 20
## [6908] {bottled_water,
## white_bread} => {yogurt} 0.001321810 0.3023256 0.004372140 2.1671808 13
## [6909] {bottled_water,
## white_bread} => {other_vegetables} 0.001626843 0.3720930 0.004372140 1.9230346 16
## [6910] {bottled_water,
## white_bread} => {whole_milk} 0.002236909 0.5116279 0.004372140 2.0023321 22
## [6911] {tropical_fruit,
## white_bread} => {root_vegetables} 0.002033554 0.2325581 0.008744281 2.1335908 20
## [6912] {root_vegetables,
## white_bread} => {tropical_fruit} 0.002033554 0.2564103 0.007930859 2.4435997 20
## [6913] {tropical_fruit,
## white_bread} => {soda} 0.002440264 0.2790698 0.008744281 1.6003797 24
## [6914] {soda,
## white_bread} => {tropical_fruit} 0.002440264 0.2376238 0.010269446 2.2645637 24
## [6915] {tropical_fruit,
## white_bread} => {yogurt} 0.002846975 0.3255814 0.008744281 2.3338870 28
## [6916] {white_bread,
## yogurt} => {tropical_fruit} 0.002846975 0.3146067 0.009049314 2.9982144 28
## [6917] {tropical_fruit,
## white_bread} => {other_vegetables} 0.004168785 0.4767442 0.008744281 2.4638881 41
## [6918] {other_vegetables,
## white_bread} => {tropical_fruit} 0.004168785 0.3037037 0.013726487 2.8943081 41
## [6919] {tropical_fruit,
## white_bread} => {whole_milk} 0.004575496 0.5232558 0.008744281 2.0478396 45
## [6920] {white_bread,
## whole_milk} => {tropical_fruit} 0.004575496 0.2678571 0.017081851 2.5526890 45
## [6921] {root_vegetables,
## white_bread} => {soda} 0.002440264 0.3076923 0.007930859 1.7645212 24
## [6922] {soda,
## white_bread} => {root_vegetables} 0.002440264 0.2376238 0.010269446 2.1800650 24
## [6923] {root_vegetables,
## white_bread} => {yogurt} 0.002745297 0.3461538 0.007930859 2.4813579 27
## [6924] {white_bread,
## yogurt} => {root_vegetables} 0.002745297 0.3033708 0.009049314 2.7832572 27
## [6925] {root_vegetables,
## white_bread} => {rolls/buns} 0.001728521 0.2179487 0.007930859 1.1849230 17
## [6926] {rolls/buns,
## white_bread} => {root_vegetables} 0.001728521 0.2656250 0.006507372 2.4369607 17
## [6927] {root_vegetables,
## white_bread} => {other_vegetables} 0.003965430 0.5000000 0.007930859 2.5840778 39
## [6928] {other_vegetables,
## white_bread} => {root_vegetables} 0.003965430 0.2888889 0.013726487 2.6503939 39
## [6929] {root_vegetables,
## white_bread} => {whole_milk} 0.003965430 0.5000000 0.007930859 1.9568245 39
## [6930] {white_bread,
## whole_milk} => {root_vegetables} 0.003965430 0.2321429 0.017081851 2.1297808 39
## [6931] {soda,
## white_bread} => {yogurt} 0.002541942 0.2475248 0.010269446 1.7743484 25
## [6932] {white_bread,
## yogurt} => {soda} 0.002541942 0.2808989 0.009049314 1.6108691 25
## [6933] {rolls/buns,
## white_bread} => {soda} 0.001728521 0.2656250 0.006507372 1.5232781 17
## [6934] {soda,
## white_bread} => {other_vegetables} 0.003965430 0.3861386 0.010269446 1.9956244 39
## [6935] {other_vegetables,
## white_bread} => {soda} 0.003965430 0.2888889 0.013726487 1.6566893 39
## [6936] {soda,
## white_bread} => {whole_milk} 0.004067107 0.3960396 0.010269446 1.5499600 40
## [6937] {white_bread,
## whole_milk} => {soda} 0.004067107 0.2380952 0.017081851 1.3654033 40
## [6938] {rolls/buns,
## white_bread} => {yogurt} 0.001423488 0.2187500 0.006507372 1.5680804 14
## [6939] {white_bread,
## yogurt} => {other_vegetables} 0.003965430 0.4382022 0.009049314 2.2646974 39
## [6940] {other_vegetables,
## white_bread} => {yogurt} 0.003965430 0.2888889 0.013726487 2.0708617 39
## [6941] {white_bread,
## yogurt} => {whole_milk} 0.004880529 0.5393258 0.009049314 2.1107321 48
## [6942] {white_bread,
## whole_milk} => {yogurt} 0.004880529 0.2857143 0.017081851 2.0481050 48
## [6943] {rolls/buns,
## white_bread} => {other_vegetables} 0.002643620 0.4062500 0.006507372 2.0995632 26
## [6944] {rolls/buns,
## white_bread} => {whole_milk} 0.003253686 0.5000000 0.006507372 1.9568245 32
## [6945] {other_vegetables,
## white_bread} => {whole_milk} 0.005897306 0.4296296 0.013726487 1.6814196 58
## [6946] {white_bread,
## whole_milk} => {other_vegetables} 0.005897306 0.3452381 0.017081851 1.7842442 58
## [6947] {chocolate,
## coffee} => {citrus_fruit} 0.001016777 0.2631579 0.003863752 3.1795552 10
## [6948] {chocolate,
## coffee} => {shopping_bags} 0.001118454 0.2894737 0.003863752 2.9380533 11
## [6949] {chocolate,
## coffee} => {soda} 0.001118454 0.2894737 0.003863752 1.6600430 11
## [6950] {chocolate,
## coffee} => {rolls/buns} 0.001016777 0.2631579 0.003863752 1.4307119 10
## [6951] {chocolate,
## coffee} => {other_vegetables} 0.001016777 0.2631579 0.003863752 1.3600409 10
## [6952] {chocolate,
## coffee} => {whole_milk} 0.001626843 0.4210526 0.003863752 1.6478522 16
## [6953] {chocolate,
## frozen_vegetables} => {soda} 0.001016777 0.4000000 0.002541942 2.2938776 10
## [6954] {chocolate,
## frozen_vegetables} => {other_vegetables} 0.001525165 0.6000000 0.002541942 3.1008933 15
## [6955] {chocolate,
## frozen_vegetables} => {whole_milk} 0.001728521 0.6800000 0.002541942 2.6612813 17
## [6956] {beef,
## chocolate} => {newspapers} 0.001118454 0.3333333 0.003355363 4.1762208 11
## [6957] {chocolate,
## newspapers} => {beef} 0.001118454 0.2037037 0.005490595 3.8826084 11
## [6958] {beef,
## chocolate} => {tropical_fruit} 0.001118454 0.3333333 0.003355363 3.1766796 11
## [6959] {beef,
## chocolate} => {root_vegetables} 0.001423488 0.4242424 0.003355363 3.8921868 14
## [6960] {chocolate,
## root_vegetables} => {beef} 0.001423488 0.2222222 0.006405694 4.2355728 14
## [6961] {beef,
## chocolate} => {soda} 0.001118454 0.3333333 0.003355363 1.9115646 11
## [6962] {beef,
## chocolate} => {rolls/buns} 0.001423488 0.4242424 0.003355363 2.3064811 14
## [6963] {beef,
## chocolate} => {other_vegetables} 0.001525165 0.4545455 0.003355363 2.3491616 15
## [6964] {beef,
## chocolate} => {whole_milk} 0.001525165 0.4545455 0.003355363 1.7789314 15
## [6965] {chocolate,
## curd} => {butter} 0.001118454 0.3928571 0.002846975 7.0894495 11
## [6966] {chocolate,
## curd} => {pastry} 0.001016777 0.3571429 0.002846975 4.0142857 10
## [6967] {chocolate,
## curd} => {sausage} 0.001016777 0.3571429 0.002846975 3.8014069 10
## [6968] {chocolate,
## curd} => {soda} 0.001016777 0.3571429 0.002846975 2.0481050 10
## [6969] {chocolate,
## curd} => {yogurt} 0.001118454 0.3928571 0.002846975 2.8161443 11
## [6970] {chocolate,
## curd} => {whole_milk} 0.001423488 0.5000000 0.002846975 1.9568245 14
## [6971] {chocolate,
## napkins} => {butter} 0.001016777 0.2083333 0.004880529 3.7595566 10
## [6972] {butter,
## napkins} => {chocolate} 0.001016777 0.2040816 0.004982206 4.1129977 10
## [6973] {chocolate,
## napkins} => {newspapers} 0.001118454 0.2291667 0.004880529 2.8711518 11
## [6974] {chocolate,
## newspapers} => {napkins} 0.001118454 0.2037037 0.005490595 3.8901474 11
## [6975] {chocolate,
## napkins} => {fruit/vegetable_juice} 0.001016777 0.2083333 0.004880529 2.8817979 10
## [6976] {chocolate,
## napkins} => {pip_fruit} 0.001118454 0.2291667 0.004880529 3.0293739 11
## [6977] {chocolate,
## napkins} => {pastry} 0.001830198 0.3750000 0.004880529 4.2150000 18
## [6978] {chocolate,
## pastry} => {napkins} 0.001830198 0.2278481 0.008032537 4.3512351 18
## [6979] {napkins,
## pastry} => {chocolate} 0.001830198 0.2608696 0.007015760 5.2574840 18
## [6980] {chocolate,
## napkins} => {citrus_fruit} 0.001321810 0.2708333 0.004880529 3.2722922 13
## [6981] {chocolate,
## citrus_fruit} => {napkins} 0.001321810 0.2063492 0.006405694 3.9406688 13
## [6982] {chocolate,
## napkins} => {sausage} 0.001118454 0.2291667 0.004880529 2.4392361 11
## [6983] {chocolate,
## napkins} => {bottled_water} 0.001220132 0.2500000 0.004880529 2.2619595 12
## [6984] {bottled_water,
## chocolate} => {napkins} 0.001220132 0.2105263 0.005795628 4.0204394 12
## [6985] {chocolate,
## napkins} => {tropical_fruit} 0.001321810 0.2708333 0.004880529 2.5810522 13
## [6986] {chocolate,
## napkins} => {root_vegetables} 0.001525165 0.3125000 0.004880529 2.8670126 15
## [6987] {chocolate,
## root_vegetables} => {napkins} 0.001525165 0.2380952 0.006405694 4.5469256 15
## [6988] {chocolate,
## napkins} => {soda} 0.002135231 0.4375000 0.004880529 2.5089286 21
## [6989] {chocolate,
## napkins} => {yogurt} 0.001931876 0.3958333 0.004880529 2.8374787 19
## [6990] {chocolate,
## yogurt} => {napkins} 0.001931876 0.2087912 0.009252669 3.9873040 19
## [6991] {chocolate,
## napkins} => {rolls/buns} 0.001728521 0.3541667 0.004880529 1.9254998 17
## [6992] {chocolate,
## napkins} => {other_vegetables} 0.001626843 0.3333333 0.004880529 1.7227185 16
## [6993] {chocolate,
## napkins} => {whole_milk} 0.002846975 0.5833333 0.004880529 2.2829619 28
## [6994] {chocolate,
## pork} => {pip_fruit} 0.001016777 0.2380952 0.004270463 3.1474014 10
## [6995] {chocolate,
## pork} => {tropical_fruit} 0.001220132 0.2857143 0.004270463 2.7228682 12
## [6996] {chocolate,
## pork} => {root_vegetables} 0.001525165 0.3571429 0.004270463 3.2765858 15
## [6997] {chocolate,
## root_vegetables} => {pork} 0.001525165 0.2380952 0.006405694 4.1299236 15
## [6998] {chocolate,
## pork} => {soda} 0.001626843 0.3809524 0.004270463 2.1846453 16
## [6999] {chocolate,
## pork} => {rolls/buns} 0.001525165 0.3571429 0.004270463 1.9416805 15
## [7000] {chocolate,
## pork} => {other_vegetables} 0.001830198 0.4285714 0.004270463 2.2149238 18
## [7001] {chocolate,
## pork} => {whole_milk} 0.002440264 0.5714286 0.004270463 2.2363709 24
## [7002] {chocolate,
## frankfurter} => {pastry} 0.001423488 0.3500000 0.004067107 3.9340000 14
## [7003] {chocolate,
## frankfurter} => {soda} 0.001118454 0.2750000 0.004067107 1.5770408 11
## [7004] {chocolate,
## frankfurter} => {rolls/buns} 0.001423488 0.3500000 0.004067107 1.9028469 14
## [7005] {chocolate,
## frankfurter} => {other_vegetables} 0.001525165 0.3750000 0.004067107 1.9380583 15
## [7006] {chocolate,
## frankfurter} => {whole_milk} 0.001423488 0.3500000 0.004067107 1.3697772 14
## [7007] {bottled_beer,
## chocolate} => {fruit/vegetable_juice} 0.001118454 0.2750000 0.004067107 3.8039733 11
## [7008] {bottled_beer,
## chocolate} => {bottled_water} 0.001118454 0.2750000 0.004067107 2.4881555 11
## [7009] {bottled_beer,
## chocolate} => {soda} 0.001728521 0.4250000 0.004067107 2.4372449 17
## [7010] {bottled_beer,
## chocolate} => {yogurt} 0.001118454 0.2750000 0.004067107 1.9713010 11
## [7011] {bottled_beer,
## chocolate} => {rolls/buns} 0.001321810 0.3250000 0.004067107 1.7669292 13
## [7012] {bottled_beer,
## chocolate} => {other_vegetables} 0.001423488 0.3500000 0.004067107 1.8088544 14
## [7013] {bottled_beer,
## chocolate} => {whole_milk} 0.001728521 0.4250000 0.004067107 1.6633008 17
## [7014] {brown_bread,
## chocolate} => {fruit/vegetable_juice} 0.001321810 0.3421053 0.003863752 4.7322156 13
## [7015] {brown_bread,
## chocolate} => {pastry} 0.001118454 0.2894737 0.003863752 3.2536842 11
## [7016] {brown_bread,
## chocolate} => {shopping_bags} 0.001016777 0.2631579 0.003863752 2.6709576 10
## [7017] {brown_bread,
## chocolate} => {sausage} 0.001118454 0.2894737 0.003863752 3.0811404 11
## [7018] {brown_bread,
## chocolate} => {soda} 0.001525165 0.3947368 0.003863752 2.2636950 15
## [7019] {brown_bread,
## chocolate} => {yogurt} 0.001525165 0.3947368 0.003863752 2.8296187 15
## [7020] {brown_bread,
## chocolate} => {other_vegetables} 0.001016777 0.2631579 0.003863752 1.3600409 10
## [7021] {brown_bread,
## chocolate} => {whole_milk} 0.002135231 0.5526316 0.003863752 2.1628060 21
## [7022] {chocolate,
## margarine} => {soda} 0.001016777 0.3225806 0.003152008 1.8499013 10
## [7023] {chocolate,
## margarine} => {yogurt} 0.001118454 0.3548387 0.003152008 2.5436142 11
## [7024] {chocolate,
## margarine} => {other_vegetables} 0.001321810 0.4193548 0.003152008 2.1672910 13
## [7025] {chocolate,
## margarine} => {whole_milk} 0.001728521 0.5483871 0.003152008 2.1461946 17
## [7026] {butter,
## chocolate} => {fruit/vegetable_juice} 0.002033554 0.3278689 0.006202339 4.5352886 20
## [7027] {chocolate,
## fruit/vegetable_juice} => {butter} 0.002033554 0.2985075 0.006812405 5.3868273 20
## [7028] {butter,
## fruit/vegetable_juice} => {chocolate} 0.002033554 0.2531646 0.008032537 5.1021996 20
## [7029] {chocolate,
## whipped/sour_cream} => {butter} 0.001220132 0.2666667 0.004575496 4.8122324 12
## [7030] {butter,
## chocolate} => {pip_fruit} 0.001525165 0.2459016 0.006202339 3.2505949 15
## [7031] {chocolate,
## pip_fruit} => {butter} 0.001525165 0.2500000 0.006100661 4.5114679 15
## [7032] {butter,
## pip_fruit} => {chocolate} 0.001525165 0.2083333 0.007320793 4.1986851 15
## [7033] {butter,
## chocolate} => {pastry} 0.001525165 0.2459016 0.006202339 2.7639344 15
## [7034] {butter,
## pastry} => {chocolate} 0.001525165 0.2000000 0.007625826 4.0307377 15
## [7035] {butter,
## chocolate} => {sausage} 0.001728521 0.2786885 0.006202339 2.9663438 17
## [7036] {chocolate,
## sausage} => {butter} 0.001728521 0.2615385 0.006609049 4.7196895 17
## [7037] {butter,
## sausage} => {chocolate} 0.001728521 0.2000000 0.008642603 4.0307377 17
## [7038] {butter,
## chocolate} => {tropical_fruit} 0.001525165 0.2459016 0.006202339 2.3434522 15
## [7039] {butter,
## chocolate} => {root_vegetables} 0.001931876 0.3114754 0.006202339 2.8576126 19
## [7040] {chocolate,
## root_vegetables} => {butter} 0.001931876 0.3015873 0.006405694 5.4424057 19
## [7041] {butter,
## chocolate} => {soda} 0.001830198 0.2950820 0.006202339 1.6922048 18
## [7042] {butter,
## soda} => {chocolate} 0.001830198 0.2068966 0.008845958 4.1697287 18
## [7043] {butter,
## chocolate} => {yogurt} 0.001728521 0.2786885 0.006202339 1.9977417 17
## [7044] {butter,
## chocolate} => {rolls/buns} 0.001423488 0.2295082 0.006202339 1.2477684 14
## [7045] {butter,
## chocolate} => {other_vegetables} 0.002338587 0.3770492 0.006202339 1.9486488 23
## [7046] {butter,
## chocolate} => {whole_milk} 0.003355363 0.5409836 0.006202339 2.1172200 33
## [7047] {chocolate,
## whole_milk} => {butter} 0.003355363 0.2012195 0.016675140 3.6311815 33
## [7048] {chocolate,
## newspapers} => {fruit/vegetable_juice} 0.001220132 0.2222222 0.005490595 3.0739178 12
## [7049] {chocolate,
## newspapers} => {pastry} 0.001220132 0.2222222 0.005490595 2.4977778 12
## [7050] {chocolate,
## newspapers} => {tropical_fruit} 0.001728521 0.3148148 0.005490595 3.0001974 17
## [7051] {chocolate,
## tropical_fruit} => {newspapers} 0.001728521 0.2125000 0.008134215 2.6623408 17
## [7052] {chocolate,
## newspapers} => {soda} 0.002033554 0.3703704 0.005490595 2.1239607 20
## [7053] {chocolate,
## newspapers} => {yogurt} 0.001728521 0.3148148 0.005490595 2.2567082 17
## [7054] {chocolate,
## newspapers} => {rolls/buns} 0.002338587 0.4259259 0.005490595 2.3156338 23
## [7055] {chocolate,
## newspapers} => {other_vegetables} 0.002033554 0.3703704 0.005490595 1.9141317 20
## [7056] {chocolate,
## newspapers} => {whole_milk} 0.003152008 0.5740741 0.005490595 2.2467244 31
## [7057] {chocolate,
## domestic_eggs} => {fruit/vegetable_juice} 0.001016777 0.2777778 0.003660397 3.8423972 10
## [7058] {chocolate,
## domestic_eggs} => {pastry} 0.001321810 0.3611111 0.003660397 4.0588889 13
## [7059] {chocolate,
## domestic_eggs} => {shopping_bags} 0.001016777 0.2777778 0.003660397 2.8193441 10
## [7060] {chocolate,
## domestic_eggs} => {sausage} 0.001220132 0.3333333 0.003660397 3.5479798 12
## [7061] {chocolate,
## domestic_eggs} => {soda} 0.001423488 0.3888889 0.003660397 2.2301587 14
## [7062] {chocolate,
## domestic_eggs} => {yogurt} 0.001423488 0.3888889 0.003660397 2.7876984 14
## [7063] {chocolate,
## domestic_eggs} => {rolls/buns} 0.001321810 0.3611111 0.003660397 1.9632547 13
## [7064] {chocolate,
## domestic_eggs} => {other_vegetables} 0.001118454 0.3055556 0.003660397 1.5791586 11
## [7065] {chocolate,
## domestic_eggs} => {whole_milk} 0.002033554 0.5555556 0.003660397 2.1742495 20
## [7066] {chocolate,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001220132 0.2666667 0.004575496 3.6887014 12
## [7067] {chocolate,
## fruit/vegetable_juice} => {pastry} 0.001626843 0.2388060 0.006812405 2.6841791 16
## [7068] {chocolate,
## pastry} => {fruit/vegetable_juice} 0.001626843 0.2025316 0.008032537 2.8015453 16
## [7069] {chocolate,
## fruit/vegetable_juice} => {citrus_fruit} 0.001525165 0.2238806 0.006812405 2.7049947 15
## [7070] {chocolate,
## citrus_fruit} => {fruit/vegetable_juice} 0.001525165 0.2380952 0.006405694 3.2934834 15
## [7071] {chocolate,
## fruit/vegetable_juice} => {shopping_bags} 0.001830198 0.2686567 0.006812405 2.7267686 18
## [7072] {chocolate,
## shopping_bags} => {fruit/vegetable_juice} 0.001830198 0.2250000 0.008134215 3.1123418 18
## [7073] {chocolate,
## fruit/vegetable_juice} => {sausage} 0.001525165 0.2238806 0.006812405 2.3829715 15
## [7074] {chocolate,
## sausage} => {fruit/vegetable_juice} 0.001525165 0.2307692 0.006609049 3.1921454 15
## [7075] {bottled_water,
## chocolate} => {fruit/vegetable_juice} 0.001220132 0.2105263 0.005795628 2.9121327 12
## [7076] {chocolate,
## fruit/vegetable_juice} => {tropical_fruit} 0.001525165 0.2238806 0.006812405 2.1335908 15
## [7077] {chocolate,
## fruit/vegetable_juice} => {root_vegetables} 0.001525165 0.2238806 0.006812405 2.0539792 15
## [7078] {chocolate,
## root_vegetables} => {fruit/vegetable_juice} 0.001525165 0.2380952 0.006405694 3.2934834 15
## [7079] {chocolate,
## fruit/vegetable_juice} => {soda} 0.002236909 0.3283582 0.006812405 1.8830338 22
## [7080] {chocolate,
## fruit/vegetable_juice} => {yogurt} 0.002440264 0.3582090 0.006812405 2.5677734 24
## [7081] {chocolate,
## yogurt} => {fruit/vegetable_juice} 0.002440264 0.2637363 0.009252669 3.6481662 24
## [7082] {chocolate,
## fruit/vegetable_juice} => {rolls/buns} 0.002033554 0.2985075 0.006812405 1.6228971 20
## [7083] {chocolate,
## fruit/vegetable_juice} => {other_vegetables} 0.002846975 0.4179104 0.006812405 2.1598262 28
## [7084] {chocolate,
## other_vegetables} => {fruit/vegetable_juice} 0.002846975 0.2240000 0.012709710 3.0985091 28
## [7085] {chocolate,
## fruit/vegetable_juice} => {whole_milk} 0.003253686 0.4776119 0.006812405 1.8692055 32
## [7086] {chocolate,
## whipped/sour_cream} => {pip_fruit} 0.001118454 0.2444444 0.004575496 3.2313321 11
## [7087] {chocolate,
## whipped/sour_cream} => {pastry} 0.001118454 0.2444444 0.004575496 2.7475556 11
## [7088] {chocolate,
## whipped/sour_cream} => {tropical_fruit} 0.001016777 0.2222222 0.004575496 2.1177864 10
## [7089] {chocolate,
## whipped/sour_cream} => {soda} 0.001321810 0.2888889 0.004575496 1.6566893 13
## [7090] {chocolate,
## whipped/sour_cream} => {yogurt} 0.002033554 0.4444444 0.004575496 3.1859410 20
## [7091] {chocolate,
## yogurt} => {whipped/sour_cream} 0.002033554 0.2197802 0.009252669 3.0660120 20
## [7092] {chocolate,
## whipped/sour_cream} => {rolls/buns} 0.001423488 0.3111111 0.004575496 1.6914194 14
## [7093] {chocolate,
## whipped/sour_cream} => {other_vegetables} 0.002236909 0.4888889 0.004575496 2.5266538 22
## [7094] {chocolate,
## whipped/sour_cream} => {whole_milk} 0.001830198 0.4000000 0.004575496 1.5654596 18
## [7095] {chocolate,
## pip_fruit} => {citrus_fruit} 0.001626843 0.2666667 0.006100661 3.2219492 16
## [7096] {chocolate,
## citrus_fruit} => {pip_fruit} 0.001626843 0.2539683 0.006405694 3.3572282 16
## [7097] {chocolate,
## pip_fruit} => {shopping_bags} 0.001220132 0.2000000 0.006100661 2.0299278 12
## [7098] {chocolate,
## pip_fruit} => {sausage} 0.001220132 0.2000000 0.006100661 2.1287879 12
## [7099] {chocolate,
## pip_fruit} => {tropical_fruit} 0.002135231 0.3500000 0.006100661 3.3355136 21
## [7100] {chocolate,
## tropical_fruit} => {pip_fruit} 0.002135231 0.2625000 0.008134215 3.4700101 21
## [7101] {chocolate,
## pip_fruit} => {root_vegetables} 0.001525165 0.2500000 0.006100661 2.2936101 15
## [7102] {chocolate,
## root_vegetables} => {pip_fruit} 0.001525165 0.2380952 0.006405694 3.1474014 15
## [7103] {chocolate,
## pip_fruit} => {soda} 0.001321810 0.2166667 0.006100661 1.2425170 13
## [7104] {chocolate,
## pip_fruit} => {yogurt} 0.001626843 0.2666667 0.006100661 1.9115646 16
## [7105] {chocolate,
## pip_fruit} => {rolls/buns} 0.001525165 0.2500000 0.006100661 1.3591763 15
## [7106] {chocolate,
## pip_fruit} => {other_vegetables} 0.002440264 0.4000000 0.006100661 2.0672622 24
## [7107] {chocolate,
## pip_fruit} => {whole_milk} 0.003253686 0.5333333 0.006100661 2.0872795 32
## [7108] {chocolate,
## pastry} => {citrus_fruit} 0.001626843 0.2025316 0.008032537 2.4470500 16
## [7109] {chocolate,
## citrus_fruit} => {pastry} 0.001626843 0.2539683 0.006405694 2.8546032 16
## [7110] {chocolate,
## pastry} => {shopping_bags} 0.001728521 0.2151899 0.008032537 2.1840995 17
## [7111] {chocolate,
## shopping_bags} => {pastry} 0.001728521 0.2125000 0.008134215 2.3885000 17
## [7112] {chocolate,
## pastry} => {tropical_fruit} 0.002236909 0.2784810 0.008032537 2.6539348 22
## [7113] {chocolate,
## tropical_fruit} => {pastry} 0.002236909 0.2750000 0.008134215 3.0910000 22
## [7114] {chocolate,
## pastry} => {soda} 0.002236909 0.2784810 0.008032537 1.5970034 22
## [7115] {chocolate,
## pastry} => {yogurt} 0.001728521 0.2151899 0.008032537 1.5425601 17
## [7116] {chocolate,
## pastry} => {rolls/buns} 0.002440264 0.3037975 0.008032537 1.6516573 24
## [7117] {chocolate,
## rolls/buns} => {pastry} 0.002440264 0.2068966 0.011794611 2.3255172 24
## [7118] {chocolate,
## pastry} => {other_vegetables} 0.002338587 0.2911392 0.008032537 1.5046529 23
## [7119] {chocolate,
## pastry} => {whole_milk} 0.002948653 0.3670886 0.008032537 1.4366560 29
## [7120] {chocolate,
## citrus_fruit} => {shopping_bags} 0.001626843 0.2539683 0.006405694 2.5776860 16
## [7121] {chocolate,
## shopping_bags} => {citrus_fruit} 0.001626843 0.2000000 0.008134215 2.4164619 16
## [7122] {chocolate,
## citrus_fruit} => {sausage} 0.001525165 0.2380952 0.006405694 2.5342713 15
## [7123] {chocolate,
## sausage} => {citrus_fruit} 0.001525165 0.2307692 0.006609049 2.7882253 15
## [7124] {chocolate,
## citrus_fruit} => {bottled_water} 0.001321810 0.2063492 0.006405694 1.8670142 13
## [7125] {bottled_water,
## chocolate} => {citrus_fruit} 0.001321810 0.2280702 0.005795628 2.7556145 13
## [7126] {chocolate,
## citrus_fruit} => {tropical_fruit} 0.002033554 0.3174603 0.006405694 3.0254091 20
## [7127] {chocolate,
## tropical_fruit} => {citrus_fruit} 0.002033554 0.2500000 0.008134215 3.0205774 20
## [7128] {chocolate,
## citrus_fruit} => {root_vegetables} 0.001728521 0.2698413 0.006405694 2.4756426 17
## [7129] {chocolate,
## root_vegetables} => {citrus_fruit} 0.001728521 0.2698413 0.006405694 3.2603058 17
## [7130] {chocolate,
## citrus_fruit} => {soda} 0.002033554 0.3174603 0.006405694 1.8205377 20
## [7131] {chocolate,
## citrus_fruit} => {yogurt} 0.002033554 0.3174603 0.006405694 2.2756722 20
## [7132] {chocolate,
## yogurt} => {citrus_fruit} 0.002033554 0.2197802 0.009252669 2.6554527 20
## [7133] {chocolate,
## citrus_fruit} => {rolls/buns} 0.001525165 0.2380952 0.006405694 1.2944537 15
## [7134] {chocolate,
## citrus_fruit} => {other_vegetables} 0.002745297 0.4285714 0.006405694 2.2149238 27
## [7135] {chocolate,
## other_vegetables} => {citrus_fruit} 0.002745297 0.2160000 0.012709710 2.6097789 27
## [7136] {chocolate,
## citrus_fruit} => {whole_milk} 0.002643620 0.4126984 0.006405694 1.6151567 26
## [7137] {chocolate,
## shopping_bags} => {soda} 0.002236909 0.2750000 0.008134215 1.5770408 22
## [7138] {chocolate,
## shopping_bags} => {rolls/buns} 0.002135231 0.2625000 0.008134215 1.4271352 21
## [7139] {chocolate,
## shopping_bags} => {other_vegetables} 0.002033554 0.2500000 0.008134215 1.2920389 20
## [7140] {chocolate,
## shopping_bags} => {whole_milk} 0.002135231 0.2625000 0.008134215 1.0273329 21
## [7141] {chocolate,
## sausage} => {tropical_fruit} 0.001728521 0.2615385 0.006609049 2.4924717 17
## [7142] {chocolate,
## tropical_fruit} => {sausage} 0.001728521 0.2125000 0.008134215 2.2618371 17
## [7143] {chocolate,
## sausage} => {root_vegetables} 0.001525165 0.2307692 0.006609049 2.1171785 15
## [7144] {chocolate,
## root_vegetables} => {sausage} 0.001525165 0.2380952 0.006405694 2.5342713 15
## [7145] {chocolate,
## sausage} => {soda} 0.002236909 0.3384615 0.006609049 1.9409733 22
## [7146] {chocolate,
## sausage} => {yogurt} 0.001830198 0.2769231 0.006609049 1.9850863 18
## [7147] {chocolate,
## sausage} => {rolls/buns} 0.002338587 0.3538462 0.006609049 1.9237573 23
## [7148] {chocolate,
## sausage} => {other_vegetables} 0.003152008 0.4769231 0.006609049 2.4648126 31
## [7149] {chocolate,
## other_vegetables} => {sausage} 0.003152008 0.2480000 0.012709710 2.6396970 31
## [7150] {chocolate,
## sausage} => {whole_milk} 0.003457041 0.5230769 0.006609049 2.0471395 34
## [7151] {chocolate,
## whole_milk} => {sausage} 0.003457041 0.2073171 0.016675140 2.2066704 34
## [7152] {bottled_water,
## chocolate} => {tropical_fruit} 0.001321810 0.2280702 0.005795628 2.1735176 13
## [7153] {bottled_water,
## chocolate} => {soda} 0.002541942 0.4385965 0.005795628 2.5152166 25
## [7154] {bottled_water,
## chocolate} => {yogurt} 0.002236909 0.3859649 0.005795628 2.7667383 22
## [7155] {chocolate,
## yogurt} => {bottled_water} 0.002236909 0.2417582 0.009252669 2.1873894 22
## [7156] {bottled_water,
## chocolate} => {rolls/buns} 0.002033554 0.3508772 0.005795628 1.9076159 20
## [7157] {bottled_water,
## chocolate} => {other_vegetables} 0.001728521 0.2982456 0.005795628 1.5413797 17
## [7158] {bottled_water,
## chocolate} => {whole_milk} 0.002236909 0.3859649 0.005795628 1.5105312 22
## [7159] {chocolate,
## root_vegetables} => {tropical_fruit} 0.001525165 0.2380952 0.006405694 2.2690568 15
## [7160] {chocolate,
## tropical_fruit} => {soda} 0.002338587 0.2875000 0.008134215 1.6487245 23
## [7161] {chocolate,
## tropical_fruit} => {yogurt} 0.002135231 0.2625000 0.008134215 1.8816964 21
## [7162] {chocolate,
## yogurt} => {tropical_fruit} 0.002135231 0.2307692 0.009252669 2.1992397 21
## [7163] {chocolate,
## tropical_fruit} => {rolls/buns} 0.002745297 0.3375000 0.008134215 1.8348881 27
## [7164] {chocolate,
## rolls/buns} => {tropical_fruit} 0.002745297 0.2327586 0.011794611 2.2181987 27
## [7165] {chocolate,
## tropical_fruit} => {other_vegetables} 0.003558719 0.4375000 0.008134215 2.2610681 35
## [7166] {chocolate,
## other_vegetables} => {tropical_fruit} 0.003558719 0.2800000 0.012709710 2.6684109 35
## [7167] {chocolate,
## tropical_fruit} => {whole_milk} 0.003965430 0.4875000 0.008134215 1.9079039 39
## [7168] {chocolate,
## whole_milk} => {tropical_fruit} 0.003965430 0.2378049 0.016675140 2.2662897 39
## [7169] {chocolate,
## root_vegetables} => {soda} 0.001728521 0.2698413 0.006405694 1.5474571 17
## [7170] {chocolate,
## root_vegetables} => {yogurt} 0.001321810 0.2063492 0.006405694 1.4791869 13
## [7171] {chocolate,
## root_vegetables} => {rolls/buns} 0.001321810 0.2063492 0.006405694 1.1218598 13
## [7172] {chocolate,
## root_vegetables} => {other_vegetables} 0.003355363 0.5238095 0.006405694 2.7071291 33
## [7173] {chocolate,
## other_vegetables} => {root_vegetables} 0.003355363 0.2640000 0.012709710 2.4220522 33
## [7174] {chocolate,
## root_vegetables} => {whole_milk} 0.003558719 0.5555556 0.006405694 2.1742495 35
## [7175] {chocolate,
## whole_milk} => {root_vegetables} 0.003558719 0.2134146 0.016675140 1.9579598 35
## [7176] {chocolate,
## soda} => {yogurt} 0.002948653 0.2180451 0.013523132 1.5630275 29
## [7177] {chocolate,
## yogurt} => {soda} 0.002948653 0.3186813 0.009252669 1.8275398 29
## [7178] {chocolate,
## soda} => {rolls/buns} 0.004067107 0.3007519 0.013523132 1.6350994 40
## [7179] {chocolate,
## rolls/buns} => {soda} 0.004067107 0.3448276 0.011794611 1.9774806 40
## [7180] {chocolate,
## soda} => {other_vegetables} 0.003660397 0.2706767 0.013523132 1.3988992 36
## [7181] {chocolate,
## other_vegetables} => {soda} 0.003660397 0.2880000 0.012709710 1.6515918 36
## [7182] {chocolate,
## soda} => {whole_milk} 0.005083884 0.3759398 0.013523132 1.4712966 50
## [7183] {chocolate,
## whole_milk} => {soda} 0.005083884 0.3048780 0.016675140 1.7483823 50
## [7184] {chocolate,
## yogurt} => {rolls/buns} 0.003355363 0.3626374 0.009252669 1.9715525 33
## [7185] {chocolate,
## rolls/buns} => {yogurt} 0.003355363 0.2844828 0.011794611 2.0392769 33
## [7186] {chocolate,
## yogurt} => {other_vegetables} 0.003660397 0.3956044 0.009252669 2.0445451 36
## [7187] {chocolate,
## other_vegetables} => {yogurt} 0.003660397 0.2880000 0.012709710 2.0644898 36
## [7188] {chocolate,
## yogurt} => {whole_milk} 0.004575496 0.4945055 0.009252669 1.9353209 45
## [7189] {chocolate,
## whole_milk} => {yogurt} 0.004575496 0.2743902 0.016675140 1.9669301 45
## [7190] {chocolate,
## rolls/buns} => {other_vegetables} 0.003863752 0.3275862 0.011794611 1.6930165 38
## [7191] {chocolate,
## other_vegetables} => {rolls/buns} 0.003863752 0.3040000 0.012709710 1.6527584 38
## [7192] {chocolate,
## rolls/buns} => {whole_milk} 0.004982206 0.4224138 0.011794611 1.6531793 49
## [7193] {chocolate,
## whole_milk} => {rolls/buns} 0.004982206 0.2987805 0.016675140 1.6243815 49
## [7194] {chocolate,
## other_vegetables} => {whole_milk} 0.005490595 0.4320000 0.012709710 1.6906964 54
## [7195] {chocolate,
## whole_milk} => {other_vegetables} 0.005490595 0.3292683 0.016675140 1.7017098 54
## [7196] {coffee,
## frozen_vegetables} => {beef} 0.001016777 0.2272727 0.004473818 4.3318358 10
## [7197] {beef,
## coffee} => {frozen_vegetables} 0.001016777 0.2702703 0.003762074 5.6196789 10
## [7198] {beef,
## frozen_vegetables} => {coffee} 0.001016777 0.2222222 0.004575496 3.8275929 10
## [7199] {coffee,
## frozen_vegetables} => {fruit/vegetable_juice} 0.001118454 0.2500000 0.004473818 3.4581575 11
## [7200] {coffee,
## frozen_vegetables} => {tropical_fruit} 0.001016777 0.2272727 0.004473818 2.1659179 10
## [7201] {coffee,
## frozen_vegetables} => {yogurt} 0.001525165 0.3409091 0.004473818 2.4437616 15
## [7202] {coffee,
## frozen_vegetables} => {other_vegetables} 0.001728521 0.3863636 0.004473818 1.9967874 17
## [7203] {coffee,
## frozen_vegetables} => {whole_milk} 0.002338587 0.5227273 0.004473818 2.0457711 23
## [7204] {beef,
## coffee} => {butter} 0.001220132 0.3243243 0.003762074 5.8527151 12
## [7205] {butter,
## coffee} => {beef} 0.001220132 0.2553191 0.004778851 4.8664028 12
## [7206] {beef,
## butter} => {coffee} 0.001220132 0.2105263 0.005795628 3.6261407 12
## [7207] {beef,
## coffee} => {domestic_eggs} 0.001016777 0.2702703 0.003762074 4.2597886 10
## [7208] {coffee,
## domestic_eggs} => {beef} 0.001016777 0.2040816 0.004982206 3.8898117 10
## [7209] {beef,
## coffee} => {root_vegetables} 0.001118454 0.2972973 0.003762074 2.7275363 11
## [7210] {beef,
## coffee} => {yogurt} 0.001118454 0.2972973 0.003762074 2.1311362 11
## [7211] {beef,
## coffee} => {rolls/buns} 0.001118454 0.2972973 0.003762074 1.6163178 11
## [7212] {beef,
## coffee} => {other_vegetables} 0.001525165 0.4054054 0.003762074 2.0951982 15
## [7213] {beef,
## coffee} => {whole_milk} 0.002338587 0.6216216 0.003762074 2.4328089 23
## [7214] {coffee,
## curd} => {whipped/sour_cream} 0.001016777 0.3125000 0.003253686 4.3594858 10
## [7215] {coffee,
## curd} => {yogurt} 0.001220132 0.3750000 0.003253686 2.6881378 12
## [7216] {coffee,
## curd} => {whole_milk} 0.001626843 0.5000000 0.003253686 1.9568245 16
## [7217] {coffee,
## napkins} => {shopping_bags} 0.001220132 0.3000000 0.004067107 3.0448916 12
## [7218] {coffee,
## napkins} => {sausage} 0.001016777 0.2500000 0.004067107 2.6609848 10
## [7219] {coffee,
## napkins} => {soda} 0.001118454 0.2750000 0.004067107 1.5770408 11
## [7220] {coffee,
## napkins} => {yogurt} 0.001321810 0.3250000 0.004067107 2.3297194 13
## [7221] {coffee,
## napkins} => {other_vegetables} 0.001423488 0.3500000 0.004067107 1.8088544 14
## [7222] {coffee,
## napkins} => {whole_milk} 0.002440264 0.6000000 0.004067107 2.3481894 24
## [7223] {coffee,
## pork} => {other_vegetables} 0.001830198 0.5142857 0.003558719 2.6579086 18
## [7224] {coffee,
## pork} => {whole_milk} 0.002033554 0.5714286 0.003558719 2.2363709 20
## [7225] {coffee,
## frankfurter} => {pastry} 0.001118454 0.2200000 0.005083884 2.4728000 11
## [7226] {coffee,
## frankfurter} => {bottled_water} 0.001016777 0.2000000 0.005083884 1.8095676 10
## [7227] {coffee,
## frankfurter} => {root_vegetables} 0.001016777 0.2000000 0.005083884 1.8348881 10
## [7228] {coffee,
## frankfurter} => {yogurt} 0.001728521 0.3400000 0.005083884 2.4372449 17
## [7229] {coffee,
## frankfurter} => {rolls/buns} 0.001830198 0.3600000 0.005083884 1.9572139 18
## [7230] {coffee,
## frankfurter} => {other_vegetables} 0.001931876 0.3800000 0.005083884 1.9638991 19
## [7231] {coffee,
## frankfurter} => {whole_milk} 0.002643620 0.5200000 0.005083884 2.0350975 26
## [7232] {bottled_beer,
## coffee} => {fruit/vegetable_juice} 0.001016777 0.2040816 0.004982206 2.8229857 10
## [7233] {bottled_beer,
## coffee} => {bottled_water} 0.001220132 0.2448980 0.004982206 2.2157971 12
## [7234] {bottled_beer,
## coffee} => {root_vegetables} 0.001220132 0.2448980 0.004982206 2.2468017 12
## [7235] {bottled_beer,
## coffee} => {soda} 0.001423488 0.2857143 0.004982206 1.6384840 14
## [7236] {bottled_beer,
## coffee} => {yogurt} 0.001220132 0.2448980 0.004982206 1.7555185 12
## [7237] {bottled_beer,
## coffee} => {rolls/buns} 0.001321810 0.2653061 0.004982206 1.4423912 13
## [7238] {bottled_beer,
## coffee} => {other_vegetables} 0.001830198 0.3673469 0.004982206 1.8985061 18
## [7239] {bottled_beer,
## coffee} => {whole_milk} 0.002541942 0.5102041 0.004982206 1.9967597 25
## [7240] {brown_bread,
## coffee} => {soda} 0.001525165 0.4054054 0.003762074 2.3248759 15
## [7241] {brown_bread,
## coffee} => {yogurt} 0.001016777 0.2702703 0.003762074 1.9373966 10
## [7242] {brown_bread,
## coffee} => {other_vegetables} 0.001220132 0.3243243 0.003762074 1.6761586 12
## [7243] {brown_bread,
## coffee} => {whole_milk} 0.001118454 0.2972973 0.003762074 1.1635173 11
## [7244] {coffee,
## margarine} => {domestic_eggs} 0.001220132 0.2608696 0.004677173 4.1116221 12
## [7245] {coffee,
## domestic_eggs} => {margarine} 0.001220132 0.2448980 0.004982206 4.1815476 12
## [7246] {coffee,
## margarine} => {pip_fruit} 0.001220132 0.2608696 0.004677173 3.4484572 12
## [7247] {coffee,
## margarine} => {pastry} 0.001220132 0.2608696 0.004677173 2.9321739 12
## [7248] {coffee,
## margarine} => {tropical_fruit} 0.001118454 0.2391304 0.004677173 2.2789223 11
## [7249] {coffee,
## margarine} => {root_vegetables} 0.001016777 0.2173913 0.004677173 1.9944435 10
## [7250] {coffee,
## margarine} => {yogurt} 0.001321810 0.2826087 0.004677173 2.0258429 13
## [7251] {coffee,
## margarine} => {rolls/buns} 0.001016777 0.2173913 0.004677173 1.1818925 10
## [7252] {coffee,
## margarine} => {other_vegetables} 0.002135231 0.4565217 0.004677173 2.3593754 21
## [7253] {coffee,
## margarine} => {whole_milk} 0.001830198 0.3913043 0.004677173 1.5314279 18
## [7254] {butter,
## coffee} => {domestic_eggs} 0.001016777 0.2127660 0.004778851 3.3534506 10
## [7255] {coffee,
## domestic_eggs} => {butter} 0.001016777 0.2040816 0.004982206 3.6828309 10
## [7256] {butter,
## coffee} => {whipped/sour_cream} 0.001321810 0.2765957 0.004778851 3.8586087 13
## [7257] {coffee,
## whipped/sour_cream} => {butter} 0.001321810 0.2166667 0.006100661 3.9099388 13
## [7258] {butter,
## coffee} => {citrus_fruit} 0.001016777 0.2127660 0.004778851 2.5707042 10
## [7259] {butter,
## coffee} => {sausage} 0.001016777 0.2127660 0.004778851 2.2646680 10
## [7260] {butter,
## coffee} => {root_vegetables} 0.001728521 0.3617021 0.004778851 3.3184146 17
## [7261] {coffee,
## root_vegetables} => {butter} 0.001728521 0.2361111 0.007320793 4.2608308 17
## [7262] {butter,
## coffee} => {yogurt} 0.001626843 0.3404255 0.004778851 2.4402953 16
## [7263] {butter,
## coffee} => {rolls/buns} 0.001220132 0.2553191 0.004778851 1.3880950 12
## [7264] {butter,
## coffee} => {other_vegetables} 0.001931876 0.4042553 0.004778851 2.0892544 19
## [7265] {butter,
## coffee} => {whole_milk} 0.003355363 0.7021277 0.004778851 2.7478812 33
## [7266] {coffee,
## newspapers} => {root_vegetables} 0.001118454 0.2444444 0.004575496 2.2426410 11
## [7267] {coffee,
## newspapers} => {soda} 0.001016777 0.2222222 0.004575496 1.2743764 10
## [7268] {coffee,
## newspapers} => {yogurt} 0.001016777 0.2222222 0.004575496 1.5929705 10
## [7269] {coffee,
## newspapers} => {rolls/buns} 0.001423488 0.3111111 0.004575496 1.6914194 14
## [7270] {coffee,
## newspapers} => {other_vegetables} 0.001423488 0.3111111 0.004575496 1.6078706 14
## [7271] {coffee,
## newspapers} => {whole_milk} 0.002135231 0.4666667 0.004575496 1.8263695 21
## [7272] {coffee,
## domestic_eggs} => {pastry} 0.001220132 0.2448980 0.004982206 2.7526531 12
## [7273] {coffee,
## domestic_eggs} => {shopping_bags} 0.001118454 0.2244898 0.004982206 2.2784903 11
## [7274] {coffee,
## domestic_eggs} => {sausage} 0.001220132 0.2448980 0.004982206 2.6066790 12
## [7275] {coffee,
## domestic_eggs} => {tropical_fruit} 0.001016777 0.2040816 0.004982206 1.9449059 10
## [7276] {coffee,
## domestic_eggs} => {root_vegetables} 0.001118454 0.2244898 0.004982206 2.0595682 11
## [7277] {coffee,
## domestic_eggs} => {soda} 0.001118454 0.2244898 0.004982206 1.2873803 11
## [7278] {coffee,
## domestic_eggs} => {yogurt} 0.001525165 0.3061224 0.004982206 2.1943982 15
## [7279] {coffee,
## domestic_eggs} => {rolls/buns} 0.001220132 0.2448980 0.004982206 1.3314380 12
## [7280] {coffee,
## domestic_eggs} => {other_vegetables} 0.001931876 0.3877551 0.004982206 2.0039787 19
## [7281] {coffee,
## domestic_eggs} => {whole_milk} 0.002745297 0.5510204 0.004982206 2.1565005 27
## [7282] {coffee,
## fruit/vegetable_juice} => {shopping_bags} 0.001220132 0.2033898 0.005998983 2.0643333 12
## [7283] {coffee,
## fruit/vegetable_juice} => {bottled_water} 0.001728521 0.2881356 0.005998983 2.6070042 17
## [7284] {bottled_water,
## coffee} => {fruit/vegetable_juice} 0.001728521 0.2361111 0.007320793 3.2660377 17
## [7285] {coffee,
## fruit/vegetable_juice} => {tropical_fruit} 0.001931876 0.3220339 0.005998983 3.0689955 19
## [7286] {coffee,
## tropical_fruit} => {fruit/vegetable_juice} 0.001931876 0.2714286 0.007117438 3.7545710 19
## [7287] {coffee,
## fruit/vegetable_juice} => {root_vegetables} 0.001220132 0.2033898 0.005998983 1.8659879 12
## [7288] {coffee,
## fruit/vegetable_juice} => {soda} 0.002643620 0.4406780 0.005998983 2.5271532 26
## [7289] {coffee,
## soda} => {fruit/vegetable_juice} 0.002643620 0.2653061 0.009964413 3.6698815 26
## [7290] {coffee,
## fruit/vegetable_juice} => {yogurt} 0.001931876 0.3220339 0.005998983 2.3084573 19
## [7291] {coffee,
## fruit/vegetable_juice} => {rolls/buns} 0.001220132 0.2033898 0.005998983 1.1057706 12
## [7292] {coffee,
## fruit/vegetable_juice} => {other_vegetables} 0.002440264 0.4067797 0.005998983 2.1023006 24
## [7293] {coffee,
## fruit/vegetable_juice} => {whole_milk} 0.002643620 0.4406780 0.005998983 1.7246589 26
## [7294] {coffee,
## whipped/sour_cream} => {pip_fruit} 0.001220132 0.2000000 0.006100661 2.6438172 12
## [7295] {coffee,
## whipped/sour_cream} => {tropical_fruit} 0.001423488 0.2333333 0.006100661 2.2236757 14
## [7296] {coffee,
## tropical_fruit} => {whipped/sour_cream} 0.001423488 0.2000000 0.007117438 2.7900709 14
## [7297] {coffee,
## whipped/sour_cream} => {root_vegetables} 0.001321810 0.2166667 0.006100661 1.9877954 13
## [7298] {coffee,
## whipped/sour_cream} => {soda} 0.001321810 0.2166667 0.006100661 1.2425170 13
## [7299] {coffee,
## whipped/sour_cream} => {yogurt} 0.001728521 0.2833333 0.006100661 2.0310374 17
## [7300] {coffee,
## whipped/sour_cream} => {other_vegetables} 0.002846975 0.4666667 0.006100661 2.4118059 28
## [7301] {coffee,
## other_vegetables} => {whipped/sour_cream} 0.002846975 0.2121212 0.013421454 2.9591661 28
## [7302] {coffee,
## whipped/sour_cream} => {whole_milk} 0.003457041 0.5666667 0.006100661 2.2177344 34
## [7303] {coffee,
## pip_fruit} => {tropical_fruit} 0.002440264 0.3529412 0.006914082 3.3635431 24
## [7304] {coffee,
## tropical_fruit} => {pip_fruit} 0.002440264 0.3428571 0.007117438 4.5322581 24
## [7305] {coffee,
## pip_fruit} => {root_vegetables} 0.002033554 0.2941176 0.006914082 2.6983648 20
## [7306] {coffee,
## root_vegetables} => {pip_fruit} 0.002033554 0.2777778 0.007320793 3.6719683 20
## [7307] {coffee,
## pip_fruit} => {yogurt} 0.001525165 0.2205882 0.006914082 1.5812575 15
## [7308] {coffee,
## pip_fruit} => {other_vegetables} 0.002541942 0.3676471 0.006914082 1.9000572 25
## [7309] {coffee,
## pip_fruit} => {whole_milk} 0.002643620 0.3823529 0.006914082 1.4963952 26
## [7310] {coffee,
## pastry} => {tropical_fruit} 0.001931876 0.2794118 0.006914082 2.6628049 19
## [7311] {coffee,
## tropical_fruit} => {pastry} 0.001931876 0.2714286 0.007117438 3.0508571 19
## [7312] {coffee,
## pastry} => {yogurt} 0.002236909 0.3235294 0.006914082 2.3191777 22
## [7313] {coffee,
## yogurt} => {pastry} 0.002236909 0.2291667 0.009761057 2.5758333 22
## [7314] {coffee,
## pastry} => {rolls/buns} 0.001931876 0.2794118 0.006914082 1.5190794 19
## [7315] {coffee,
## pastry} => {other_vegetables} 0.001728521 0.2500000 0.006914082 1.2920389 17
## [7316] {coffee,
## pastry} => {whole_milk} 0.002643620 0.3823529 0.006914082 1.4963952 26
## [7317] {citrus_fruit,
## coffee} => {tropical_fruit} 0.001321810 0.2063492 0.006405694 1.9665159 13
## [7318] {citrus_fruit,
## coffee} => {root_vegetables} 0.001423488 0.2222222 0.006405694 2.0387645 14
## [7319] {citrus_fruit,
## coffee} => {other_vegetables} 0.002338587 0.3650794 0.006405694 1.8867869 23
## [7320] {citrus_fruit,
## coffee} => {whole_milk} 0.002236909 0.3492063 0.006405694 1.3666711 22
## [7321] {coffee,
## sausage} => {shopping_bags} 0.001423488 0.2058824 0.006914082 2.0896315 14
## [7322] {coffee,
## tropical_fruit} => {shopping_bags} 0.001525165 0.2142857 0.007117438 2.1749226 15
## [7323] {coffee,
## shopping_bags} => {other_vegetables} 0.002338587 0.2500000 0.009354347 1.2920389 23
## [7324] {coffee,
## shopping_bags} => {whole_milk} 0.003152008 0.3369565 0.009354347 1.3187296 31
## [7325] {coffee,
## sausage} => {root_vegetables} 0.001423488 0.2058824 0.006914082 1.8888554 14
## [7326] {coffee,
## sausage} => {soda} 0.001423488 0.2058824 0.006914082 1.1806723 14
## [7327] {coffee,
## sausage} => {yogurt} 0.001728521 0.2500000 0.006914082 1.7920918 17
## [7328] {coffee,
## sausage} => {rolls/buns} 0.001931876 0.2794118 0.006914082 1.5190794 19
## [7329] {coffee,
## sausage} => {other_vegetables} 0.002338587 0.3382353 0.006914082 1.7480526 23
## [7330] {coffee,
## sausage} => {whole_milk} 0.002745297 0.3970588 0.006914082 1.5539489 27
## [7331] {bottled_water,
## coffee} => {soda} 0.002440264 0.3333333 0.007320793 1.9115646 24
## [7332] {coffee,
## soda} => {bottled_water} 0.002440264 0.2448980 0.009964413 2.2157971 24
## [7333] {bottled_water,
## coffee} => {yogurt} 0.002236909 0.3055556 0.007320793 2.1903345 22
## [7334] {coffee,
## yogurt} => {bottled_water} 0.002236909 0.2291667 0.009761057 2.0734629 22
## [7335] {bottled_water,
## coffee} => {rolls/buns} 0.002236909 0.3055556 0.007320793 1.6612155 22
## [7336] {coffee,
## rolls/buns} => {bottled_water} 0.002236909 0.2037037 0.010981190 1.8430781 22
## [7337] {bottled_water,
## coffee} => {other_vegetables} 0.002135231 0.2916667 0.007320793 1.5073787 21
## [7338] {bottled_water,
## coffee} => {whole_milk} 0.002643620 0.3611111 0.007320793 1.4132621 26
## [7339] {coffee,
## tropical_fruit} => {root_vegetables} 0.001830198 0.2571429 0.007117438 2.3591418 18
## [7340] {coffee,
## root_vegetables} => {tropical_fruit} 0.001830198 0.2500000 0.007320793 2.3825097 18
## [7341] {coffee,
## tropical_fruit} => {soda} 0.001931876 0.2714286 0.007117438 1.5565598 19
## [7342] {coffee,
## tropical_fruit} => {yogurt} 0.003050330 0.4285714 0.007117438 3.0721574 30
## [7343] {coffee,
## yogurt} => {tropical_fruit} 0.003050330 0.3125000 0.009761057 2.9781371 30
## [7344] {coffee,
## tropical_fruit} => {rolls/buns} 0.001525165 0.2142857 0.007117438 1.1650083 15
## [7345] {coffee,
## tropical_fruit} => {other_vegetables} 0.002643620 0.3714286 0.007117438 1.9196006 26
## [7346] {coffee,
## tropical_fruit} => {whole_milk} 0.002745297 0.3857143 0.007117438 1.5095503 27
## [7347] {coffee,
## root_vegetables} => {yogurt} 0.002135231 0.2916667 0.007320793 2.0907738 21
## [7348] {coffee,
## yogurt} => {root_vegetables} 0.002135231 0.2187500 0.009761057 2.0069088 21
## [7349] {coffee,
## root_vegetables} => {rolls/buns} 0.002135231 0.2916667 0.007320793 1.5857057 21
## [7350] {coffee,
## root_vegetables} => {other_vegetables} 0.003457041 0.4722222 0.007320793 2.4405179 34
## [7351] {coffee,
## other_vegetables} => {root_vegetables} 0.003457041 0.2575758 0.013421454 2.3631134 34
## [7352] {coffee,
## root_vegetables} => {whole_milk} 0.003965430 0.5416667 0.007320793 2.1198932 39
## [7353] {coffee,
## whole_milk} => {root_vegetables} 0.003965430 0.2119565 0.018708693 1.9445825 39
## [7354] {coffee,
## soda} => {yogurt} 0.002033554 0.2040816 0.009964413 1.4629321 20
## [7355] {coffee,
## yogurt} => {soda} 0.002033554 0.2083333 0.009761057 1.1947279 20
## [7356] {coffee,
## soda} => {rolls/buns} 0.002135231 0.2142857 0.009964413 1.1650083 21
## [7357] {coffee,
## soda} => {other_vegetables} 0.002643620 0.2653061 0.009964413 1.3711433 26
## [7358] {coffee,
## soda} => {whole_milk} 0.003253686 0.3265306 0.009964413 1.2779262 32
## [7359] {coffee,
## yogurt} => {rolls/buns} 0.002338587 0.2395833 0.009761057 1.3025440 23
## [7360] {coffee,
## rolls/buns} => {yogurt} 0.002338587 0.2129630 0.010981190 1.5265967 23
## [7361] {coffee,
## yogurt} => {other_vegetables} 0.003558719 0.3645833 0.009761057 1.8842234 35
## [7362] {coffee,
## other_vegetables} => {yogurt} 0.003558719 0.2651515 0.013421454 1.9007035 35
## [7363] {coffee,
## yogurt} => {whole_milk} 0.005083884 0.5208333 0.009761057 2.0383589 50
## [7364] {coffee,
## whole_milk} => {yogurt} 0.005083884 0.2717391 0.018708693 1.9479259 50
## [7365] {coffee,
## rolls/buns} => {other_vegetables} 0.002948653 0.2685185 0.010981190 1.3877455 29
## [7366] {coffee,
## other_vegetables} => {rolls/buns} 0.002948653 0.2196970 0.013421454 1.1944277 29
## [7367] {coffee,
## rolls/buns} => {whole_milk} 0.004677173 0.4259259 0.010981190 1.6669246 46
## [7368] {coffee,
## whole_milk} => {rolls/buns} 0.004677173 0.2500000 0.018708693 1.3591763 46
## [7369] {coffee,
## other_vegetables} => {whole_milk} 0.006405694 0.4772727 0.013421454 1.8678779 63
## [7370] {coffee,
## whole_milk} => {other_vegetables} 0.006405694 0.3423913 0.018708693 1.7695315 63
## [7371] {beef,
## frozen_vegetables} => {pork} 0.001016777 0.2222222 0.004575496 3.8545953 10
## [7372] {beef,
## frozen_vegetables} => {frankfurter} 0.001016777 0.2222222 0.004575496 3.7681992 10
## [7373] {frankfurter,
## frozen_vegetables} => {beef} 0.001016777 0.2000000 0.005083884 3.8120155 10
## [7374] {beef,
## frankfurter} => {frozen_vegetables} 0.001016777 0.2127660 0.004778851 4.4240025 10
## [7375] {beef,
## frozen_vegetables} => {whipped/sour_cream} 0.001118454 0.2444444 0.004575496 3.4100867 11
## [7376] {beef,
## frozen_vegetables} => {tropical_fruit} 0.001220132 0.2666667 0.004575496 2.5413437 12
## [7377] {beef,
## frozen_vegetables} => {root_vegetables} 0.001423488 0.3111111 0.004575496 2.8542703 14
## [7378] {beef,
## frozen_vegetables} => {yogurt} 0.001321810 0.2888889 0.004575496 2.0708617 13
## [7379] {beef,
## frozen_vegetables} => {rolls/buns} 0.001423488 0.3111111 0.004575496 1.6914194 14
## [7380] {beef,
## frozen_vegetables} => {other_vegetables} 0.002135231 0.4666667 0.004575496 2.4118059 21
## [7381] {beef,
## frozen_vegetables} => {whole_milk} 0.002236909 0.4888889 0.004575496 1.9133395 22
## [7382] {curd,
## frozen_vegetables} => {butter} 0.001016777 0.2272727 0.004473818 4.1013344 10
## [7383] {curd,
## frozen_vegetables} => {fruit/vegetable_juice} 0.001220132 0.2727273 0.004473818 3.7725355 12
## [7384] {curd,
## fruit/vegetable_juice} => {frozen_vegetables} 0.001220132 0.2500000 0.004880529 5.1982030 12
## [7385] {curd,
## frozen_vegetables} => {whipped/sour_cream} 0.001728521 0.3863636 0.004473818 5.3899097 17
## [7386] {frozen_vegetables,
## whipped/sour_cream} => {curd} 0.001728521 0.2179487 0.007930859 4.0906978 17
## [7387] {curd,
## frozen_vegetables} => {sausage} 0.001220132 0.2727273 0.004473818 2.9028926 12
## [7388] {frozen_vegetables,
## sausage} => {curd} 0.001220132 0.2033898 0.005998983 3.8174408 12
## [7389] {curd,
## frozen_vegetables} => {tropical_fruit} 0.001525165 0.3409091 0.004473818 3.2488768 15
## [7390] {curd,
## frozen_vegetables} => {root_vegetables} 0.001728521 0.3863636 0.004473818 3.5446701 17
## [7391] {curd,
## frozen_vegetables} => {soda} 0.001118454 0.2500000 0.004473818 1.4336735 11
## [7392] {curd,
## frozen_vegetables} => {yogurt} 0.002135231 0.4772727 0.004473818 3.4212662 21
## [7393] {curd,
## frozen_vegetables} => {rolls/buns} 0.001016777 0.2272727 0.004473818 1.2356149 10
## [7394] {curd,
## frozen_vegetables} => {other_vegetables} 0.002033554 0.4545455 0.004473818 2.3491616 20
## [7395] {curd,
## frozen_vegetables} => {whole_milk} 0.002846975 0.6363636 0.004473818 2.4905039 28
## [7396] {frozen_vegetables,
## napkins} => {pork} 0.001118454 0.2391304 0.004677173 4.1478798 11
## [7397] {napkins,
## pork} => {frozen_vegetables} 0.001118454 0.2156863 0.005185562 4.4847241 11
## [7398] {frozen_vegetables,
## napkins} => {butter} 0.001220132 0.2608696 0.004677173 4.7076187 12
## [7399] {butter,
## frozen_vegetables} => {napkins} 0.001220132 0.2105263 0.005795628 4.0204394 12
## [7400] {butter,
## napkins} => {frozen_vegetables} 0.001220132 0.2448980 0.004982206 5.0921172 12
## [7401] {frozen_vegetables,
## napkins} => {fruit/vegetable_juice} 0.001423488 0.3043478 0.004677173 4.2099309 14
## [7402] {fruit/vegetable_juice,
## napkins} => {frozen_vegetables} 0.001423488 0.2058824 0.006914082 4.2808730 14
## [7403] {frozen_vegetables,
## napkins} => {whipped/sour_cream} 0.001220132 0.2608696 0.004677173 3.6392229 12
## [7404] {frozen_vegetables,
## napkins} => {pip_fruit} 0.001220132 0.2608696 0.004677173 3.4484572 12
## [7405] {frozen_vegetables,
## napkins} => {citrus_fruit} 0.001321810 0.2826087 0.004677173 3.4145658 13
## [7406] {citrus_fruit,
## frozen_vegetables} => {napkins} 0.001321810 0.2000000 0.006609049 3.8194175 13
## [7407] {frozen_vegetables,
## napkins} => {bottled_water} 0.001016777 0.2173913 0.004677173 1.9669213 10
## [7408] {frozen_vegetables,
## napkins} => {tropical_fruit} 0.001220132 0.2608696 0.004677173 2.4860971 12
## [7409] {frozen_vegetables,
## napkins} => {root_vegetables} 0.001931876 0.4130435 0.004677173 3.7894427 19
## [7410] {frozen_vegetables,
## napkins} => {soda} 0.001220132 0.2608696 0.004677173 1.4960071 12
## [7411] {frozen_vegetables,
## napkins} => {yogurt} 0.001728521 0.3695652 0.004677173 2.6491792 17
## [7412] {frozen_vegetables,
## napkins} => {rolls/buns} 0.001016777 0.2173913 0.004677173 1.1818925 10
## [7413] {frozen_vegetables,
## napkins} => {other_vegetables} 0.001626843 0.3478261 0.004677173 1.7976193 16
## [7414] {frozen_vegetables,
## napkins} => {whole_milk} 0.002643620 0.5652174 0.004677173 2.2120625 26
## [7415] {frozen_vegetables,
## margarine} => {pork} 0.001220132 0.2400000 0.005083884 4.1629630 12
## [7416] {butter,
## frozen_vegetables} => {pork} 0.001220132 0.2105263 0.005795628 3.6517219 12
## [7417] {butter,
## pork} => {frozen_vegetables} 0.001220132 0.2222222 0.005490595 4.6206249 12
## [7418] {fruit/vegetable_juice,
## pork} => {frozen_vegetables} 0.001016777 0.2083333 0.004880529 4.3318358 10
## [7419] {frozen_vegetables,
## pork} => {whipped/sour_cream} 0.001525165 0.2380952 0.006405694 3.3215130 15
## [7420] {frozen_vegetables,
## pork} => {tropical_fruit} 0.001830198 0.2857143 0.006405694 2.7228682 18
## [7421] {frozen_vegetables,
## tropical_fruit} => {pork} 0.001830198 0.2093023 0.008744281 3.6304910 18
## [7422] {pork,
## tropical_fruit} => {frozen_vegetables} 0.001830198 0.2142857 0.008540925 4.4556025 18
## [7423] {frozen_vegetables,
## pork} => {root_vegetables} 0.001830198 0.2857143 0.006405694 2.6212687 18
## [7424] {frozen_vegetables,
## pork} => {yogurt} 0.001830198 0.2857143 0.006405694 2.0481050 18
## [7425] {frozen_vegetables,
## pork} => {rolls/buns} 0.001626843 0.2539683 0.006405694 1.3807506 16
## [7426] {frozen_vegetables,
## pork} => {other_vegetables} 0.002338587 0.3650794 0.006405694 1.8867869 23
## [7427] {frozen_vegetables,
## pork} => {whole_milk} 0.003152008 0.4920635 0.006405694 1.9257638 31
## [7428] {frankfurter,
## frozen_vegetables} => {fruit/vegetable_juice} 0.001220132 0.2400000 0.005083884 3.3198312 12
## [7429] {frankfurter,
## fruit/vegetable_juice} => {frozen_vegetables} 0.001220132 0.2307692 0.005287239 4.7983412 12
## [7430] {frankfurter,
## frozen_vegetables} => {whipped/sour_cream} 0.001525165 0.3000000 0.005083884 4.1851064 15
## [7431] {frankfurter,
## whipped/sour_cream} => {frozen_vegetables} 0.001525165 0.2459016 0.006202339 5.1129865 15
## [7432] {frankfurter,
## frozen_vegetables} => {pip_fruit} 0.001321810 0.2600000 0.005083884 3.4369624 13
## [7433] {frankfurter,
## frozen_vegetables} => {citrus_fruit} 0.001118454 0.2200000 0.005083884 2.6581081 11
## [7434] {frankfurter,
## frozen_vegetables} => {sausage} 0.001016777 0.2000000 0.005083884 2.1287879 10
## [7435] {frankfurter,
## frozen_vegetables} => {tropical_fruit} 0.001321810 0.2600000 0.005083884 2.4778101 13
## [7436] {frankfurter,
## frozen_vegetables} => {root_vegetables} 0.001830198 0.3600000 0.005083884 3.3027985 18
## [7437] {frankfurter,
## frozen_vegetables} => {soda} 0.001728521 0.3400000 0.005083884 1.9497959 17
## [7438] {frozen_vegetables,
## soda} => {frankfurter} 0.001728521 0.2000000 0.008642603 3.3913793 17
## [7439] {frankfurter,
## frozen_vegetables} => {yogurt} 0.001321810 0.2600000 0.005083884 1.8637755 13
## [7440] {frankfurter,
## frozen_vegetables} => {rolls/buns} 0.001118454 0.2200000 0.005083884 1.1960752 11
## [7441] {frankfurter,
## frozen_vegetables} => {other_vegetables} 0.001626843 0.3200000 0.005083884 1.6538098 16
## [7442] {frankfurter,
## frozen_vegetables} => {whole_milk} 0.002541942 0.5000000 0.005083884 1.9568245 25
## [7443] {bottled_beer,
## frozen_vegetables} => {root_vegetables} 0.001016777 0.2380952 0.004270463 2.1843905 10
## [7444] {bottled_beer,
## frozen_vegetables} => {yogurt} 0.001728521 0.4047619 0.004270463 2.9014820 17
## [7445] {bottled_beer,
## frozen_vegetables} => {rolls/buns} 0.001321810 0.3095238 0.004270463 1.6827898 13
## [7446] {bottled_beer,
## frozen_vegetables} => {other_vegetables} 0.001931876 0.4523810 0.004270463 2.3379751 19
## [7447] {bottled_beer,
## frozen_vegetables} => {whole_milk} 0.002236909 0.5238095 0.004270463 2.0500066 22
## [7448] {brown_bread,
## frozen_vegetables} => {fruit/vegetable_juice} 0.001118454 0.2894737 0.003863752 4.0041824 11
## [7449] {brown_bread,
## frozen_vegetables} => {pip_fruit} 0.001220132 0.3157895 0.003863752 4.1744482 12
## [7450] {brown_bread,
## frozen_vegetables} => {pastry} 0.001118454 0.2894737 0.003863752 3.2536842 11
## [7451] {frozen_vegetables,
## pastry} => {brown_bread} 0.001118454 0.2340426 0.004778851 3.6078503 11
## [7452] {brown_bread,
## frozen_vegetables} => {citrus_fruit} 0.001016777 0.2631579 0.003863752 3.1795552 10
## [7453] {brown_bread,
## frozen_vegetables} => {sausage} 0.001118454 0.2894737 0.003863752 3.0811404 11
## [7454] {brown_bread,
## frozen_vegetables} => {tropical_fruit} 0.001118454 0.2894737 0.003863752 2.7586954 11
## [7455] {brown_bread,
## frozen_vegetables} => {soda} 0.001321810 0.3421053 0.003863752 1.9618690 13
## [7456] {brown_bread,
## frozen_vegetables} => {yogurt} 0.001016777 0.2631579 0.003863752 1.8864125 10
## [7457] {brown_bread,
## frozen_vegetables} => {other_vegetables} 0.001728521 0.4473684 0.003863752 2.3120696 17
## [7458] {brown_bread,
## frozen_vegetables} => {whole_milk} 0.002236909 0.5789474 0.003863752 2.2657968 22
## [7459] {frozen_vegetables,
## margarine} => {whipped/sour_cream} 0.001423488 0.2800000 0.005083884 3.9060993 14
## [7460] {margarine,
## whipped/sour_cream} => {frozen_vegetables} 0.001423488 0.2089552 0.006812405 4.3447667 14
## [7461] {frozen_vegetables,
## margarine} => {pip_fruit} 0.001016777 0.2000000 0.005083884 2.6438172 10
## [7462] {frozen_vegetables,
## margarine} => {citrus_fruit} 0.001118454 0.2200000 0.005083884 2.6581081 11
## [7463] {frozen_vegetables,
## margarine} => {tropical_fruit} 0.001321810 0.2600000 0.005083884 2.4778101 13
## [7464] {frozen_vegetables,
## margarine} => {root_vegetables} 0.001423488 0.2800000 0.005083884 2.5688433 14
## [7465] {frozen_vegetables,
## margarine} => {soda} 0.001321810 0.2600000 0.005083884 1.4910204 13
## [7466] {frozen_vegetables,
## margarine} => {yogurt} 0.001931876 0.3800000 0.005083884 2.7239796 19
## [7467] {frozen_vegetables,
## margarine} => {rolls/buns} 0.001525165 0.3000000 0.005083884 1.6310116 15
## [7468] {frozen_vegetables,
## margarine} => {other_vegetables} 0.002338587 0.4600000 0.005083884 2.3773516 23
## [7469] {frozen_vegetables,
## margarine} => {whole_milk} 0.002745297 0.5400000 0.005083884 2.1133705 27
## [7470] {butter,
## frozen_vegetables} => {fruit/vegetable_juice} 0.001423488 0.2456140 0.005795628 3.3974881 14
## [7471] {butter,
## frozen_vegetables} => {whipped/sour_cream} 0.001525165 0.2631579 0.005795628 3.6711459 15
## [7472] {butter,
## frozen_vegetables} => {citrus_fruit} 0.001728521 0.2982456 0.005795628 3.6034958 17
## [7473] {citrus_fruit,
## frozen_vegetables} => {butter} 0.001728521 0.2615385 0.006609049 4.7196895 17
## [7474] {butter,
## frozen_vegetables} => {tropical_fruit} 0.001423488 0.2456140 0.005795628 2.3407113 14
## [7475] {butter,
## frozen_vegetables} => {root_vegetables} 0.001728521 0.2982456 0.005795628 2.7362366 17
## [7476] {butter,
## frozen_vegetables} => {soda} 0.001220132 0.2105263 0.005795628 1.2073040 12
## [7477] {butter,
## frozen_vegetables} => {yogurt} 0.002236909 0.3859649 0.005795628 2.7667383 22
## [7478] {butter,
## frozen_vegetables} => {rolls/buns} 0.001830198 0.3157895 0.005795628 1.7168543 18
## [7479] {butter,
## frozen_vegetables} => {other_vegetables} 0.002541942 0.4385965 0.005795628 2.2667349 25
## [7480] {butter,
## frozen_vegetables} => {whole_milk} 0.003152008 0.5438596 0.005795628 2.1284758 31
## [7481] {frozen_vegetables,
## newspapers} => {root_vegetables} 0.001220132 0.2666667 0.004575496 2.4465174 12
## [7482] {frozen_vegetables,
## newspapers} => {yogurt} 0.001423488 0.3111111 0.004575496 2.2301587 14
## [7483] {frozen_vegetables,
## newspapers} => {rolls/buns} 0.001525165 0.3333333 0.004575496 1.8122351 15
## [7484] {frozen_vegetables,
## newspapers} => {other_vegetables} 0.001423488 0.3111111 0.004575496 1.6078706 14
## [7485] {frozen_vegetables,
## newspapers} => {whole_milk} 0.001830198 0.4000000 0.004575496 1.5654596 18
## [7486] {domestic_eggs,
## frozen_vegetables} => {sausage} 0.001220132 0.2352941 0.005185562 2.5044563 12
## [7487] {frozen_vegetables,
## sausage} => {domestic_eggs} 0.001220132 0.2033898 0.005998983 3.2056714 12
## [7488] {domestic_eggs,
## frozen_vegetables} => {tropical_fruit} 0.001525165 0.2941176 0.005185562 2.8029526 15
## [7489] {domestic_eggs,
## frozen_vegetables} => {root_vegetables} 0.001626843 0.3137255 0.005185562 2.8782558 16
## [7490] {domestic_eggs,
## frozen_vegetables} => {soda} 0.001321810 0.2549020 0.005185562 1.4617847 13
## [7491] {domestic_eggs,
## frozen_vegetables} => {yogurt} 0.001626843 0.3137255 0.005185562 2.2488996 16
## [7492] {domestic_eggs,
## frozen_vegetables} => {rolls/buns} 0.001626843 0.3137255 0.005185562 1.7056331 16
## [7493] {domestic_eggs,
## frozen_vegetables} => {other_vegetables} 0.002033554 0.3921569 0.005185562 2.0267277 20
## [7494] {domestic_eggs,
## frozen_vegetables} => {whole_milk} 0.002440264 0.4705882 0.005185562 1.8417172 24
## [7495] {frozen_vegetables,
## fruit/vegetable_juice} => {whipped/sour_cream} 0.002135231 0.2727273 0.007829181 3.8046422 21
## [7496] {frozen_vegetables,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.002135231 0.2692308 0.007930859 3.7241696 21
## [7497] {fruit/vegetable_juice,
## whipped/sour_cream} => {frozen_vegetables} 0.002135231 0.2359551 0.009049314 4.9061691 21
## [7498] {frozen_vegetables,
## fruit/vegetable_juice} => {pip_fruit} 0.001931876 0.2467532 0.007829181 3.2618524 19
## [7499] {frozen_vegetables,
## pip_fruit} => {fruit/vegetable_juice} 0.001931876 0.2638889 0.007320793 3.6502774 19
## [7500] {fruit/vegetable_juice,
## pip_fruit} => {frozen_vegetables} 0.001931876 0.2021277 0.009557702 4.2028024 19
## [7501] {frozen_vegetables,
## pastry} => {fruit/vegetable_juice} 0.001321810 0.2765957 0.004778851 3.8260466 13
## [7502] {frozen_vegetables,
## fruit/vegetable_juice} => {citrus_fruit} 0.001931876 0.2467532 0.007829181 2.9813491 19
## [7503] {citrus_fruit,
## frozen_vegetables} => {fruit/vegetable_juice} 0.001931876 0.2923077 0.006609049 4.0433842 19
## [7504] {frozen_vegetables,
## shopping_bags} => {fruit/vegetable_juice} 0.001118454 0.2682927 0.004168785 3.7111934 11
## [7505] {frozen_vegetables,
## fruit/vegetable_juice} => {sausage} 0.001728521 0.2207792 0.007829181 2.3499606 17
## [7506] {frozen_vegetables,
## sausage} => {fruit/vegetable_juice} 0.001728521 0.2881356 0.005998983 3.9856731 17
## [7507] {frozen_vegetables,
## fruit/vegetable_juice} => {bottled_water} 0.001728521 0.2207792 0.007829181 1.9975746 17
## [7508] {bottled_water,
## frozen_vegetables} => {fruit/vegetable_juice} 0.001728521 0.2786885 0.006202339 3.8549953 17
## [7509] {frozen_vegetables,
## fruit/vegetable_juice} => {tropical_fruit} 0.001728521 0.2207792 0.007829181 2.1040345 17
## [7510] {frozen_vegetables,
## fruit/vegetable_juice} => {root_vegetables} 0.002643620 0.3376623 0.007829181 3.0978630 26
## [7511] {frozen_vegetables,
## root_vegetables} => {fruit/vegetable_juice} 0.002643620 0.2280702 0.011591256 3.1548104 26
## [7512] {fruit/vegetable_juice,
## root_vegetables} => {frozen_vegetables} 0.002643620 0.2203390 0.011997966 4.5814670 26
## [7513] {frozen_vegetables,
## fruit/vegetable_juice} => {soda} 0.002236909 0.2857143 0.007829181 1.6384840 22
## [7514] {frozen_vegetables,
## soda} => {fruit/vegetable_juice} 0.002236909 0.2588235 0.008642603 3.5802101 22
## [7515] {frozen_vegetables,
## fruit/vegetable_juice} => {yogurt} 0.003152008 0.4025974 0.007829181 2.8859661 31
## [7516] {frozen_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.003152008 0.2540984 0.012404677 3.5148486 31
## [7517] {frozen_vegetables,
## fruit/vegetable_juice} => {other_vegetables} 0.003762074 0.4805195 0.007829181 2.4833994 37
## [7518] {frozen_vegetables,
## other_vegetables} => {fruit/vegetable_juice} 0.003762074 0.2114286 0.017793594 2.9246132 37
## [7519] {frozen_vegetables,
## fruit/vegetable_juice} => {whole_milk} 0.004270463 0.5454545 0.007829181 2.1347177 42
## [7520] {frozen_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.004270463 0.2089552 0.020437214 2.8904003 42
## [7521] {frozen_vegetables,
## whipped/sour_cream} => {citrus_fruit} 0.001830198 0.2307692 0.007930859 2.7882253 18
## [7522] {citrus_fruit,
## frozen_vegetables} => {whipped/sour_cream} 0.001830198 0.2769231 0.006609049 3.8631751 18
## [7523] {frozen_vegetables,
## sausage} => {whipped/sour_cream} 0.001220132 0.2033898 0.005998983 2.8373603 12
## [7524] {frozen_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.002338587 0.2948718 0.007930859 2.8101396 23
## [7525] {frozen_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.002338587 0.2674419 0.008744281 3.7309088 23
## [7526] {frozen_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.002745297 0.3461538 0.007930859 3.1757678 27
## [7527] {frozen_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.002745297 0.2368421 0.011591256 3.3040314 27
## [7528] {frozen_vegetables,
## whipped/sour_cream} => {soda} 0.001626843 0.2051282 0.007930859 1.1763475 16
## [7529] {frozen_vegetables,
## whipped/sour_cream} => {yogurt} 0.003355363 0.4230769 0.007930859 3.0327708 33
## [7530] {frozen_vegetables,
## yogurt} => {whipped/sour_cream} 0.003355363 0.2704918 0.012404677 3.7734566 33
## [7531] {frozen_vegetables,
## whipped/sour_cream} => {rolls/buns} 0.001626843 0.2051282 0.007930859 1.1152216 16
## [7532] {frozen_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.003965430 0.5000000 0.007930859 2.5840778 39
## [7533] {frozen_vegetables,
## other_vegetables} => {whipped/sour_cream} 0.003965430 0.2228571 0.017793594 3.1089362 39
## [7534] {frozen_vegetables,
## whipped/sour_cream} => {whole_milk} 0.003863752 0.4871795 0.007930859 1.9066495 38
## [7535] {frozen_vegetables,
## pastry} => {pip_fruit} 0.001423488 0.2978723 0.004778851 3.9376001 14
## [7536] {frozen_vegetables,
## pip_fruit} => {citrus_fruit} 0.001626843 0.2222222 0.007320793 2.6849577 16
## [7537] {citrus_fruit,
## frozen_vegetables} => {pip_fruit} 0.001626843 0.2461538 0.006609049 3.2539289 16
## [7538] {frozen_vegetables,
## sausage} => {pip_fruit} 0.001321810 0.2203390 0.005998983 2.9126800 13
## [7539] {bottled_water,
## frozen_vegetables} => {pip_fruit} 0.001423488 0.2295082 0.006202339 3.0338886 14
## [7540] {frozen_vegetables,
## pip_fruit} => {tropical_fruit} 0.002135231 0.2916667 0.007320793 2.7795946 21
## [7541] {frozen_vegetables,
## tropical_fruit} => {pip_fruit} 0.002135231 0.2441860 0.008744281 3.2279164 21
## [7542] {frozen_vegetables,
## pip_fruit} => {root_vegetables} 0.002135231 0.2916667 0.007320793 2.6758784 21
## [7543] {frozen_vegetables,
## pip_fruit} => {soda} 0.001525165 0.2083333 0.007320793 1.1947279 15
## [7544] {frozen_vegetables,
## pip_fruit} => {yogurt} 0.002135231 0.2916667 0.007320793 2.0907738 21
## [7545] {frozen_vegetables,
## pip_fruit} => {other_vegetables} 0.003355363 0.4583333 0.007320793 2.3687380 33
## [7546] {frozen_vegetables,
## pip_fruit} => {whole_milk} 0.003762074 0.5138889 0.007320793 2.0111807 37
## [7547] {frozen_vegetables,
## pastry} => {citrus_fruit} 0.001016777 0.2127660 0.004778851 2.5707042 10
## [7548] {frozen_vegetables,
## pastry} => {sausage} 0.001118454 0.2340426 0.004778851 2.4911348 11
## [7549] {frozen_vegetables,
## pastry} => {tropical_fruit} 0.001220132 0.2553191 0.004778851 2.4332014 12
## [7550] {frozen_vegetables,
## pastry} => {root_vegetables} 0.001016777 0.2127660 0.004778851 1.9520086 10
## [7551] {frozen_vegetables,
## pastry} => {soda} 0.001321810 0.2765957 0.004778851 1.5861919 13
## [7552] {frozen_vegetables,
## pastry} => {yogurt} 0.001525165 0.3191489 0.004778851 2.2877768 15
## [7553] {frozen_vegetables,
## pastry} => {rolls/buns} 0.001016777 0.2127660 0.004778851 1.1567458 10
## [7554] {frozen_vegetables,
## pastry} => {other_vegetables} 0.002338587 0.4893617 0.004778851 2.5290974 23
## [7555] {frozen_vegetables,
## pastry} => {whole_milk} 0.002338587 0.4893617 0.004778851 1.9151899 23
## [7556] {citrus_fruit,
## frozen_vegetables} => {sausage} 0.001525165 0.2307692 0.006609049 2.4562937 15
## [7557] {frozen_vegetables,
## sausage} => {citrus_fruit} 0.001525165 0.2542373 0.005998983 3.0717736 15
## [7558] {citrus_fruit,
## frozen_vegetables} => {tropical_fruit} 0.001626843 0.2461538 0.006609049 2.3458557 16
## [7559] {citrus_fruit,
## frozen_vegetables} => {root_vegetables} 0.002643620 0.4000000 0.006609049 3.6697761 26
## [7560] {frozen_vegetables,
## root_vegetables} => {citrus_fruit} 0.002643620 0.2280702 0.011591256 2.7556145 26
## [7561] {citrus_fruit,
## frozen_vegetables} => {soda} 0.001525165 0.2307692 0.006609049 1.3233909 15
## [7562] {citrus_fruit,
## frozen_vegetables} => {yogurt} 0.002541942 0.3846154 0.006609049 2.7570644 25
## [7563] {frozen_vegetables,
## yogurt} => {citrus_fruit} 0.002541942 0.2049180 0.012404677 2.4758831 25
## [7564] {citrus_fruit,
## frozen_vegetables} => {rolls/buns} 0.001525165 0.2307692 0.006609049 1.2546243 15
## [7565] {citrus_fruit,
## frozen_vegetables} => {other_vegetables} 0.003253686 0.4923077 0.006609049 2.5443227 32
## [7566] {citrus_fruit,
## frozen_vegetables} => {whole_milk} 0.003558719 0.5384615 0.006609049 2.1073495 35
## [7567] {frozen_vegetables,
## shopping_bags} => {soda} 0.001118454 0.2682927 0.004168785 1.5385764 11
## [7568] {frozen_vegetables,
## shopping_bags} => {yogurt} 0.001016777 0.2439024 0.004168785 1.7483823 10
## [7569] {frozen_vegetables,
## shopping_bags} => {rolls/buns} 0.001118454 0.2682927 0.004168785 1.4586283 11
## [7570] {frozen_vegetables,
## shopping_bags} => {other_vegetables} 0.001728521 0.4146341 0.004168785 2.1428938 17
## [7571] {frozen_vegetables,
## shopping_bags} => {whole_milk} 0.001525165 0.3658537 0.004168785 1.4318228 15
## [7572] {frozen_vegetables,
## sausage} => {tropical_fruit} 0.001423488 0.2372881 0.005998983 2.2613651 14
## [7573] {frozen_vegetables,
## sausage} => {root_vegetables} 0.001931876 0.3220339 0.005998983 2.9544808 19
## [7574] {frozen_vegetables,
## sausage} => {soda} 0.001525165 0.2542373 0.005998983 1.4579730 15
## [7575] {frozen_vegetables,
## sausage} => {yogurt} 0.002033554 0.3389831 0.005998983 2.4299550 20
## [7576] {frozen_vegetables,
## sausage} => {rolls/buns} 0.002135231 0.3559322 0.005998983 1.9350985 21
## [7577] {frozen_vegetables,
## rolls/buns} => {sausage} 0.002135231 0.2100000 0.010167768 2.2352273 21
## [7578] {frozen_vegetables,
## sausage} => {other_vegetables} 0.002846975 0.4745763 0.005998983 2.4526840 28
## [7579] {frozen_vegetables,
## sausage} => {whole_milk} 0.002948653 0.4915254 0.005998983 1.9236580 29
## [7580] {bottled_water,
## frozen_vegetables} => {tropical_fruit} 0.002338587 0.3770492 0.006202339 3.5932933 23
## [7581] {frozen_vegetables,
## tropical_fruit} => {bottled_water} 0.002338587 0.2674419 0.008744281 2.4197707 23
## [7582] {bottled_water,
## frozen_vegetables} => {root_vegetables} 0.001931876 0.3114754 0.006202339 2.8576126 19
## [7583] {bottled_water,
## frozen_vegetables} => {soda} 0.001423488 0.2295082 0.006202339 1.3161593 14
## [7584] {bottled_water,
## frozen_vegetables} => {yogurt} 0.002338587 0.3770492 0.006202339 2.7028270 23
## [7585] {bottled_water,
## frozen_vegetables} => {other_vegetables} 0.002135231 0.3442623 0.006202339 1.7792011 21
## [7586] {bottled_water,
## frozen_vegetables} => {whole_milk} 0.003253686 0.5245902 0.006202339 2.0530618 32
## [7587] {frozen_vegetables,
## tropical_fruit} => {root_vegetables} 0.003050330 0.3488372 0.008744281 3.2003862 30
## [7588] {frozen_vegetables,
## root_vegetables} => {tropical_fruit} 0.003050330 0.2631579 0.011591256 2.5079049 30
## [7589] {frozen_vegetables,
## tropical_fruit} => {yogurt} 0.003355363 0.3837209 0.008744281 2.7506526 33
## [7590] {frozen_vegetables,
## yogurt} => {tropical_fruit} 0.003355363 0.2704918 0.012404677 2.5777974 33
## [7591] {frozen_vegetables,
## tropical_fruit} => {rolls/buns} 0.002338587 0.2674419 0.008744281 1.4540026 23
## [7592] {frozen_vegetables,
## rolls/buns} => {tropical_fruit} 0.002338587 0.2300000 0.010167768 2.1919089 23
## [7593] {frozen_vegetables,
## tropical_fruit} => {other_vegetables} 0.004168785 0.4767442 0.008744281 2.4638881 41
## [7594] {frozen_vegetables,
## other_vegetables} => {tropical_fruit} 0.004168785 0.2342857 0.017793594 2.2327519 41
## [7595] {frozen_vegetables,
## tropical_fruit} => {whole_milk} 0.004982206 0.5697674 0.008744281 2.2298698 49
## [7596] {frozen_vegetables,
## whole_milk} => {tropical_fruit} 0.004982206 0.2437811 0.020437214 2.3232433 49
## [7597] {frozen_vegetables,
## soda} => {root_vegetables} 0.001931876 0.2235294 0.008642603 2.0507572 19
## [7598] {frozen_vegetables,
## root_vegetables} => {yogurt} 0.002541942 0.2192982 0.011591256 1.5720104 25
## [7599] {frozen_vegetables,
## yogurt} => {root_vegetables} 0.002541942 0.2049180 0.012404677 1.8800083 25
## [7600] {frozen_vegetables,
## root_vegetables} => {rolls/buns} 0.002948653 0.2543860 0.011591256 1.3830215 29
## [7601] {frozen_vegetables,
## rolls/buns} => {root_vegetables} 0.002948653 0.2900000 0.010167768 2.6605877 29
## [7602] {frozen_vegetables,
## root_vegetables} => {other_vegetables} 0.006100661 0.5263158 0.011591256 2.7200819 60
## [7603] {frozen_vegetables,
## other_vegetables} => {root_vegetables} 0.006100661 0.3428571 0.017793594 3.1455224 60
## [7604] {frozen_vegetables,
## root_vegetables} => {whole_milk} 0.006202339 0.5350877 0.011591256 2.0941455 61
## [7605] {frozen_vegetables,
## whole_milk} => {root_vegetables} 0.006202339 0.3034826 0.020437214 2.7842829 61
## [7606] {frozen_vegetables,
## soda} => {yogurt} 0.002846975 0.3294118 0.008642603 2.3613445 28
## [7607] {frozen_vegetables,
## yogurt} => {soda} 0.002846975 0.2295082 0.012404677 1.3161593 28
## [7608] {frozen_vegetables,
## soda} => {rolls/buns} 0.001830198 0.2117647 0.008642603 1.1513023 18
## [7609] {frozen_vegetables,
## soda} => {other_vegetables} 0.003253686 0.3764706 0.008642603 1.9456586 32
## [7610] {frozen_vegetables,
## soda} => {whole_milk} 0.002948653 0.3411765 0.008642603 1.3352450 29
## [7611] {frozen_vegetables,
## yogurt} => {rolls/buns} 0.003457041 0.2786885 0.012404677 1.5151474 34
## [7612] {frozen_vegetables,
## rolls/buns} => {yogurt} 0.003457041 0.3400000 0.010167768 2.4372449 34
## [7613] {frozen_vegetables,
## yogurt} => {other_vegetables} 0.005287239 0.4262295 0.012404677 2.2028204 52
## [7614] {frozen_vegetables,
## other_vegetables} => {yogurt} 0.005287239 0.2971429 0.017793594 2.1300292 52
## [7615] {frozen_vegetables,
## yogurt} => {whole_milk} 0.006100661 0.4918033 0.012404677 1.9247454 60
## [7616] {frozen_vegetables,
## whole_milk} => {yogurt} 0.006100661 0.2985075 0.020437214 2.1398111 60
## [7617] {frozen_vegetables,
## rolls/buns} => {other_vegetables} 0.004270463 0.4200000 0.010167768 2.1706253 42
## [7618] {frozen_vegetables,
## other_vegetables} => {rolls/buns} 0.004270463 0.2400000 0.017793594 1.3048093 42
## [7619] {frozen_vegetables,
## rolls/buns} => {whole_milk} 0.005083884 0.5000000 0.010167768 1.9568245 50
## [7620] {frozen_vegetables,
## whole_milk} => {rolls/buns} 0.005083884 0.2487562 0.020437214 1.3524143 50
## [7621] {frozen_vegetables,
## other_vegetables} => {whole_milk} 0.009659380 0.5428571 0.017793594 2.1245523 95
## [7622] {frozen_vegetables,
## whole_milk} => {other_vegetables} 0.009659380 0.4726368 0.020437214 2.4426606 95
## [7623] {beef,
## curd} => {butter} 0.001220132 0.2608696 0.004677173 4.7076187 12
## [7624] {beef,
## butter} => {curd} 0.001220132 0.2105263 0.005795628 3.9513861 12
## [7625] {beef,
## curd} => {whipped/sour_cream} 0.001321810 0.2826087 0.004677173 3.9424915 13
## [7626] {beef,
## curd} => {tropical_fruit} 0.001118454 0.2391304 0.004677173 2.2789223 11
## [7627] {beef,
## curd} => {root_vegetables} 0.002135231 0.4565217 0.004677173 4.1883314 21
## [7628] {beef,
## curd} => {yogurt} 0.002135231 0.4565217 0.004677173 3.2725155 21
## [7629] {beef,
## curd} => {rolls/buns} 0.001423488 0.3043478 0.004677173 1.6546495 14
## [7630] {beef,
## curd} => {other_vegetables} 0.002135231 0.4565217 0.004677173 2.3593754 21
## [7631] {beef,
## curd} => {whole_milk} 0.002643620 0.5652174 0.004677173 2.2120625 26
## [7632] {beef,
## napkins} => {newspapers} 0.001118454 0.2750000 0.004067107 3.4453822 11
## [7633] {beef,
## napkins} => {citrus_fruit} 0.001016777 0.2500000 0.004067107 3.0205774 10
## [7634] {beef,
## napkins} => {root_vegetables} 0.001830198 0.4500000 0.004067107 4.1284981 18
## [7635] {beef,
## napkins} => {yogurt} 0.001118454 0.2750000 0.004067107 1.9713010 11
## [7636] {beef,
## napkins} => {rolls/buns} 0.001321810 0.3250000 0.004067107 1.7669292 13
## [7637] {beef,
## napkins} => {other_vegetables} 0.001830198 0.4500000 0.004067107 2.3256700 18
## [7638] {beef,
## napkins} => {whole_milk} 0.001830198 0.4500000 0.004067107 1.7611421 18
## [7639] {beef,
## butter} => {pork} 0.001321810 0.2280702 0.005795628 3.9560321 13
## [7640] {butter,
## pork} => {beef} 0.001321810 0.2407407 0.005490595 4.5885372 13
## [7641] {beef,
## newspapers} => {pork} 0.001321810 0.2063492 0.006405694 3.5792671 13
## [7642] {newspapers,
## pork} => {beef} 0.001321810 0.2000000 0.006609049 3.8120155 13
## [7643] {domestic_eggs,
## pork} => {beef} 0.001118454 0.2000000 0.005592272 3.8120155 11
## [7644] {beef,
## shopping_bags} => {pork} 0.001016777 0.2083333 0.004880529 3.6136831 10
## [7645] {beef,
## sausage} => {pork} 0.001423488 0.2545455 0.005592272 4.4152637 14
## [7646] {pork,
## sausage} => {beef} 0.001423488 0.2187500 0.006507372 4.1693920 14
## [7647] {beef,
## bottled_water} => {pork} 0.001321810 0.2131148 0.006202339 3.6966201 13
## [7648] {beef,
## pork} => {root_vegetables} 0.002745297 0.3600000 0.007625826 3.3027985 27
## [7649] {pork,
## root_vegetables} => {beef} 0.002745297 0.2014925 0.013624809 3.8404634 27
## [7650] {beef,
## pork} => {yogurt} 0.001830198 0.2400000 0.007625826 1.7204082 18
## [7651] {beef,
## pork} => {rolls/buns} 0.002236909 0.2933333 0.007625826 1.5947669 22
## [7652] {beef,
## pork} => {other_vegetables} 0.004168785 0.5466667 0.007625826 2.8252584 41
## [7653] {beef,
## other_vegetables} => {pork} 0.004168785 0.2113402 0.019725470 3.6658394 41
## [7654] {beef,
## pork} => {whole_milk} 0.003965430 0.5200000 0.007625826 2.0350975 39
## [7655] {beef,
## frankfurter} => {butter} 0.001016777 0.2127660 0.004778851 3.8395471 10
## [7656] {butter,
## frankfurter} => {beef} 0.001016777 0.2083333 0.004880529 3.9708495 10
## [7657] {beef,
## frankfurter} => {whipped/sour_cream} 0.001016777 0.2127660 0.004778851 2.9681606 10
## [7658] {beef,
## frankfurter} => {tropical_fruit} 0.001321810 0.2765957 0.004778851 2.6359682 13
## [7659] {beef,
## frankfurter} => {root_vegetables} 0.001626843 0.3404255 0.004778851 3.1232137 16
## [7660] {beef,
## frankfurter} => {soda} 0.001118454 0.2340426 0.004778851 1.3421624 11
## [7661] {beef,
## frankfurter} => {yogurt} 0.001830198 0.3829787 0.004778851 2.7453322 18
## [7662] {beef,
## frankfurter} => {rolls/buns} 0.001830198 0.3829787 0.004778851 2.0821425 18
## [7663] {beef,
## frankfurter} => {other_vegetables} 0.002541942 0.5319149 0.004778851 2.7490189 25
## [7664] {beef,
## frankfurter} => {whole_milk} 0.002948653 0.6170213 0.004778851 2.4148047 29
## [7665] {beef,
## bottled_beer} => {root_vegetables} 0.001830198 0.4500000 0.004067107 4.1284981 18
## [7666] {beef,
## bottled_beer} => {yogurt} 0.001016777 0.2500000 0.004067107 1.7920918 10
## [7667] {beef,
## bottled_beer} => {rolls/buns} 0.001525165 0.3750000 0.004067107 2.0387645 15
## [7668] {beef,
## bottled_beer} => {other_vegetables} 0.002135231 0.5250000 0.004067107 2.7132817 21
## [7669] {beef,
## bottled_beer} => {whole_milk} 0.002135231 0.5250000 0.004067107 2.0546657 21
## [7670] {beef,
## brown_bread} => {citrus_fruit} 0.001118454 0.2500000 0.004473818 3.0205774 11
## [7671] {beef,
## brown_bread} => {root_vegetables} 0.001830198 0.4090909 0.004473818 3.7531801 18
## [7672] {beef,
## brown_bread} => {soda} 0.001220132 0.2727273 0.004473818 1.5640074 12
## [7673] {beef,
## brown_bread} => {yogurt} 0.001321810 0.2954545 0.004473818 2.1179267 13
## [7674] {beef,
## brown_bread} => {rolls/buns} 0.001321810 0.2954545 0.004473818 1.6062993 13
## [7675] {beef,
## brown_bread} => {other_vegetables} 0.001931876 0.4318182 0.004473818 2.2317035 19
## [7676] {beef,
## brown_bread} => {whole_milk} 0.002643620 0.5909091 0.004473818 2.3126108 26
## [7677] {beef,
## pip_fruit} => {margarine} 0.001118454 0.2291667 0.004880529 3.9129413 11
## [7678] {beef,
## margarine} => {bottled_water} 0.001321810 0.2131148 0.006202339 1.9282278 13
## [7679] {beef,
## bottled_water} => {margarine} 0.001321810 0.2131148 0.006202339 3.6388604 13
## [7680] {beef,
## margarine} => {root_vegetables} 0.001830198 0.2950820 0.006202339 2.7072119 18
## [7681] {beef,
## margarine} => {yogurt} 0.001931876 0.3114754 0.006202339 2.2327702 19
## [7682] {beef,
## margarine} => {rolls/buns} 0.001830198 0.2950820 0.006202339 1.6042737 18
## [7683] {beef,
## margarine} => {other_vegetables} 0.002338587 0.3770492 0.006202339 1.9486488 23
## [7684] {beef,
## margarine} => {whole_milk} 0.002541942 0.4098361 0.006202339 1.6039545 25
## [7685] {beef,
## butter} => {domestic_eggs} 0.001525165 0.2631579 0.005795628 4.1476889 15
## [7686] {beef,
## domestic_eggs} => {butter} 0.001525165 0.2542373 0.005998983 4.5879334 15
## [7687] {beef,
## butter} => {whipped/sour_cream} 0.001321810 0.2280702 0.005795628 3.1816598 13
## [7688] {beef,
## butter} => {pastry} 0.001525165 0.2631579 0.005795628 2.9578947 15
## [7689] {beef,
## pastry} => {butter} 0.001525165 0.2419355 0.006304016 4.3659367 15
## [7690] {butter,
## pastry} => {beef} 0.001525165 0.2000000 0.007625826 3.8120155 15
## [7691] {beef,
## butter} => {sausage} 0.001423488 0.2456140 0.005795628 2.6143009 14
## [7692] {beef,
## sausage} => {butter} 0.001423488 0.2545455 0.005592272 4.5934946 14
## [7693] {beef,
## butter} => {bottled_water} 0.001220132 0.2105263 0.005795628 1.9048080 12
## [7694] {beef,
## butter} => {tropical_fruit} 0.001220132 0.2105263 0.005795628 2.0063239 12
## [7695] {beef,
## butter} => {root_vegetables} 0.002948653 0.5087719 0.005795628 4.6676977 29
## [7696] {butter,
## root_vegetables} => {beef} 0.002948653 0.2283465 0.012913066 4.3523012 29
## [7697] {beef,
## butter} => {yogurt} 0.002745297 0.4736842 0.005795628 3.3955424 27
## [7698] {beef,
## yogurt} => {butter} 0.002745297 0.2347826 0.011692933 4.2368568 27
## [7699] {beef,
## butter} => {rolls/buns} 0.002236909 0.3859649 0.005795628 2.0983775 22
## [7700] {beef,
## butter} => {other_vegetables} 0.002643620 0.4561404 0.005795628 2.3574043 26
## [7701] {beef,
## butter} => {whole_milk} 0.003660397 0.6315789 0.005795628 2.4717783 36
## [7702] {beef,
## newspapers} => {tropical_fruit} 0.001321810 0.2063492 0.006405694 1.9665159 13
## [7703] {beef,
## newspapers} => {root_vegetables} 0.002745297 0.4285714 0.006405694 3.9319030 27
## [7704] {newspapers,
## root_vegetables} => {beef} 0.002745297 0.2389381 0.011489578 4.5541778 27
## [7705] {beef,
## newspapers} => {yogurt} 0.001830198 0.2857143 0.006405694 2.0481050 18
## [7706] {beef,
## newspapers} => {rolls/buns} 0.002033554 0.3174603 0.006405694 1.7259382 20
## [7707] {beef,
## newspapers} => {other_vegetables} 0.003253686 0.5079365 0.006405694 2.6250949 32
## [7708] {beef,
## newspapers} => {whole_milk} 0.002541942 0.3968254 0.006405694 1.5530353 25
## [7709] {beef,
## fruit/vegetable_juice} => {domestic_eggs} 0.001016777 0.2000000 0.005083884 3.1522436 10
## [7710] {beef,
## domestic_eggs} => {pastry} 0.001321810 0.2203390 0.005998983 2.4766102 13
## [7711] {beef,
## pastry} => {domestic_eggs} 0.001321810 0.2096774 0.006304016 3.3047715 13
## [7712] {beef,
## domestic_eggs} => {citrus_fruit} 0.001423488 0.2372881 0.005998983 2.8669887 14
## [7713] {beef,
## shopping_bags} => {domestic_eggs} 0.001016777 0.2083333 0.004880529 3.2835871 10
## [7714] {beef,
## sausage} => {domestic_eggs} 0.001118454 0.2000000 0.005592272 3.1522436 11
## [7715] {beef,
## domestic_eggs} => {root_vegetables} 0.002338587 0.3898305 0.005998983 3.5764767 23
## [7716] {beef,
## domestic_eggs} => {soda} 0.001321810 0.2203390 0.005998983 1.2635766 13
## [7717] {beef,
## domestic_eggs} => {yogurt} 0.001423488 0.2372881 0.005998983 1.7009685 14
## [7718] {beef,
## domestic_eggs} => {rolls/buns} 0.001830198 0.3050847 0.005998983 1.6586559 18
## [7719] {beef,
## domestic_eggs} => {other_vegetables} 0.003355363 0.5593220 0.005998983 2.8906633 33
## [7720] {beef,
## domestic_eggs} => {whole_milk} 0.003762074 0.6271186 0.005998983 2.4543223 37
## [7721] {beef,
## fruit/vegetable_juice} => {whipped/sour_cream} 0.001525165 0.3000000 0.005083884 4.1851064 15
## [7722] {beef,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001525165 0.2272727 0.006710727 3.1437796 15
## [7723] {beef,
## fruit/vegetable_juice} => {pastry} 0.001118454 0.2200000 0.005083884 2.4728000 11
## [7724] {beef,
## fruit/vegetable_juice} => {citrus_fruit} 0.001525165 0.3000000 0.005083884 3.6246929 15
## [7725] {beef,
## fruit/vegetable_juice} => {tropical_fruit} 0.001016777 0.2000000 0.005083884 1.9060078 10
## [7726] {beef,
## fruit/vegetable_juice} => {root_vegetables} 0.002236909 0.4400000 0.005083884 4.0367537 22
## [7727] {beef,
## fruit/vegetable_juice} => {soda} 0.001525165 0.3000000 0.005083884 1.7204082 15
## [7728] {beef,
## fruit/vegetable_juice} => {yogurt} 0.001728521 0.3400000 0.005083884 2.4372449 17
## [7729] {beef,
## fruit/vegetable_juice} => {rolls/buns} 0.001525165 0.3000000 0.005083884 1.6310116 15
## [7730] {beef,
## fruit/vegetable_juice} => {other_vegetables} 0.002541942 0.5000000 0.005083884 2.5840778 25
## [7731] {beef,
## fruit/vegetable_juice} => {whole_milk} 0.002440264 0.4800000 0.005083884 1.8785515 24
## [7732] {beef,
## pip_fruit} => {whipped/sour_cream} 0.001016777 0.2083333 0.004880529 2.9063239 10
## [7733] {beef,
## whipped/sour_cream} => {tropical_fruit} 0.001626843 0.2424242 0.006710727 2.3103124 16
## [7734] {beef,
## tropical_fruit} => {whipped/sour_cream} 0.001626843 0.2133333 0.007625826 2.9760757 16
## [7735] {beef,
## whipped/sour_cream} => {root_vegetables} 0.002745297 0.4090909 0.006710727 3.7531801 27
## [7736] {beef,
## whipped/sour_cream} => {yogurt} 0.002541942 0.3787879 0.006710727 2.7152907 25
## [7737] {beef,
## yogurt} => {whipped/sour_cream} 0.002541942 0.2173913 0.011692933 3.0326858 25
## [7738] {beef,
## whipped/sour_cream} => {rolls/buns} 0.001728521 0.2575758 0.006710727 1.4003635 17
## [7739] {beef,
## whipped/sour_cream} => {other_vegetables} 0.003762074 0.5606061 0.006710727 2.8972993 37
## [7740] {beef,
## whipped/sour_cream} => {whole_milk} 0.003457041 0.5151515 0.006710727 2.0161222 34
## [7741] {beef,
## pip_fruit} => {pastry} 0.001016777 0.2083333 0.004880529 2.3416667 10
## [7742] {beef,
## pip_fruit} => {citrus_fruit} 0.001220132 0.2500000 0.004880529 3.0205774 12
## [7743] {beef,
## pip_fruit} => {tropical_fruit} 0.001525165 0.3125000 0.004880529 2.9781371 15
## [7744] {beef,
## tropical_fruit} => {pip_fruit} 0.001525165 0.2000000 0.007625826 2.6438172 15
## [7745] {beef,
## pip_fruit} => {root_vegetables} 0.002338587 0.4791667 0.004880529 4.3960860 23
## [7746] {beef,
## pip_fruit} => {yogurt} 0.001830198 0.3750000 0.004880529 2.6881378 18
## [7747] {beef,
## pip_fruit} => {rolls/buns} 0.001423488 0.2916667 0.004880529 1.5857057 14
## [7748] {beef,
## pip_fruit} => {other_vegetables} 0.002338587 0.4791667 0.004880529 2.4764079 23
## [7749] {beef,
## pip_fruit} => {whole_milk} 0.002948653 0.6041667 0.004880529 2.3644963 29
## [7750] {beef,
## pastry} => {root_vegetables} 0.002033554 0.3225806 0.006304016 2.9594969 20
## [7751] {beef,
## pastry} => {soda} 0.001728521 0.2741935 0.006304016 1.5724161 17
## [7752] {beef,
## soda} => {pastry} 0.001728521 0.2125000 0.008134215 2.3885000 17
## [7753] {beef,
## pastry} => {yogurt} 0.001830198 0.2903226 0.006304016 2.0811389 18
## [7754] {beef,
## pastry} => {rolls/buns} 0.002236909 0.3548387 0.006304016 1.9291535 22
## [7755] {beef,
## pastry} => {other_vegetables} 0.002948653 0.4677419 0.006304016 2.4173631 29
## [7756] {beef,
## pastry} => {whole_milk} 0.003762074 0.5967742 0.006304016 2.3355647 37
## [7757] {beef,
## shopping_bags} => {citrus_fruit} 0.001118454 0.2291667 0.004880529 2.7688626 11
## [7758] {beef,
## sausage} => {citrus_fruit} 0.001423488 0.2545455 0.005592272 3.0754970 14
## [7759] {beef,
## citrus_fruit} => {tropical_fruit} 0.002033554 0.2409639 0.008439248 2.2963949 20
## [7760] {beef,
## tropical_fruit} => {citrus_fruit} 0.002033554 0.2666667 0.007625826 3.2219492 20
## [7761] {beef,
## citrus_fruit} => {root_vegetables} 0.003863752 0.4578313 0.008439248 4.2003462 38
## [7762] {beef,
## root_vegetables} => {citrus_fruit} 0.003863752 0.2222222 0.017386884 2.6849577 38
## [7763] {citrus_fruit,
## root_vegetables} => {beef} 0.003863752 0.2183908 0.017691917 4.1625457 38
## [7764] {beef,
## citrus_fruit} => {yogurt} 0.001931876 0.2289157 0.008439248 1.6409516 19
## [7765] {beef,
## citrus_fruit} => {rolls/buns} 0.002643620 0.3132530 0.008439248 1.7030643 26
## [7766] {beef,
## citrus_fruit} => {other_vegetables} 0.003355363 0.3975904 0.008439248 2.0548088 33
## [7767] {beef,
## citrus_fruit} => {whole_milk} 0.003965430 0.4698795 0.008439248 1.8389435 39
## [7768] {beef,
## shopping_bags} => {root_vegetables} 0.001931876 0.3958333 0.004880529 3.6315493 19
## [7769] {beef,
## shopping_bags} => {rolls/buns} 0.001321810 0.2708333 0.004880529 1.4724410 13
## [7770] {beef,
## shopping_bags} => {other_vegetables} 0.002440264 0.5000000 0.004880529 2.5840778 24
## [7771] {beef,
## shopping_bags} => {whole_milk} 0.001423488 0.2916667 0.004880529 1.1414810 14
## [7772] {beef,
## sausage} => {tropical_fruit} 0.001626843 0.2909091 0.005592272 2.7723749 16
## [7773] {beef,
## tropical_fruit} => {sausage} 0.001626843 0.2133333 0.007625826 2.2707071 16
## [7774] {beef,
## sausage} => {root_vegetables} 0.002948653 0.5272727 0.005592272 4.8374322 29
## [7775] {beef,
## sausage} => {soda} 0.001220132 0.2181818 0.005592272 1.2512059 12
## [7776] {beef,
## sausage} => {yogurt} 0.001931876 0.3454545 0.005592272 2.4763451 19
## [7777] {beef,
## sausage} => {rolls/buns} 0.001931876 0.3454545 0.005592272 1.8781346 19
## [7778] {beef,
## sausage} => {other_vegetables} 0.002846975 0.5090909 0.005592272 2.6310610 28
## [7779] {beef,
## sausage} => {whole_milk} 0.003050330 0.5454545 0.005592272 2.1347177 30
## [7780] {beef,
## bottled_water} => {tropical_fruit} 0.001728521 0.2786885 0.006202339 2.6559124 17
## [7781] {beef,
## tropical_fruit} => {bottled_water} 0.001728521 0.2266667 0.007625826 2.0508433 17
## [7782] {beef,
## bottled_water} => {root_vegetables} 0.002440264 0.3934426 0.006202339 3.6096159 24
## [7783] {beef,
## bottled_water} => {soda} 0.001423488 0.2295082 0.006202339 1.3161593 14
## [7784] {beef,
## bottled_water} => {yogurt} 0.001830198 0.2950820 0.006202339 2.1152559 18
## [7785] {beef,
## bottled_water} => {rolls/buns} 0.001626843 0.2622951 0.006202339 1.4260211 16
## [7786] {beef,
## bottled_water} => {other_vegetables} 0.002338587 0.3770492 0.006202339 1.9486488 23
## [7787] {beef,
## bottled_water} => {whole_milk} 0.002846975 0.4590164 0.006202339 1.7964291 28
## [7788] {beef,
## tropical_fruit} => {root_vegetables} 0.003762074 0.4933333 0.007625826 4.5260572 37
## [7789] {beef,
## root_vegetables} => {tropical_fruit} 0.003762074 0.2163743 0.017386884 2.0620552 37
## [7790] {beef,
## tropical_fruit} => {soda} 0.001525165 0.2000000 0.007625826 1.1469388 15
## [7791] {beef,
## tropical_fruit} => {yogurt} 0.002948653 0.3866667 0.007625826 2.7717687 29
## [7792] {beef,
## yogurt} => {tropical_fruit} 0.002948653 0.2521739 0.011692933 2.4032272 29
## [7793] {beef,
## tropical_fruit} => {rolls/buns} 0.002745297 0.3600000 0.007625826 1.9572139 27
## [7794] {beef,
## rolls/buns} => {tropical_fruit} 0.002745297 0.2014925 0.013624809 1.9202317 27
## [7795] {beef,
## tropical_fruit} => {other_vegetables} 0.004473818 0.5866667 0.007625826 3.0319846 44
## [7796] {beef,
## other_vegetables} => {tropical_fruit} 0.004473818 0.2268041 0.019725470 2.1614521 44
## [7797] {beef,
## tropical_fruit} => {whole_milk} 0.004575496 0.6000000 0.007625826 2.3481894 45
## [7798] {beef,
## whole_milk} => {tropical_fruit} 0.004575496 0.2153110 0.021250635 2.0519222 45
## [7799] {beef,
## root_vegetables} => {soda} 0.003965430 0.2280702 0.017386884 1.3079126 39
## [7800] {beef,
## soda} => {root_vegetables} 0.003965430 0.4875000 0.008134215 4.4725396 39
## [7801] {root_vegetables,
## soda} => {beef} 0.003965430 0.2131148 0.018607016 4.0619837 39
## [7802] {beef,
## root_vegetables} => {yogurt} 0.004575496 0.2631579 0.017386884 1.8864125 45
## [7803] {beef,
## yogurt} => {root_vegetables} 0.004575496 0.3913043 0.011692933 3.5899984 45
## [7804] {beef,
## root_vegetables} => {rolls/buns} 0.004982206 0.2865497 0.017386884 1.5578863 49
## [7805] {beef,
## rolls/buns} => {root_vegetables} 0.004982206 0.3656716 0.013624809 3.3548326 49
## [7806] {rolls/buns,
## root_vegetables} => {beef} 0.004982206 0.2050209 0.024300966 3.9077146 49
## [7807] {beef,
## root_vegetables} => {other_vegetables} 0.007930859 0.4561404 0.017386884 2.3574043 78
## [7808] {beef,
## other_vegetables} => {root_vegetables} 0.007930859 0.4020619 0.019725470 3.6886925 78
## [7809] {beef,
## root_vegetables} => {whole_milk} 0.008032537 0.4619883 0.017386884 1.8080601 79
## [7810] {beef,
## whole_milk} => {root_vegetables} 0.008032537 0.3779904 0.021250635 3.4678506 79
## [7811] {beef,
## soda} => {yogurt} 0.001830198 0.2250000 0.008134215 1.6128827 18
## [7812] {beef,
## soda} => {rolls/buns} 0.002135231 0.2625000 0.008134215 1.4271352 21
## [7813] {beef,
## soda} => {other_vegetables} 0.003558719 0.4375000 0.008134215 2.2610681 35
## [7814] {beef,
## soda} => {whole_milk} 0.003457041 0.4250000 0.008134215 1.6633008 34
## [7815] {beef,
## yogurt} => {rolls/buns} 0.003762074 0.3217391 0.011692933 1.7492009 37
## [7816] {beef,
## rolls/buns} => {yogurt} 0.003762074 0.2761194 0.013624809 1.9793253 37
## [7817] {beef,
## yogurt} => {other_vegetables} 0.005185562 0.4434783 0.011692933 2.2919646 51
## [7818] {beef,
## other_vegetables} => {yogurt} 0.005185562 0.2628866 0.019725470 1.8844677 51
## [7819] {beef,
## yogurt} => {whole_milk} 0.006100661 0.5217391 0.011692933 2.0419038 60
## [7820] {beef,
## whole_milk} => {yogurt} 0.006100661 0.2870813 0.021250635 2.0579045 60
## [7821] {beef,
## rolls/buns} => {other_vegetables} 0.005795628 0.4253731 0.013624809 2.1983945 57
## [7822] {beef,
## other_vegetables} => {rolls/buns} 0.005795628 0.2938144 0.019725470 1.5973825 57
## [7823] {beef,
## rolls/buns} => {whole_milk} 0.006812405 0.5000000 0.013624809 1.9568245 67
## [7824] {beef,
## whole_milk} => {rolls/buns} 0.006812405 0.3205742 0.021250635 1.7428673 67
## [7825] {beef,
## other_vegetables} => {whole_milk} 0.009252669 0.4690722 0.019725470 1.8357838 91
## [7826] {beef,
## whole_milk} => {other_vegetables} 0.009252669 0.4354067 0.021250635 2.2502495 91
## [7827] {curd,
## napkins} => {whipped/sour_cream} 0.001118454 0.2340426 0.004778851 3.2649766 11
## [7828] {curd,
## napkins} => {pip_fruit} 0.001118454 0.2340426 0.004778851 3.0938286 11
## [7829] {curd,
## napkins} => {pastry} 0.001220132 0.2553191 0.004778851 2.8697872 12
## [7830] {curd,
## napkins} => {soda} 0.001118454 0.2340426 0.004778851 1.3421624 11
## [7831] {curd,
## napkins} => {yogurt} 0.001931876 0.4042553 0.004778851 2.8978506 19
## [7832] {curd,
## napkins} => {other_vegetables} 0.001728521 0.3617021 0.004778851 1.8693329 17
## [7833] {curd,
## napkins} => {whole_milk} 0.002643620 0.5531915 0.004778851 2.1649973 26
## [7834] {curd,
## pork} => {whipped/sour_cream} 0.001525165 0.3571429 0.004270463 4.9822695 15
## [7835] {curd,
## pork} => {sausage} 0.001016777 0.2380952 0.004270463 2.5342713 10
## [7836] {curd,
## pork} => {tropical_fruit} 0.001016777 0.2380952 0.004270463 2.2690568 10
## [7837] {curd,
## pork} => {root_vegetables} 0.001525165 0.3571429 0.004270463 3.2765858 15
## [7838] {curd,
## pork} => {soda} 0.001220132 0.2857143 0.004270463 1.6384840 12
## [7839] {curd,
## pork} => {yogurt} 0.001423488 0.3333333 0.004270463 2.3894558 14
## [7840] {curd,
## pork} => {other_vegetables} 0.001728521 0.4047619 0.004270463 2.0918725 17
## [7841] {curd,
## pork} => {whole_milk} 0.002541942 0.5952381 0.004270463 2.3295530 25
## [7842] {curd,
## frankfurter} => {butter} 0.001016777 0.2325581 0.004372140 4.1967143 10
## [7843] {butter,
## frankfurter} => {curd} 0.001016777 0.2083333 0.004880529 3.9102258 10
## [7844] {curd,
## frankfurter} => {domestic_eggs} 0.001220132 0.2790698 0.004372140 4.3984794 12
## [7845] {curd,
## frankfurter} => {tropical_fruit} 0.001016777 0.2325581 0.004372140 2.2162881 10
## [7846] {curd,
## frankfurter} => {root_vegetables} 0.001525165 0.3488372 0.004372140 3.2003862 15
## [7847] {curd,
## frankfurter} => {yogurt} 0.001321810 0.3023256 0.004372140 2.1671808 13
## [7848] {curd,
## frankfurter} => {rolls/buns} 0.001016777 0.2325581 0.004372140 1.2643501 10
## [7849] {curd,
## frankfurter} => {other_vegetables} 0.002033554 0.4651163 0.004372140 2.4037933 20
## [7850] {curd,
## frankfurter} => {whole_milk} 0.002236909 0.5116279 0.004372140 2.0023321 22
## [7851] {bottled_beer,
## curd} => {pip_fruit} 0.001016777 0.2631579 0.003863752 3.4787068 10
## [7852] {bottled_beer,
## curd} => {yogurt} 0.001118454 0.2894737 0.003863752 2.0750537 11
## [7853] {bottled_beer,
## curd} => {other_vegetables} 0.001423488 0.3684211 0.003863752 1.9040573 14
## [7854] {bottled_beer,
## curd} => {whole_milk} 0.002033554 0.5263158 0.003863752 2.0598153 20
## [7855] {brown_bread,
## curd} => {butter} 0.001016777 0.2083333 0.004880529 3.7595566 10
## [7856] {brown_bread,
## curd} => {fruit/vegetable_juice} 0.001220132 0.2500000 0.004880529 3.4581575 12
## [7857] {curd,
## fruit/vegetable_juice} => {brown_bread} 0.001220132 0.2500000 0.004880529 3.8538401 12
## [7858] {brown_bread,
## curd} => {citrus_fruit} 0.001016777 0.2083333 0.004880529 2.5171478 10
## [7859] {brown_bread,
## curd} => {sausage} 0.001220132 0.2500000 0.004880529 2.6609848 12
## [7860] {brown_bread,
## curd} => {tropical_fruit} 0.001321810 0.2708333 0.004880529 2.5810522 13
## [7861] {brown_bread,
## curd} => {yogurt} 0.002338587 0.4791667 0.004880529 3.4348427 23
## [7862] {brown_bread,
## curd} => {rolls/buns} 0.001016777 0.2083333 0.004880529 1.1326470 10
## [7863] {brown_bread,
## curd} => {other_vegetables} 0.002338587 0.4791667 0.004880529 2.4764079 23
## [7864] {brown_bread,
## curd} => {whole_milk} 0.002338587 0.4791667 0.004880529 1.8752902 23
## [7865] {curd,
## margarine} => {butter} 0.001321810 0.2096774 0.006304016 3.7838118 13
## [7866] {curd,
## margarine} => {domestic_eggs} 0.001423488 0.2258065 0.006304016 3.5589847 14
## [7867] {curd,
## domestic_eggs} => {margarine} 0.001423488 0.2187500 0.006507372 3.7350803 14
## [7868] {curd,
## margarine} => {whipped/sour_cream} 0.001321810 0.2096774 0.006304016 2.9250744 13
## [7869] {curd,
## margarine} => {pip_fruit} 0.001830198 0.2903226 0.006304016 3.8377992 18
## [7870] {curd,
## pip_fruit} => {margarine} 0.001830198 0.2337662 0.007829181 3.9914773 18
## [7871] {margarine,
## pip_fruit} => {curd} 0.001830198 0.2142857 0.008540925 4.0219466 18
## [7872] {curd,
## margarine} => {tropical_fruit} 0.001830198 0.2903226 0.006304016 2.7667854 18
## [7873] {curd,
## margarine} => {root_vegetables} 0.001830198 0.2903226 0.006304016 2.6635472 18
## [7874] {curd,
## margarine} => {yogurt} 0.002745297 0.4354839 0.006304016 3.1217084 27
## [7875] {curd,
## margarine} => {rolls/buns} 0.001626843 0.2580645 0.006304016 1.4030207 16
## [7876] {curd,
## margarine} => {other_vegetables} 0.002745297 0.4354839 0.006304016 2.2506484 27
## [7877] {curd,
## margarine} => {whole_milk} 0.003457041 0.5483871 0.006304016 2.1461946 34
## [7878] {butter,
## curd} => {whipped/sour_cream} 0.002135231 0.3134328 0.006812405 4.3724992 21
## [7879] {curd,
## whipped/sour_cream} => {butter} 0.002135231 0.2038835 0.010472801 3.6792554 21
## [7880] {butter,
## whipped/sour_cream} => {curd} 0.002135231 0.2100000 0.010167768 3.9415076 21
## [7881] {butter,
## curd} => {pip_fruit} 0.001525165 0.2238806 0.006812405 2.9594969 15
## [7882] {butter,
## pip_fruit} => {curd} 0.001525165 0.2083333 0.007320793 3.9102258 15
## [7883] {butter,
## curd} => {pastry} 0.001626843 0.2388060 0.006812405 2.6841791 16
## [7884] {curd,
## pastry} => {butter} 0.001626843 0.2162162 0.007524148 3.9018101 16
## [7885] {butter,
## pastry} => {curd} 0.001626843 0.2133333 0.007625826 4.0040712 16
## [7886] {butter,
## curd} => {sausage} 0.001423488 0.2089552 0.006812405 2.2241067 14
## [7887] {butter,
## curd} => {tropical_fruit} 0.001931876 0.2835821 0.006812405 2.7025483 19
## [7888] {butter,
## curd} => {root_vegetables} 0.002033554 0.2985075 0.006812405 2.7386389 20
## [7889] {butter,
## curd} => {yogurt} 0.002948653 0.4328358 0.006812405 3.1027262 29
## [7890] {butter,
## yogurt} => {curd} 0.002948653 0.2013889 0.014641586 3.7798850 29
## [7891] {butter,
## curd} => {rolls/buns} 0.001728521 0.2537313 0.006812405 1.3794626 17
## [7892] {butter,
## curd} => {other_vegetables} 0.003050330 0.4477612 0.006812405 2.3140995 30
## [7893] {butter,
## curd} => {whole_milk} 0.004880529 0.7164179 0.006812405 2.8038083 48
## [7894] {curd,
## newspapers} => {whipped/sour_cream} 0.001321810 0.2321429 0.005693950 3.2384752 13
## [7895] {curd,
## newspapers} => {root_vegetables} 0.001525165 0.2678571 0.005693950 2.4574394 15
## [7896] {curd,
## newspapers} => {yogurt} 0.001830198 0.3214286 0.005693950 2.3041181 18
## [7897] {curd,
## newspapers} => {rolls/buns} 0.001220132 0.2142857 0.005693950 1.1650083 12
## [7898] {curd,
## newspapers} => {other_vegetables} 0.001931876 0.3392857 0.005693950 1.7534813 19
## [7899] {curd,
## newspapers} => {whole_milk} 0.002846975 0.5000000 0.005693950 1.9568245 28
## [7900] {curd,
## domestic_eggs} => {whipped/sour_cream} 0.001830198 0.2812500 0.006507372 3.9235372 18
## [7901] {curd,
## domestic_eggs} => {citrus_fruit} 0.001321810 0.2031250 0.006507372 2.4542191 13
## [7902] {curd,
## domestic_eggs} => {tropical_fruit} 0.002236909 0.3437500 0.006507372 3.2759508 22
## [7903] {curd,
## tropical_fruit} => {domestic_eggs} 0.002236909 0.2178218 0.010269446 3.4331366 22
## [7904] {curd,
## domestic_eggs} => {root_vegetables} 0.002338587 0.3593750 0.006507372 3.2970645 23
## [7905] {curd,
## root_vegetables} => {domestic_eggs} 0.002338587 0.2149533 0.010879512 3.3879254 23
## [7906] {curd,
## domestic_eggs} => {yogurt} 0.002745297 0.4218750 0.006507372 3.0241550 27
## [7907] {curd,
## domestic_eggs} => {rolls/buns} 0.001321810 0.2031250 0.006507372 1.1043308 13
## [7908] {curd,
## domestic_eggs} => {other_vegetables} 0.003457041 0.5312500 0.006507372 2.7455826 34
## [7909] {curd,
## other_vegetables} => {domestic_eggs} 0.003457041 0.2011834 0.017183528 3.1708959 34
## [7910] {curd,
## domestic_eggs} => {whole_milk} 0.004778851 0.7343750 0.006507372 2.8740860 47
## [7911] {curd,
## fruit/vegetable_juice} => {whipped/sour_cream} 0.001220132 0.2500000 0.004880529 3.4875887 12
## [7912] {curd,
## fruit/vegetable_juice} => {pip_fruit} 0.001220132 0.2500000 0.004880529 3.3047715 12
## [7913] {curd,
## fruit/vegetable_juice} => {pastry} 0.001220132 0.2500000 0.004880529 2.8100000 12
## [7914] {curd,
## fruit/vegetable_juice} => {citrus_fruit} 0.001423488 0.2916667 0.004880529 3.5240070 14
## [7915] {citrus_fruit,
## curd} => {fruit/vegetable_juice} 0.001423488 0.2000000 0.007117438 2.7665260 14
## [7916] {curd,
## fruit/vegetable_juice} => {sausage} 0.001118454 0.2291667 0.004880529 2.4392361 11
## [7917] {curd,
## fruit/vegetable_juice} => {tropical_fruit} 0.001626843 0.3333333 0.004880529 3.1766796 16
## [7918] {curd,
## fruit/vegetable_juice} => {root_vegetables} 0.001728521 0.3541667 0.004880529 3.2492809 17
## [7919] {curd,
## fruit/vegetable_juice} => {soda} 0.001423488 0.2916667 0.004880529 1.6726190 14
## [7920] {curd,
## fruit/vegetable_juice} => {yogurt} 0.002033554 0.4166667 0.004880529 2.9868197 20
## [7921] {curd,
## fruit/vegetable_juice} => {other_vegetables} 0.002338587 0.4791667 0.004880529 2.4764079 23
## [7922] {curd,
## fruit/vegetable_juice} => {whole_milk} 0.002440264 0.5000000 0.004880529 1.9568245 24
## [7923] {curd,
## whipped/sour_cream} => {pip_fruit} 0.002236909 0.2135922 0.010472801 2.8234941 22
## [7924] {curd,
## pip_fruit} => {whipped/sour_cream} 0.002236909 0.2857143 0.007829181 3.9858156 22
## [7925] {pip_fruit,
## whipped/sour_cream} => {curd} 0.002236909 0.2417582 0.009252669 4.5375807 22
## [7926] {curd,
## pastry} => {whipped/sour_cream} 0.001525165 0.2027027 0.007524148 2.8277746 15
## [7927] {pastry,
## whipped/sour_cream} => {curd} 0.001525165 0.2027027 0.007524148 3.8045440 15
## [7928] {citrus_fruit,
## curd} => {whipped/sour_cream} 0.001931876 0.2714286 0.007117438 3.7865248 19
## [7929] {curd,
## sausage} => {whipped/sour_cream} 0.001931876 0.2533333 0.007625826 3.5340898 19
## [7930] {sausage,
## whipped/sour_cream} => {curd} 0.001931876 0.2134831 0.009049314 4.0068831 19
## [7931] {curd,
## whipped/sour_cream} => {tropical_fruit} 0.002846975 0.2718447 0.010472801 2.5906901 28
## [7932] {curd,
## tropical_fruit} => {whipped/sour_cream} 0.002846975 0.2772277 0.010269446 3.8674250 28
## [7933] {tropical_fruit,
## whipped/sour_cream} => {curd} 0.002846975 0.2058824 0.013828165 3.8642232 28
## [7934] {curd,
## whipped/sour_cream} => {root_vegetables} 0.002541942 0.2427184 0.010472801 2.2268059 25
## [7935] {curd,
## root_vegetables} => {whipped/sour_cream} 0.002541942 0.2336449 0.010879512 3.2594286 25
## [7936] {curd,
## whipped/sour_cream} => {yogurt} 0.004575496 0.4368932 0.010472801 3.1318110 45
## [7937] {curd,
## yogurt} => {whipped/sour_cream} 0.004575496 0.2647059 0.017285206 3.6927409 45
## [7938] {whipped/sour_cream,
## yogurt} => {curd} 0.004575496 0.2205882 0.020742247 4.1402391 45
## [7939] {curd,
## whipped/sour_cream} => {rolls/buns} 0.002440264 0.2330097 0.010472801 1.2668051 24
## [7940] {curd,
## rolls/buns} => {whipped/sour_cream} 0.002440264 0.2424242 0.010066090 3.3819041 24
## [7941] {curd,
## whipped/sour_cream} => {other_vegetables} 0.004372140 0.4174757 0.010472801 2.1575795 43
## [7942] {curd,
## other_vegetables} => {whipped/sour_cream} 0.004372140 0.2544379 0.017183528 3.5494985 43
## [7943] {curd,
## whipped/sour_cream} => {whole_milk} 0.005897306 0.5631068 0.010472801 2.2038024 58
## [7944] {curd,
## whole_milk} => {whipped/sour_cream} 0.005897306 0.2256809 0.026131164 3.1483291 58
## [7945] {curd,
## pastry} => {pip_fruit} 0.001525165 0.2027027 0.007524148 2.6795445 15
## [7946] {curd,
## pip_fruit} => {sausage} 0.001830198 0.2337662 0.007829181 2.4881936 18
## [7947] {curd,
## sausage} => {pip_fruit} 0.001830198 0.2400000 0.007625826 3.1725806 18
## [7948] {curd,
## pip_fruit} => {tropical_fruit} 0.002745297 0.3506494 0.007829181 3.3417019 27
## [7949] {curd,
## tropical_fruit} => {pip_fruit} 0.002745297 0.2673267 0.010269446 3.5338151 27
## [7950] {curd,
## pip_fruit} => {root_vegetables} 0.002236909 0.2857143 0.007829181 2.6212687 22
## [7951] {curd,
## root_vegetables} => {pip_fruit} 0.002236909 0.2056075 0.010879512 2.7179429 22
## [7952] {curd,
## pip_fruit} => {yogurt} 0.003863752 0.4935065 0.007829181 3.5376358 38
## [7953] {curd,
## yogurt} => {pip_fruit} 0.003863752 0.2235294 0.017285206 2.9548545 38
## [7954] {pip_fruit,
## yogurt} => {curd} 0.003863752 0.2146893 0.017996950 4.0295209 38
## [7955] {curd,
## pip_fruit} => {other_vegetables} 0.003355363 0.4285714 0.007829181 2.2149238 33
## [7956] {curd,
## pip_fruit} => {whole_milk} 0.004880529 0.6233766 0.007829181 2.4396773 48
## [7957] {curd,
## pastry} => {tropical_fruit} 0.001728521 0.2297297 0.007524148 2.1893332 17
## [7958] {curd,
## pastry} => {root_vegetables} 0.001525165 0.2027027 0.007524148 1.8596838 15
## [7959] {curd,
## pastry} => {yogurt} 0.003253686 0.4324324 0.007524148 3.0998345 32
## [7960] {curd,
## pastry} => {rolls/buns} 0.002033554 0.2702703 0.007524148 1.4693798 20
## [7961] {curd,
## rolls/buns} => {pastry} 0.002033554 0.2020202 0.010066090 2.2707071 20
## [7962] {curd,
## pastry} => {other_vegetables} 0.003253686 0.4324324 0.007524148 2.2348781 32
## [7963] {curd,
## pastry} => {whole_milk} 0.004473818 0.5945946 0.007524148 2.3270346 44
## [7964] {citrus_fruit,
## curd} => {sausage} 0.001626843 0.2285714 0.007117438 2.4329004 16
## [7965] {curd,
## sausage} => {citrus_fruit} 0.001626843 0.2133333 0.007625826 2.5775594 16
## [7966] {bottled_water,
## curd} => {citrus_fruit} 0.001321810 0.2166667 0.006100661 2.6178337 13
## [7967] {citrus_fruit,
## curd} => {tropical_fruit} 0.002338587 0.3285714 0.007117438 3.1312984 23
## [7968] {curd,
## tropical_fruit} => {citrus_fruit} 0.002338587 0.2277228 0.010269446 2.7514170 23
## [7969] {citrus_fruit,
## curd} => {root_vegetables} 0.002135231 0.3000000 0.007117438 2.7523321 21
## [7970] {citrus_fruit,
## curd} => {yogurt} 0.003050330 0.4285714 0.007117438 3.0721574 30
## [7971] {citrus_fruit,
## curd} => {rolls/buns} 0.001626843 0.2285714 0.007117438 1.2426755 16
## [7972] {citrus_fruit,
## curd} => {other_vegetables} 0.003152008 0.4428571 0.007117438 2.2887546 31
## [7973] {citrus_fruit,
## curd} => {whole_milk} 0.003660397 0.5142857 0.007117438 2.0127338 36
## [7974] {curd,
## shopping_bags} => {sausage} 0.001220132 0.2264151 0.005388917 2.4099485 12
## [7975] {curd,
## shopping_bags} => {soda} 0.001423488 0.2641509 0.005388917 1.5148248 14
## [7976] {curd,
## shopping_bags} => {yogurt} 0.001728521 0.3207547 0.005388917 2.2992876 17
## [7977] {curd,
## shopping_bags} => {other_vegetables} 0.001525165 0.2830189 0.005388917 1.4626855 15
## [7978] {curd,
## shopping_bags} => {whole_milk} 0.002033554 0.3773585 0.005388917 1.4768487 20
## [7979] {curd,
## sausage} => {tropical_fruit} 0.002135231 0.2800000 0.007625826 2.6684109 21
## [7980] {curd,
## tropical_fruit} => {sausage} 0.002135231 0.2079208 0.010269446 2.2130963 21
## [7981] {curd,
## sausage} => {root_vegetables} 0.002135231 0.2800000 0.007625826 2.5688433 21
## [7982] {curd,
## sausage} => {soda} 0.001830198 0.2400000 0.007625826 1.3763265 18
## [7983] {curd,
## soda} => {sausage} 0.001830198 0.2250000 0.008134215 2.3948864 18
## [7984] {curd,
## sausage} => {yogurt} 0.003558719 0.4666667 0.007625826 3.3452381 35
## [7985] {curd,
## yogurt} => {sausage} 0.003558719 0.2058824 0.017285206 2.1913993 35
## [7986] {curd,
## sausage} => {rolls/buns} 0.001626843 0.2133333 0.007625826 1.1598305 16
## [7987] {curd,
## sausage} => {other_vegetables} 0.003355363 0.4400000 0.007625826 2.2739884 33
## [7988] {curd,
## sausage} => {whole_milk} 0.003457041 0.4533333 0.007625826 1.7741876 34
## [7989] {bottled_water,
## curd} => {tropical_fruit} 0.002135231 0.3500000 0.006100661 3.3355136 21
## [7990] {curd,
## tropical_fruit} => {bottled_water} 0.002135231 0.2079208 0.010269446 1.8812337 21
## [7991] {bottled_water,
## curd} => {root_vegetables} 0.001220132 0.2000000 0.006100661 1.8348881 12
## [7992] {bottled_water,
## curd} => {yogurt} 0.002643620 0.4333333 0.006100661 3.1062925 26
## [7993] {bottled_water,
## curd} => {rolls/buns} 0.001525165 0.2500000 0.006100661 1.3591763 15
## [7994] {bottled_water,
## curd} => {other_vegetables} 0.002135231 0.3500000 0.006100661 1.8088544 21
## [7995] {bottled_water,
## curd} => {whole_milk} 0.003253686 0.5333333 0.006100661 2.0872795 32
## [7996] {curd,
## tropical_fruit} => {root_vegetables} 0.003152008 0.3069307 0.010269446 2.8159173 31
## [7997] {curd,
## root_vegetables} => {tropical_fruit} 0.003152008 0.2897196 0.010879512 2.7610393 31
## [7998] {curd,
## tropical_fruit} => {yogurt} 0.005287239 0.5148515 0.010269446 3.6906446 52
## [7999] {curd,
## yogurt} => {tropical_fruit} 0.005287239 0.3058824 0.017285206 2.9150707 52
## [8000] {curd,
## tropical_fruit} => {rolls/buns} 0.002236909 0.2178218 0.010269446 1.1842329 22
## [8001] {curd,
## rolls/buns} => {tropical_fruit} 0.002236909 0.2222222 0.010066090 2.1177864 22
## [8002] {curd,
## tropical_fruit} => {other_vegetables} 0.005287239 0.5148515 0.010269446 2.6608326 52
## [8003] {curd,
## other_vegetables} => {tropical_fruit} 0.005287239 0.3076923 0.017183528 2.9323196 52
## [8004] {curd,
## tropical_fruit} => {whole_milk} 0.006507372 0.6336634 0.010269446 2.4799360 64
## [8005] {curd,
## whole_milk} => {tropical_fruit} 0.006507372 0.2490272 0.026131164 2.3732392 64
## [8006] {curd,
## soda} => {root_vegetables} 0.001626843 0.2000000 0.008134215 1.8348881 16
## [8007] {curd,
## root_vegetables} => {yogurt} 0.004677173 0.4299065 0.010879512 3.0817280 46
## [8008] {curd,
## yogurt} => {root_vegetables} 0.004677173 0.2705882 0.017285206 2.4824956 46
## [8009] {curd,
## rolls/buns} => {root_vegetables} 0.002033554 0.2020202 0.010066090 1.8534223 20
## [8010] {curd,
## root_vegetables} => {other_vegetables} 0.005490595 0.5046729 0.010879512 2.6082280 54
## [8011] {curd,
## other_vegetables} => {root_vegetables} 0.005490595 0.3195266 0.017183528 2.9314780 54
## [8012] {curd,
## root_vegetables} => {whole_milk} 0.006202339 0.5700935 0.010879512 2.2311457 61
## [8013] {curd,
## whole_milk} => {root_vegetables} 0.006202339 0.2373541 0.026131164 2.1775909 61
## [8014] {curd,
## soda} => {yogurt} 0.001626843 0.2000000 0.008134215 1.4336735 16
## [8015] {curd,
## soda} => {rolls/buns} 0.001626843 0.2000000 0.008134215 1.0873411 16
## [8016] {curd,
## soda} => {other_vegetables} 0.002033554 0.2500000 0.008134215 1.2920389 20
## [8017] {curd,
## soda} => {whole_milk} 0.003558719 0.4375000 0.008134215 1.7122214 35
## [8018] {curd,
## yogurt} => {rolls/buns} 0.003457041 0.2000000 0.017285206 1.0873411 34
## [8019] {curd,
## rolls/buns} => {yogurt} 0.003457041 0.3434343 0.010066090 2.4618635 34
## [8020] {curd,
## yogurt} => {other_vegetables} 0.006100661 0.3529412 0.017285206 1.8240549 60
## [8021] {curd,
## other_vegetables} => {yogurt} 0.006100661 0.3550296 0.017183528 2.5449825 60
## [8022] {curd,
## yogurt} => {whole_milk} 0.010066090 0.5823529 0.017285206 2.2791250 99
## [8023] {curd,
## whole_milk} => {yogurt} 0.010066090 0.3852140 0.026131164 2.7613555 99
## [8024] {curd,
## rolls/buns} => {other_vegetables} 0.003660397 0.3636364 0.010066090 1.8793293 36
## [8025] {curd,
## other_vegetables} => {rolls/buns} 0.003660397 0.2130178 0.017183528 1.1581148 36
## [8026] {curd,
## rolls/buns} => {whole_milk} 0.005897306 0.5858586 0.010066090 2.2928449 58
## [8027] {curd,
## whole_milk} => {rolls/buns} 0.005897306 0.2256809 0.026131164 1.2269607 58
## [8028] {curd,
## other_vegetables} => {whole_milk} 0.009862735 0.5739645 0.017183528 2.2462956 97
## [8029] {curd,
## whole_milk} => {other_vegetables} 0.009862735 0.3774319 0.026131164 1.9506268 97
## [8030] {margarine,
## napkins} => {pork} 0.001016777 0.2272727 0.004473818 3.9421998 10
## [8031] {napkins,
## pork} => {root_vegetables} 0.001525165 0.2941176 0.005185562 2.6983648 15
## [8032] {napkins,
## pork} => {soda} 0.001728521 0.3333333 0.005185562 1.9115646 17
## [8033] {napkins,
## pork} => {rolls/buns} 0.001626843 0.3137255 0.005185562 1.7056331 16
## [8034] {napkins,
## pork} => {other_vegetables} 0.001931876 0.3725490 0.005185562 1.9253913 19
## [8035] {napkins,
## pork} => {whole_milk} 0.002643620 0.5098039 0.005185562 1.9951936 26
## [8036] {frankfurter,
## napkins} => {whipped/sour_cream} 0.001016777 0.2564103 0.003965430 3.5770140 10
## [8037] {frankfurter,
## napkins} => {rolls/buns} 0.001423488 0.3589744 0.003965430 1.9516378 14
## [8038] {frankfurter,
## napkins} => {whole_milk} 0.001626843 0.4102564 0.003965430 1.6055996 16
## [8039] {bottled_beer,
## napkins} => {bottled_water} 0.001321810 0.2549020 0.005185562 2.3063117 13
## [8040] {bottled_beer,
## napkins} => {tropical_fruit} 0.001220132 0.2352941 0.005185562 2.2423621 12
## [8041] {bottled_beer,
## napkins} => {soda} 0.001525165 0.2941176 0.005185562 1.6866747 15
## [8042] {bottled_beer,
## napkins} => {yogurt} 0.001118454 0.2156863 0.005185562 1.5461184 11
## [8043] {bottled_beer,
## napkins} => {rolls/buns} 0.001525165 0.2941176 0.005185562 1.5990310 15
## [8044] {bottled_beer,
## napkins} => {other_vegetables} 0.001626843 0.3137255 0.005185562 1.6213821 16
## [8045] {bottled_beer,
## napkins} => {whole_milk} 0.002643620 0.5098039 0.005185562 1.9951936 26
## [8046] {brown_bread,
## napkins} => {pastry} 0.001423488 0.2978723 0.004778851 3.3480851 14
## [8047] {napkins,
## pastry} => {brown_bread} 0.001423488 0.2028986 0.007015760 3.1277543 14
## [8048] {brown_bread,
## napkins} => {citrus_fruit} 0.001220132 0.2553191 0.004778851 3.0848450 12
## [8049] {brown_bread,
## napkins} => {sausage} 0.001016777 0.2127660 0.004778851 2.2646680 10
## [8050] {brown_bread,
## napkins} => {root_vegetables} 0.001220132 0.2553191 0.004778851 2.3424103 12
## [8051] {brown_bread,
## napkins} => {soda} 0.001118454 0.2340426 0.004778851 1.3421624 11
## [8052] {brown_bread,
## napkins} => {yogurt} 0.001728521 0.3617021 0.004778851 2.5928137 17
## [8053] {brown_bread,
## napkins} => {rolls/buns} 0.001118454 0.2340426 0.004778851 1.2724204 11
## [8054] {brown_bread,
## napkins} => {other_vegetables} 0.001525165 0.3191489 0.004778851 1.6494113 15
## [8055] {brown_bread,
## napkins} => {whole_milk} 0.002135231 0.4468085 0.004778851 1.7486517 21
## [8056] {margarine,
## napkins} => {pip_fruit} 0.001220132 0.2727273 0.004473818 3.6052053 12
## [8057] {margarine,
## napkins} => {bottled_water} 0.001016777 0.2272727 0.004473818 2.0563268 10
## [8058] {margarine,
## napkins} => {tropical_fruit} 0.001525165 0.3409091 0.004473818 3.2488768 15
## [8059] {margarine,
## napkins} => {soda} 0.001118454 0.2500000 0.004473818 1.4336735 11
## [8060] {margarine,
## napkins} => {yogurt} 0.001830198 0.4090909 0.004473818 2.9325139 18
## [8061] {margarine,
## napkins} => {other_vegetables} 0.001118454 0.2500000 0.004473818 1.2920389 11
## [8062] {margarine,
## napkins} => {whole_milk} 0.002236909 0.5000000 0.004473818 1.9568245 22
## [8063] {butter,
## napkins} => {domestic_eggs} 0.001016777 0.2040816 0.004982206 3.2165751 10
## [8064] {butter,
## napkins} => {fruit/vegetable_juice} 0.001118454 0.2244898 0.004982206 3.1052843 11
## [8065] {butter,
## napkins} => {whipped/sour_cream} 0.001728521 0.3469388 0.004982206 4.8399189 17
## [8066] {napkins,
## whipped/sour_cream} => {butter} 0.001728521 0.2394366 0.007219115 4.3208425 17
## [8067] {butter,
## napkins} => {pip_fruit} 0.001118454 0.2244898 0.004982206 2.9675499 11
## [8068] {butter,
## napkins} => {citrus_fruit} 0.001118454 0.2244898 0.004982206 2.7123552 11
## [8069] {butter,
## napkins} => {bottled_water} 0.001321810 0.2653061 0.004982206 2.4004468 13
## [8070] {butter,
## napkins} => {tropical_fruit} 0.001525165 0.3061224 0.004982206 2.9173588 15
## [8071] {butter,
## napkins} => {root_vegetables} 0.002033554 0.4081633 0.004982206 3.7446695 20
## [8072] {napkins,
## root_vegetables} => {butter} 0.002033554 0.2040816 0.009964413 3.6828309 20
## [8073] {butter,
## napkins} => {yogurt} 0.001321810 0.2653061 0.004982206 1.9018117 13
## [8074] {butter,
## napkins} => {rolls/buns} 0.001118454 0.2244898 0.004982206 1.2204849 11
## [8075] {butter,
## napkins} => {other_vegetables} 0.002440264 0.4897959 0.004982206 2.5313415 24
## [8076] {butter,
## napkins} => {whole_milk} 0.003152008 0.6326531 0.004982206 2.4759820 31
## [8077] {napkins,
## newspapers} => {root_vegetables} 0.001830198 0.2950820 0.006202339 2.7072119 18
## [8078] {napkins,
## newspapers} => {soda} 0.001728521 0.2786885 0.006202339 1.5981934 17
## [8079] {napkins,
## newspapers} => {yogurt} 0.002033554 0.3278689 0.006202339 2.3502844 20
## [8080] {napkins,
## newspapers} => {rolls/buns} 0.002033554 0.3278689 0.006202339 1.7825263 20
## [8081] {napkins,
## newspapers} => {other_vegetables} 0.002033554 0.3278689 0.006202339 1.6944772 20
## [8082] {napkins,
## newspapers} => {whole_milk} 0.002338587 0.3770492 0.006202339 1.4756382 23
## [8083] {domestic_eggs,
## napkins} => {whipped/sour_cream} 0.001728521 0.2881356 0.005998983 4.0195937 17
## [8084] {napkins,
## whipped/sour_cream} => {domestic_eggs} 0.001728521 0.2394366 0.007219115 3.7738127 17
## [8085] {domestic_eggs,
## napkins} => {shopping_bags} 0.001423488 0.2372881 0.005998983 2.4083889 14
## [8086] {domestic_eggs,
## napkins} => {tropical_fruit} 0.001626843 0.2711864 0.005998983 2.5844173 16
## [8087] {domestic_eggs,
## napkins} => {root_vegetables} 0.001423488 0.2372881 0.005998983 2.1769858 14
## [8088] {domestic_eggs,
## napkins} => {soda} 0.001220132 0.2033898 0.005998983 1.1663784 12
## [8089] {domestic_eggs,
## napkins} => {yogurt} 0.001830198 0.3050847 0.005998983 2.1869595 18
## [8090] {domestic_eggs,
## napkins} => {rolls/buns} 0.001830198 0.3050847 0.005998983 1.6586559 18
## [8091] {domestic_eggs,
## napkins} => {other_vegetables} 0.002236909 0.3728814 0.005998983 1.9271088 22
## [8092] {domestic_eggs,
## napkins} => {whole_milk} 0.003355363 0.5593220 0.005998983 2.1889901 33
## [8093] {fruit/vegetable_juice,
## napkins} => {whipped/sour_cream} 0.001423488 0.2058824 0.006914082 2.8721318 14
## [8094] {fruit/vegetable_juice,
## napkins} => {citrus_fruit} 0.001830198 0.2647059 0.006914082 3.1982584 18
## [8095] {citrus_fruit,
## napkins} => {fruit/vegetable_juice} 0.001830198 0.2400000 0.007625826 3.3198312 18
## [8096] {fruit/vegetable_juice,
## napkins} => {sausage} 0.001525165 0.2205882 0.006914082 2.3479278 15
## [8097] {napkins,
## sausage} => {fruit/vegetable_juice} 0.001525165 0.2272727 0.006710727 3.1437796 15
## [8098] {fruit/vegetable_juice,
## napkins} => {tropical_fruit} 0.002033554 0.2941176 0.006914082 2.8029526 20
## [8099] {napkins,
## tropical_fruit} => {fruit/vegetable_juice} 0.002033554 0.2020202 0.010066090 2.7944707 20
## [8100] {fruit/vegetable_juice,
## napkins} => {root_vegetables} 0.002236909 0.3235294 0.006914082 2.9682013 22
## [8101] {napkins,
## root_vegetables} => {fruit/vegetable_juice} 0.002236909 0.2244898 0.009964413 3.1052843 22
## [8102] {fruit/vegetable_juice,
## napkins} => {soda} 0.002440264 0.3529412 0.006914082 2.0240096 24
## [8103] {napkins,
## soda} => {fruit/vegetable_juice} 0.002440264 0.2033898 0.011997966 2.8134163 24
## [8104] {fruit/vegetable_juice,
## napkins} => {yogurt} 0.002643620 0.3823529 0.006914082 2.7408463 26
## [8105] {napkins,
## yogurt} => {fruit/vegetable_juice} 0.002643620 0.2148760 0.012302999 2.9723007 26
## [8106] {fruit/vegetable_juice,
## napkins} => {other_vegetables} 0.002236909 0.3235294 0.006914082 1.6720503 22
## [8107] {fruit/vegetable_juice,
## napkins} => {whole_milk} 0.003253686 0.4705882 0.006914082 1.8417172 32
## [8108] {napkins,
## whipped/sour_cream} => {citrus_fruit} 0.001525165 0.2112676 0.007219115 2.5526006 15
## [8109] {citrus_fruit,
## napkins} => {whipped/sour_cream} 0.001525165 0.2000000 0.007625826 2.7900709 15
## [8110] {napkins,
## whipped/sour_cream} => {tropical_fruit} 0.001626843 0.2253521 0.007219115 2.1476144 16
## [8111] {napkins,
## whipped/sour_cream} => {root_vegetables} 0.002541942 0.3521127 0.007219115 3.2304367 25
## [8112] {napkins,
## root_vegetables} => {whipped/sour_cream} 0.002541942 0.2551020 0.009964413 3.5587639 25
## [8113] {napkins,
## whipped/sour_cream} => {yogurt} 0.002541942 0.3521127 0.007219115 2.5240730 25
## [8114] {napkins,
## yogurt} => {whipped/sour_cream} 0.002541942 0.2066116 0.012302999 2.8823047 25
## [8115] {napkins,
## whipped/sour_cream} => {rolls/buns} 0.001626843 0.2253521 0.007219115 1.2251730 16
## [8116] {napkins,
## whipped/sour_cream} => {other_vegetables} 0.003355363 0.4647887 0.007219115 2.4021005 33
## [8117] {napkins,
## other_vegetables} => {whipped/sour_cream} 0.003355363 0.2323944 0.014438231 3.2419838 33
## [8118] {napkins,
## whipped/sour_cream} => {whole_milk} 0.003965430 0.5492958 0.007219115 2.1497509 39
## [8119] {napkins,
## whole_milk} => {whipped/sour_cream} 0.003965430 0.2010309 0.019725470 2.8044527 39
## [8120] {napkins,
## pip_fruit} => {pastry} 0.001423488 0.2121212 0.006710727 2.3842424 14
## [8121] {napkins,
## pastry} => {pip_fruit} 0.001423488 0.2028986 0.007015760 2.6821334 14
## [8122] {napkins,
## pip_fruit} => {citrus_fruit} 0.001626843 0.2424242 0.006710727 2.9290447 16
## [8123] {citrus_fruit,
## napkins} => {pip_fruit} 0.001626843 0.2133333 0.007625826 2.8200717 16
## [8124] {napkins,
## pip_fruit} => {bottled_water} 0.001423488 0.2121212 0.006710727 1.9192384 14
## [8125] {napkins,
## pip_fruit} => {tropical_fruit} 0.002745297 0.4090909 0.006710727 3.8986522 27
## [8126] {napkins,
## tropical_fruit} => {pip_fruit} 0.002745297 0.2727273 0.010066090 3.6052053 27
## [8127] {napkins,
## pip_fruit} => {root_vegetables} 0.001423488 0.2121212 0.006710727 1.9460934 14
## [8128] {napkins,
## pip_fruit} => {soda} 0.001525165 0.2272727 0.006710727 1.3033395 15
## [8129] {napkins,
## pip_fruit} => {yogurt} 0.002033554 0.3030303 0.006710727 2.1722325 20
## [8130] {napkins,
## pip_fruit} => {rolls/buns} 0.001525165 0.2272727 0.006710727 1.2356149 15
## [8131] {napkins,
## pip_fruit} => {other_vegetables} 0.002643620 0.3939394 0.006710727 2.0359401 26
## [8132] {napkins,
## pip_fruit} => {whole_milk} 0.003253686 0.4848485 0.006710727 1.8975268 32
## [8133] {napkins,
## pastry} => {citrus_fruit} 0.001525165 0.2173913 0.007015760 2.6265890 15
## [8134] {citrus_fruit,
## napkins} => {pastry} 0.001525165 0.2000000 0.007625826 2.2480000 15
## [8135] {napkins,
## pastry} => {sausage} 0.001423488 0.2028986 0.007015760 2.1596399 14
## [8136] {napkins,
## sausage} => {pastry} 0.001423488 0.2121212 0.006710727 2.3842424 14
## [8137] {napkins,
## pastry} => {tropical_fruit} 0.001626843 0.2318841 0.007015760 2.2098641 16
## [8138] {napkins,
## pastry} => {root_vegetables} 0.001728521 0.2463768 0.007015760 2.2603693 17
## [8139] {napkins,
## pastry} => {soda} 0.002440264 0.3478261 0.007015760 1.9946761 24
## [8140] {napkins,
## soda} => {pastry} 0.002440264 0.2033898 0.011997966 2.2861017 24
## [8141] {napkins,
## pastry} => {yogurt} 0.002236909 0.3188406 0.007015760 2.2855664 22
## [8142] {napkins,
## pastry} => {rolls/buns} 0.002135231 0.3043478 0.007015760 1.6546495 21
## [8143] {napkins,
## pastry} => {other_vegetables} 0.002846975 0.4057971 0.007015760 2.0972225 28
## [8144] {napkins,
## pastry} => {whole_milk} 0.002948653 0.4202899 0.007015760 1.6448670 29
## [8145] {citrus_fruit,
## napkins} => {bottled_water} 0.001830198 0.2400000 0.007625826 2.1714811 18
## [8146] {bottled_water,
## napkins} => {citrus_fruit} 0.001830198 0.2117647 0.008642603 2.5586067 18
## [8147] {citrus_fruit,
## napkins} => {tropical_fruit} 0.002846975 0.3733333 0.007625826 3.5578811 28
## [8148] {napkins,
## tropical_fruit} => {citrus_fruit} 0.002846975 0.2828283 0.010066090 3.4172189 28
## [8149] {citrus_fruit,
## napkins} => {root_vegetables} 0.002338587 0.3066667 0.007625826 2.8134950 23
## [8150] {napkins,
## root_vegetables} => {citrus_fruit} 0.002338587 0.2346939 0.009964413 2.8356441 23
## [8151] {citrus_fruit,
## napkins} => {soda} 0.001728521 0.2266667 0.007625826 1.2998639 17
## [8152] {citrus_fruit,
## napkins} => {yogurt} 0.002643620 0.3466667 0.007625826 2.4850340 26
## [8153] {napkins,
## yogurt} => {citrus_fruit} 0.002643620 0.2148760 0.012302999 2.5961988 26
## [8154] {citrus_fruit,
## napkins} => {rolls/buns} 0.001525165 0.2000000 0.007625826 1.0873411 15
## [8155] {citrus_fruit,
## napkins} => {other_vegetables} 0.002643620 0.3466667 0.007625826 1.7916273 26
## [8156] {citrus_fruit,
## napkins} => {whole_milk} 0.003355363 0.4400000 0.007625826 1.7220056 33
## [8157] {napkins,
## sausage} => {shopping_bags} 0.001423488 0.2121212 0.006710727 2.1529537 14
## [8158] {napkins,
## shopping_bags} => {tropical_fruit} 0.002338587 0.3239437 0.007219115 3.0871957 23
## [8159] {napkins,
## tropical_fruit} => {shopping_bags} 0.002338587 0.2323232 0.010066090 2.3579969 23
## [8160] {napkins,
## shopping_bags} => {soda} 0.002033554 0.2816901 0.007219115 1.6154067 20
## [8161] {napkins,
## shopping_bags} => {yogurt} 0.001728521 0.2394366 0.007219115 1.7163696 17
## [8162] {napkins,
## shopping_bags} => {other_vegetables} 0.001525165 0.2112676 0.007219115 1.0918638 15
## [8163] {napkins,
## shopping_bags} => {whole_milk} 0.003558719 0.4929577 0.007219115 1.9292636 35
## [8164] {napkins,
## sausage} => {tropical_fruit} 0.001626843 0.2424242 0.006710727 2.3103124 16
## [8165] {napkins,
## sausage} => {root_vegetables} 0.001728521 0.2575758 0.006710727 2.3631134 17
## [8166] {napkins,
## sausage} => {soda} 0.002440264 0.3636364 0.006710727 2.0853432 24
## [8167] {napkins,
## soda} => {sausage} 0.002440264 0.2033898 0.011997966 2.1648690 24
## [8168] {napkins,
## sausage} => {yogurt} 0.001830198 0.2727273 0.006710727 1.9550093 18
## [8169] {napkins,
## sausage} => {rolls/buns} 0.001931876 0.2878788 0.006710727 1.5651121 19
## [8170] {napkins,
## sausage} => {other_vegetables} 0.002236909 0.3333333 0.006710727 1.7227185 22
## [8171] {napkins,
## sausage} => {whole_milk} 0.002745297 0.4090909 0.006710727 1.6010382 27
## [8172] {bottled_water,
## napkins} => {tropical_fruit} 0.002643620 0.3058824 0.008642603 2.9150707 26
## [8173] {napkins,
## tropical_fruit} => {bottled_water} 0.002643620 0.2626263 0.010066090 2.3761999 26
## [8174] {bottled_water,
## napkins} => {root_vegetables} 0.002135231 0.2470588 0.008642603 2.2666264 21
## [8175] {napkins,
## root_vegetables} => {bottled_water} 0.002135231 0.2142857 0.009964413 1.9388224 21
## [8176] {bottled_water,
## napkins} => {soda} 0.002541942 0.2941176 0.008642603 1.6866747 25
## [8177] {napkins,
## soda} => {bottled_water} 0.002541942 0.2118644 0.011997966 1.9169148 25
## [8178] {bottled_water,
## napkins} => {yogurt} 0.002135231 0.2470588 0.008642603 1.7710084 21
## [8179] {bottled_water,
## napkins} => {rolls/buns} 0.001830198 0.2117647 0.008642603 1.1513023 18
## [8180] {bottled_water,
## napkins} => {other_vegetables} 0.002745297 0.3176471 0.008642603 1.6416494 27
## [8181] {bottled_water,
## napkins} => {whole_milk} 0.003965430 0.4588235 0.008642603 1.7956743 39
## [8182] {napkins,
## whole_milk} => {bottled_water} 0.003965430 0.2010309 0.019725470 1.8188953 39
## [8183] {napkins,
## tropical_fruit} => {root_vegetables} 0.002643620 0.2626263 0.010066090 2.4094490 26
## [8184] {napkins,
## root_vegetables} => {tropical_fruit} 0.002643620 0.2653061 0.009964413 2.5283776 26
## [8185] {napkins,
## tropical_fruit} => {soda} 0.003050330 0.3030303 0.010066090 1.7377860 30
## [8186] {napkins,
## soda} => {tropical_fruit} 0.003050330 0.2542373 0.011997966 2.4228912 30
## [8187] {napkins,
## tropical_fruit} => {yogurt} 0.003152008 0.3131313 0.010066090 2.2446403 31
## [8188] {napkins,
## yogurt} => {tropical_fruit} 0.003152008 0.2561983 0.012302999 2.4415802 31
## [8189] {napkins,
## tropical_fruit} => {rolls/buns} 0.003050330 0.3030303 0.010066090 1.6474865 30
## [8190] {napkins,
## rolls/buns} => {tropical_fruit} 0.003050330 0.2608696 0.011692933 2.4860971 30
## [8191] {napkins,
## tropical_fruit} => {other_vegetables} 0.003965430 0.3939394 0.010066090 2.0359401 39
## [8192] {napkins,
## other_vegetables} => {tropical_fruit} 0.003965430 0.2746479 0.014438231 2.6174050 39
## [8193] {napkins,
## tropical_fruit} => {whole_milk} 0.004982206 0.4949495 0.010066090 1.9370586 49
## [8194] {napkins,
## whole_milk} => {tropical_fruit} 0.004982206 0.2525773 0.019725470 2.4070716 49
## [8195] {napkins,
## root_vegetables} => {soda} 0.002541942 0.2551020 0.009964413 1.4629321 25
## [8196] {napkins,
## soda} => {root_vegetables} 0.002541942 0.2118644 0.011997966 1.9437374 25
## [8197] {napkins,
## root_vegetables} => {yogurt} 0.002745297 0.2755102 0.009964413 1.9749584 27
## [8198] {napkins,
## yogurt} => {root_vegetables} 0.002745297 0.2231405 0.012302999 2.0471892 27
## [8199] {napkins,
## root_vegetables} => {rolls/buns} 0.002948653 0.2959184 0.009964413 1.6088210 29
## [8200] {napkins,
## rolls/buns} => {root_vegetables} 0.002948653 0.2521739 0.011692933 2.3135545 29
## [8201] {napkins,
## root_vegetables} => {other_vegetables} 0.004575496 0.4591837 0.009964413 2.3731326 45
## [8202] {napkins,
## other_vegetables} => {root_vegetables} 0.004575496 0.3169014 0.014438231 2.9073931 45
## [8203] {napkins,
## root_vegetables} => {whole_milk} 0.004880529 0.4897959 0.009964413 1.9168893 48
## [8204] {napkins,
## whole_milk} => {root_vegetables} 0.004880529 0.2474227 0.019725470 2.2699646 48
## [8205] {napkins,
## soda} => {yogurt} 0.003355363 0.2796610 0.011997966 2.0047129 33
## [8206] {napkins,
## yogurt} => {soda} 0.003355363 0.2727273 0.012302999 1.5640074 33
## [8207] {napkins,
## soda} => {rolls/buns} 0.002948653 0.2457627 0.011997966 1.3361395 29
## [8208] {napkins,
## rolls/buns} => {soda} 0.002948653 0.2521739 0.011692933 1.4461402 29
## [8209] {napkins,
## soda} => {other_vegetables} 0.003050330 0.2542373 0.011997966 1.3139379 30
## [8210] {napkins,
## other_vegetables} => {soda} 0.003050330 0.2112676 0.014438231 1.2115550 30
## [8211] {napkins,
## soda} => {whole_milk} 0.004677173 0.3898305 0.011997966 1.5256598 46
## [8212] {napkins,
## whole_milk} => {soda} 0.004677173 0.2371134 0.019725470 1.3597728 46
## [8213] {napkins,
## yogurt} => {rolls/buns} 0.003558719 0.2892562 0.012302999 1.5726007 35
## [8214] {napkins,
## rolls/buns} => {yogurt} 0.003558719 0.3043478 0.011692933 2.1816770 35
## [8215] {napkins,
## yogurt} => {other_vegetables} 0.003965430 0.3223140 0.012302999 1.6657691 39
## [8216] {napkins,
## other_vegetables} => {yogurt} 0.003965430 0.2746479 0.014438231 1.9687769 39
## [8217] {napkins,
## yogurt} => {whole_milk} 0.006100661 0.4958678 0.012302999 1.9406524 60
## [8218] {napkins,
## whole_milk} => {yogurt} 0.006100661 0.3092784 0.019725470 2.2170208 60
## [8219] {napkins,
## rolls/buns} => {other_vegetables} 0.004168785 0.3565217 0.011692933 1.8425598 41
## [8220] {napkins,
## other_vegetables} => {rolls/buns} 0.004168785 0.2887324 0.014438231 1.5697530 41
## [8221] {napkins,
## rolls/buns} => {whole_milk} 0.005287239 0.4521739 0.011692933 1.7696500 52
## [8222] {napkins,
## whole_milk} => {rolls/buns} 0.005287239 0.2680412 0.019725470 1.4572612 52
## [8223] {napkins,
## other_vegetables} => {whole_milk} 0.006812405 0.4718310 0.014438231 1.8465809 67
## [8224] {napkins,
## whole_milk} => {other_vegetables} 0.006812405 0.3453608 0.019725470 1.7848785 67
## [8225] {frankfurter,
## pork} => {brown_bread} 0.001220132 0.2068966 0.005897306 3.1893849 12
## [8226] {brown_bread,
## pork} => {frankfurter} 0.001220132 0.2181818 0.005592272 3.6996865 12
## [8227] {frankfurter,
## pork} => {newspapers} 0.001220132 0.2068966 0.005897306 2.5921371 12
## [8228] {frankfurter,
## newspapers} => {pork} 0.001220132 0.2448980 0.004982206 4.2479214 12
## [8229] {frankfurter,
## pork} => {whipped/sour_cream} 0.001220132 0.2068966 0.005897306 2.8862803 12
## [8230] {frankfurter,
## pork} => {pip_fruit} 0.001321810 0.2241379 0.005897306 2.9628986 13
## [8231] {pip_fruit,
## pork} => {frankfurter} 0.001321810 0.2166667 0.006100661 3.6739943 13
## [8232] {frankfurter,
## pork} => {tropical_fruit} 0.001321810 0.2241379 0.005897306 2.1360432 13
## [8233] {frankfurter,
## pork} => {root_vegetables} 0.001830198 0.3103448 0.005897306 2.8472401 18
## [8234] {frankfurter,
## pork} => {soda} 0.001321810 0.2241379 0.005897306 1.2853624 13
## [8235] {frankfurter,
## pork} => {yogurt} 0.001423488 0.2413793 0.005897306 1.7302956 14
## [8236] {frankfurter,
## pork} => {rolls/buns} 0.001626843 0.2758621 0.005897306 1.4997808 16
## [8237] {frankfurter,
## pork} => {other_vegetables} 0.002745297 0.4655172 0.005897306 2.4058655 27
## [8238] {frankfurter,
## pork} => {whole_milk} 0.002846975 0.4827586 0.005897306 1.8893478 28
## [8239] {bottled_beer,
## pork} => {bottled_water} 0.001626843 0.3137255 0.005185562 2.8385374 16
## [8240] {bottled_water,
## pork} => {bottled_beer} 0.001626843 0.2191781 0.007422471 2.7217379 16
## [8241] {bottled_beer,
## pork} => {tropical_fruit} 0.001423488 0.2745098 0.005185562 2.6160891 14
## [8242] {bottled_beer,
## pork} => {root_vegetables} 0.001626843 0.3137255 0.005185562 2.8782558 16
## [8243] {bottled_beer,
## pork} => {soda} 0.001321810 0.2549020 0.005185562 1.4617847 13
## [8244] {bottled_beer,
## pork} => {rolls/buns} 0.001321810 0.2549020 0.005185562 1.3858269 13
## [8245] {bottled_beer,
## pork} => {other_vegetables} 0.001525165 0.2941176 0.005185562 1.5200457 15
## [8246] {bottled_beer,
## pork} => {whole_milk} 0.002338587 0.4509804 0.005185562 1.7649790 23
## [8247] {brown_bread,
## pork} => {butter} 0.001118454 0.2000000 0.005592272 3.6091743 11
## [8248] {butter,
## pork} => {brown_bread} 0.001118454 0.2037037 0.005490595 3.1401660 11
## [8249] {brown_bread,
## pork} => {pastry} 0.001118454 0.2000000 0.005592272 2.2480000 11
## [8250] {brown_bread,
## pork} => {sausage} 0.001220132 0.2181818 0.005592272 2.3223140 12
## [8251] {brown_bread,
## pork} => {root_vegetables} 0.001626843 0.2909091 0.005592272 2.6689281 16
## [8252] {brown_bread,
## pork} => {soda} 0.001321810 0.2363636 0.005592272 1.3554731 13
## [8253] {brown_bread,
## pork} => {yogurt} 0.001220132 0.2181818 0.005592272 1.5640074 12
## [8254] {brown_bread,
## pork} => {other_vegetables} 0.002135231 0.3818182 0.005592272 1.9732958 21
## [8255] {brown_bread,
## pork} => {whole_milk} 0.002745297 0.4909091 0.005592272 1.9212459 27
## [8256] {margarine,
## pork} => {pip_fruit} 0.001321810 0.2063492 0.006405694 2.7277479 13
## [8257] {pip_fruit,
## pork} => {margarine} 0.001321810 0.2166667 0.006100661 3.6995081 13
## [8258] {margarine,
## pork} => {tropical_fruit} 0.001423488 0.2222222 0.006405694 2.1177864 14
## [8259] {margarine,
## pork} => {root_vegetables} 0.001626843 0.2539683 0.006405694 2.3300166 16
## [8260] {margarine,
## pork} => {rolls/buns} 0.001525165 0.2380952 0.006405694 1.2944537 15
## [8261] {margarine,
## pork} => {other_vegetables} 0.002440264 0.3809524 0.006405694 1.9688212 24
## [8262] {margarine,
## pork} => {whole_milk} 0.002745297 0.4285714 0.006405694 1.6772782 27
## [8263] {butter,
## pork} => {whipped/sour_cream} 0.001626843 0.2962963 0.005490595 4.1334384 16
## [8264] {butter,
## pork} => {pastry} 0.001220132 0.2222222 0.005490595 2.4977778 12
## [8265] {butter,
## pork} => {sausage} 0.001118454 0.2037037 0.005490595 2.1682099 11
## [8266] {butter,
## pork} => {root_vegetables} 0.001830198 0.3333333 0.005490595 3.0581468 18
## [8267] {butter,
## pork} => {soda} 0.001118454 0.2037037 0.005490595 1.1681784 11
## [8268] {butter,
## pork} => {yogurt} 0.001728521 0.3148148 0.005490595 2.2567082 17
## [8269] {butter,
## pork} => {rolls/buns} 0.001830198 0.3333333 0.005490595 1.8122351 18
## [8270] {butter,
## pork} => {other_vegetables} 0.002643620 0.4814815 0.005490595 2.4883712 26
## [8271] {butter,
## pork} => {whole_milk} 0.003863752 0.7037037 0.005490595 2.7540493 38
## [8272] {newspapers,
## pork} => {tropical_fruit} 0.001423488 0.2153846 0.006609049 2.0526237 14
## [8273] {newspapers,
## pork} => {root_vegetables} 0.002135231 0.3230769 0.006609049 2.9640499 21
## [8274] {newspapers,
## pork} => {soda} 0.001525165 0.2307692 0.006609049 1.3233909 15
## [8275] {newspapers,
## pork} => {rolls/buns} 0.001728521 0.2615385 0.006609049 1.4219076 17
## [8276] {newspapers,
## pork} => {other_vegetables} 0.002643620 0.4000000 0.006609049 2.0672622 26
## [8277] {newspapers,
## pork} => {whole_milk} 0.002846975 0.4307692 0.006609049 1.6858796 28
## [8278] {domestic_eggs,
## pork} => {whipped/sour_cream} 0.001423488 0.2545455 0.005592272 3.5509994 14
## [8279] {domestic_eggs,
## pork} => {root_vegetables} 0.001931876 0.3454545 0.005592272 3.1693521 19
## [8280] {domestic_eggs,
## pork} => {soda} 0.001118454 0.2000000 0.005592272 1.1469388 11
## [8281] {domestic_eggs,
## pork} => {rolls/buns} 0.001525165 0.2727273 0.005592272 1.4827378 15
## [8282] {domestic_eggs,
## pork} => {other_vegetables} 0.003050330 0.5454545 0.005592272 2.8189939 30
## [8283] {domestic_eggs,
## pork} => {whole_milk} 0.003457041 0.6181818 0.005592272 2.4193467 34
## [8284] {fruit/vegetable_juice,
## pork} => {whipped/sour_cream} 0.001118454 0.2291667 0.004880529 3.1969563 11
## [8285] {fruit/vegetable_juice,
## pork} => {citrus_fruit} 0.001220132 0.2500000 0.004880529 3.0205774 12
## [8286] {fruit/vegetable_juice,
## pork} => {sausage} 0.001016777 0.2083333 0.004880529 2.2174874 10
## [8287] {fruit/vegetable_juice,
## pork} => {tropical_fruit} 0.001220132 0.2500000 0.004880529 2.3825097 12
## [8288] {fruit/vegetable_juice,
## pork} => {root_vegetables} 0.002033554 0.4166667 0.004880529 3.8226835 20
## [8289] {fruit/vegetable_juice,
## pork} => {soda} 0.001423488 0.2916667 0.004880529 1.6726190 14
## [8290] {fruit/vegetable_juice,
## pork} => {yogurt} 0.001830198 0.3750000 0.004880529 2.6881378 18
## [8291] {fruit/vegetable_juice,
## pork} => {other_vegetables} 0.002541942 0.5208333 0.004880529 2.6917477 25
## [8292] {fruit/vegetable_juice,
## pork} => {whole_milk} 0.002643620 0.5416667 0.004880529 2.1198932 26
## [8293] {pip_fruit,
## pork} => {whipped/sour_cream} 0.001321810 0.2166667 0.006100661 3.0225768 13
## [8294] {citrus_fruit,
## pork} => {whipped/sour_cream} 0.001423488 0.2187500 0.006507372 3.0516401 14
## [8295] {pork,
## whipped/sour_cream} => {tropical_fruit} 0.001728521 0.2098765 0.008235892 2.0001316 17
## [8296] {pork,
## tropical_fruit} => {whipped/sour_cream} 0.001728521 0.2023810 0.008540925 2.8232861 17
## [8297] {pork,
## whipped/sour_cream} => {root_vegetables} 0.002135231 0.2592593 0.008235892 2.3785586 21
## [8298] {pork,
## whipped/sour_cream} => {soda} 0.001728521 0.2098765 0.008235892 1.2035777 17
## [8299] {pork,
## whipped/sour_cream} => {yogurt} 0.001830198 0.2222222 0.008235892 1.5929705 18
## [8300] {pork,
## whipped/sour_cream} => {rolls/buns} 0.001728521 0.2098765 0.008235892 1.1410369 17
## [8301] {pork,
## whipped/sour_cream} => {other_vegetables} 0.004067107 0.4938272 0.008235892 2.5521756 40
## [8302] {pork,
## whipped/sour_cream} => {whole_milk} 0.004575496 0.5555556 0.008235892 2.1742495 45
## [8303] {pork,
## whole_milk} => {whipped/sour_cream} 0.004575496 0.2064220 0.022165735 2.8796604 45
## [8304] {pip_fruit,
## pork} => {citrus_fruit} 0.001220132 0.2000000 0.006100661 2.4164619 12
## [8305] {pip_fruit,
## pork} => {tropical_fruit} 0.001830198 0.3000000 0.006100661 2.8590116 18
## [8306] {pork,
## tropical_fruit} => {pip_fruit} 0.001830198 0.2142857 0.008540925 2.8326613 18
## [8307] {pip_fruit,
## pork} => {root_vegetables} 0.001830198 0.3000000 0.006100661 2.7523321 18
## [8308] {pip_fruit,
## pork} => {soda} 0.001321810 0.2166667 0.006100661 1.2425170 13
## [8309] {pip_fruit,
## pork} => {yogurt} 0.001423488 0.2333333 0.006100661 1.6726190 14
## [8310] {pip_fruit,
## pork} => {other_vegetables} 0.003762074 0.6166667 0.006100661 3.1870293 37
## [8311] {pip_fruit,
## pork} => {whole_milk} 0.003152008 0.5166667 0.006100661 2.0220520 31
## [8312] {pastry,
## pork} => {root_vegetables} 0.001423488 0.2258065 0.006304016 2.0716478 14
## [8313] {pastry,
## pork} => {soda} 0.001626843 0.2580645 0.006304016 1.4799210 16
## [8314] {pastry,
## pork} => {rolls/buns} 0.002338587 0.3709677 0.006304016 2.0168423 23
## [8315] {pork,
## rolls/buns} => {pastry} 0.002338587 0.2072072 0.011286223 2.3290090 23
## [8316] {pastry,
## pork} => {other_vegetables} 0.002846975 0.4516129 0.006304016 2.3340057 28
## [8317] {pastry,
## pork} => {whole_milk} 0.003152008 0.5000000 0.006304016 1.9568245 31
## [8318] {citrus_fruit,
## pork} => {root_vegetables} 0.002541942 0.3906250 0.006507372 3.5837657 25
## [8319] {citrus_fruit,
## pork} => {yogurt} 0.001830198 0.2812500 0.006507372 2.0161033 18
## [8320] {citrus_fruit,
## pork} => {other_vegetables} 0.003355363 0.5156250 0.006507372 2.6648302 33
## [8321] {citrus_fruit,
## pork} => {whole_milk} 0.002948653 0.4531250 0.006507372 1.7733722 29
## [8322] {pork,
## shopping_bags} => {root_vegetables} 0.002135231 0.3333333 0.006405694 3.0581468 21
## [8323] {pork,
## shopping_bags} => {other_vegetables} 0.002643620 0.4126984 0.006405694 2.1328896 26
## [8324] {pork,
## shopping_bags} => {whole_milk} 0.001728521 0.2698413 0.006405694 1.0560640 17
## [8325] {pork,
## sausage} => {tropical_fruit} 0.001626843 0.2500000 0.006507372 2.3825097 16
## [8326] {pork,
## sausage} => {root_vegetables} 0.002033554 0.3125000 0.006507372 2.8670126 20
## [8327] {pork,
## sausage} => {soda} 0.001626843 0.2500000 0.006507372 1.4336735 16
## [8328] {pork,
## sausage} => {yogurt} 0.001931876 0.2968750 0.006507372 2.1281091 19
## [8329] {pork,
## yogurt} => {sausage} 0.001931876 0.2021277 0.009557702 2.1514346 19
## [8330] {pork,
## sausage} => {rolls/buns} 0.001931876 0.2968750 0.006507372 1.6140219 19
## [8331] {pork,
## sausage} => {other_vegetables} 0.002948653 0.4531250 0.006507372 2.3418205 29
## [8332] {pork,
## sausage} => {whole_milk} 0.003355363 0.5156250 0.006507372 2.0179753 33
## [8333] {bottled_water,
## pork} => {tropical_fruit} 0.001931876 0.2602740 0.007422471 2.4804210 19
## [8334] {pork,
## tropical_fruit} => {bottled_water} 0.001931876 0.2261905 0.008540925 2.0465348 19
## [8335] {bottled_water,
## pork} => {root_vegetables} 0.002440264 0.3287671 0.007422471 3.0162543 24
## [8336] {bottled_water,
## pork} => {soda} 0.002236909 0.3013699 0.007422471 1.7282639 22
## [8337] {bottled_water,
## pork} => {rolls/buns} 0.001931876 0.2602740 0.007422471 1.4150329 19
## [8338] {bottled_water,
## pork} => {other_vegetables} 0.002745297 0.3698630 0.007422471 1.9115096 27
## [8339] {bottled_water,
## pork} => {whole_milk} 0.002846975 0.3835616 0.007422471 1.5011257 28
## [8340] {pork,
## tropical_fruit} => {root_vegetables} 0.002541942 0.2976190 0.008540925 2.7304882 25
## [8341] {pork,
## tropical_fruit} => {soda} 0.002033554 0.2380952 0.008540925 1.3654033 20
## [8342] {pork,
## tropical_fruit} => {yogurt} 0.002745297 0.3214286 0.008540925 2.3041181 27
## [8343] {pork,
## yogurt} => {tropical_fruit} 0.002745297 0.2872340 0.009557702 2.7373516 27
## [8344] {pork,
## tropical_fruit} => {rolls/buns} 0.001830198 0.2142857 0.008540925 1.1650083 18
## [8345] {pork,
## tropical_fruit} => {other_vegetables} 0.003660397 0.4285714 0.008540925 2.2149238 36
## [8346] {pork,
## tropical_fruit} => {whole_milk} 0.003863752 0.4523810 0.008540925 1.7704603 38
## [8347] {pork,
## root_vegetables} => {soda} 0.002846975 0.2089552 0.013624809 1.1982942 28
## [8348] {pork,
## soda} => {root_vegetables} 0.002846975 0.2393162 0.011896289 2.1955926 28
## [8349] {pork,
## root_vegetables} => {yogurt} 0.002948653 0.2164179 0.013624809 1.5513631 29
## [8350] {pork,
## yogurt} => {root_vegetables} 0.002948653 0.3085106 0.009557702 2.8304124 29
## [8351] {pork,
## root_vegetables} => {rolls/buns} 0.002846975 0.2089552 0.013624809 1.1360280 28
## [8352] {pork,
## rolls/buns} => {root_vegetables} 0.002846975 0.2522523 0.011286223 2.3142732 28
## [8353] {pork,
## root_vegetables} => {other_vegetables} 0.007015760 0.5149254 0.013624809 2.6612144 69
## [8354] {other_vegetables,
## pork} => {root_vegetables} 0.007015760 0.3239437 0.021657346 2.9720018 69
## [8355] {pork,
## root_vegetables} => {whole_milk} 0.006812405 0.5000000 0.013624809 1.9568245 67
## [8356] {pork,
## whole_milk} => {root_vegetables} 0.006812405 0.3073394 0.022165735 2.8196674 67
## [8357] {pork,
## yogurt} => {soda} 0.001931876 0.2021277 0.009557702 1.1591403 19
## [8358] {pork,
## rolls/buns} => {soda} 0.002338587 0.2072072 0.011286223 1.1882699 23
## [8359] {pork,
## soda} => {other_vegetables} 0.003863752 0.3247863 0.011896289 1.6785462 38
## [8360] {pork,
## soda} => {whole_milk} 0.004270463 0.3589744 0.011896289 1.4048997 42
## [8361] {pork,
## yogurt} => {rolls/buns} 0.002135231 0.2234043 0.009557702 1.2145831 21
## [8362] {pork,
## yogurt} => {other_vegetables} 0.004677173 0.4893617 0.009557702 2.5290974 46
## [8363] {other_vegetables,
## pork} => {yogurt} 0.004677173 0.2159624 0.021657346 1.5480981 46
## [8364] {pork,
## yogurt} => {whole_milk} 0.004880529 0.5106383 0.009557702 1.9984591 48
## [8365] {pork,
## whole_milk} => {yogurt} 0.004880529 0.2201835 0.022165735 1.5783561 48
## [8366] {pork,
## rolls/buns} => {other_vegetables} 0.005592272 0.4954955 0.011286223 2.5607978 55
## [8367] {other_vegetables,
## pork} => {rolls/buns} 0.005592272 0.2582160 0.021657346 1.4038441 55
## [8368] {pork,
## rolls/buns} => {whole_milk} 0.006202339 0.5495495 0.011286223 2.1507441 61
## [8369] {pork,
## whole_milk} => {rolls/buns} 0.006202339 0.2798165 0.022165735 1.5212799 61
## [8370] {other_vegetables,
## pork} => {whole_milk} 0.010167768 0.4694836 0.021657346 1.8373939 100
## [8371] {pork,
## whole_milk} => {other_vegetables} 0.010167768 0.4587156 0.022165735 2.3707136 100
## [8372] {bottled_beer,
## frankfurter} => {bottled_water} 0.001220132 0.2264151 0.005388917 2.0485671 12
## [8373] {bottled_beer,
## frankfurter} => {root_vegetables} 0.001525165 0.2830189 0.005388917 2.5965397 15
## [8374] {bottled_beer,
## frankfurter} => {rolls/buns} 0.001830198 0.3396226 0.005388917 1.8464282 18
## [8375] {bottled_beer,
## frankfurter} => {other_vegetables} 0.001728521 0.3207547 0.005388917 1.6577103 17
## [8376] {bottled_beer,
## frankfurter} => {whole_milk} 0.002745297 0.5094340 0.005388917 1.9937457 27
## [8377] {brown_bread,
## frankfurter} => {pip_fruit} 0.001525165 0.2142857 0.007117438 2.8326613 15
## [8378] {frankfurter,
## pip_fruit} => {brown_bread} 0.001525165 0.2112676 0.007219115 3.2567663 15
## [8379] {brown_bread,
## pip_fruit} => {frankfurter} 0.001525165 0.2000000 0.007625826 3.3913793 15
## [8380] {brown_bread,
## frankfurter} => {sausage} 0.001525165 0.2142857 0.007117438 2.2808442 15
## [8381] {brown_bread,
## frankfurter} => {root_vegetables} 0.001423488 0.2000000 0.007117438 1.8348881 14
## [8382] {brown_bread,
## frankfurter} => {yogurt} 0.002236909 0.3142857 0.007117438 2.2529155 22
## [8383] {frankfurter,
## yogurt} => {brown_bread} 0.002236909 0.2000000 0.011184545 3.0830721 22
## [8384] {brown_bread,
## frankfurter} => {rolls/buns} 0.001423488 0.2000000 0.007117438 1.0873411 14
## [8385] {brown_bread,
## frankfurter} => {other_vegetables} 0.002033554 0.2857143 0.007117438 1.4766159 20
## [8386] {brown_bread,
## frankfurter} => {whole_milk} 0.002745297 0.3857143 0.007117438 1.5095503 27
## [8387] {frankfurter,
## margarine} => {sausage} 0.001423488 0.2222222 0.006405694 2.3653199 14
## [8388] {margarine,
## sausage} => {frankfurter} 0.001423488 0.2000000 0.007117438 3.3913793 14
## [8389] {frankfurter,
## margarine} => {tropical_fruit} 0.001423488 0.2222222 0.006405694 2.1177864 14
## [8390] {frankfurter,
## margarine} => {yogurt} 0.001728521 0.2698413 0.006405694 1.9343213 17
## [8391] {frankfurter,
## margarine} => {rolls/buns} 0.001423488 0.2222222 0.006405694 1.2081567 14
## [8392] {frankfurter,
## margarine} => {other_vegetables} 0.001423488 0.2222222 0.006405694 1.1484790 14
## [8393] {frankfurter,
## margarine} => {whole_milk} 0.002440264 0.3809524 0.006405694 1.4909139 24
## [8394] {butter,
## frankfurter} => {whipped/sour_cream} 0.001118454 0.2291667 0.004880529 3.1969563 11
## [8395] {butter,
## frankfurter} => {pastry} 0.001118454 0.2291667 0.004880529 2.5758333 11
## [8396] {butter,
## frankfurter} => {sausage} 0.001321810 0.2708333 0.004880529 2.8827336 13
## [8397] {butter,
## frankfurter} => {tropical_fruit} 0.001118454 0.2291667 0.004880529 2.1839672 11
## [8398] {butter,
## frankfurter} => {root_vegetables} 0.001321810 0.2708333 0.004880529 2.4847442 13
## [8399] {butter,
## frankfurter} => {yogurt} 0.001728521 0.3541667 0.004880529 2.5387968 17
## [8400] {butter,
## frankfurter} => {rolls/buns} 0.001830198 0.3750000 0.004880529 2.0387645 18
## [8401] {butter,
## frankfurter} => {other_vegetables} 0.001931876 0.3958333 0.004880529 2.0457282 19
## [8402] {butter,
## frankfurter} => {whole_milk} 0.002745297 0.5625000 0.004880529 2.2014276 27
## [8403] {frankfurter,
## newspapers} => {tropical_fruit} 0.001118454 0.2244898 0.004982206 2.1393965 11
## [8404] {frankfurter,
## newspapers} => {root_vegetables} 0.001118454 0.2244898 0.004982206 2.0595682 11
## [8405] {frankfurter,
## newspapers} => {rolls/buns} 0.002033554 0.4081633 0.004982206 2.2190634 20
## [8406] {frankfurter,
## newspapers} => {other_vegetables} 0.001830198 0.3673469 0.004982206 1.8985061 18
## [8407] {frankfurter,
## newspapers} => {whole_milk} 0.002033554 0.4081633 0.004982206 1.5974078 20
## [8408] {domestic_eggs,
## frankfurter} => {whipped/sour_cream} 0.001830198 0.2608696 0.007015760 3.6392229 18
## [8409] {frankfurter,
## whipped/sour_cream} => {domestic_eggs} 0.001830198 0.2950820 0.006202339 4.6508512 18
## [8410] {domestic_eggs,
## frankfurter} => {pip_fruit} 0.001626843 0.2318841 0.007015760 3.0652953 16
## [8411] {frankfurter,
## pip_fruit} => {domestic_eggs} 0.001626843 0.2253521 0.007219115 3.5518238 16
## [8412] {domestic_eggs,
## frankfurter} => {citrus_fruit} 0.001525165 0.2173913 0.007015760 2.6265890 15
## [8413] {citrus_fruit,
## frankfurter} => {domestic_eggs} 0.001525165 0.2343750 0.006507372 3.6940355 15
## [8414] {domestic_eggs,
## frankfurter} => {tropical_fruit} 0.001626843 0.2318841 0.007015760 2.2098641 16
## [8415] {domestic_eggs,
## frankfurter} => {root_vegetables} 0.001830198 0.2608696 0.007015760 2.3933323 18
## [8416] {domestic_eggs,
## frankfurter} => {yogurt} 0.001728521 0.2463768 0.007015760 1.7661195 17
## [8417] {domestic_eggs,
## frankfurter} => {rolls/buns} 0.002033554 0.2898551 0.007015760 1.5758566 20
## [8418] {domestic_eggs,
## frankfurter} => {other_vegetables} 0.002948653 0.4202899 0.007015760 2.1721233 29
## [8419] {domestic_eggs,
## frankfurter} => {whole_milk} 0.003457041 0.4927536 0.007015760 1.9284647 34
## [8420] {frankfurter,
## fruit/vegetable_juice} => {pip_fruit} 0.001220132 0.2307692 0.005287239 3.0505583 12
## [8421] {frankfurter,
## fruit/vegetable_juice} => {pastry} 0.001423488 0.2692308 0.005287239 3.0261538 14
## [8422] {frankfurter,
## fruit/vegetable_juice} => {shopping_bags} 0.001220132 0.2307692 0.005287239 2.3422243 12
## [8423] {frankfurter,
## fruit/vegetable_juice} => {tropical_fruit} 0.001830198 0.3461538 0.005287239 3.2988596 18
## [8424] {frankfurter,
## fruit/vegetable_juice} => {soda} 0.001626843 0.3076923 0.005287239 1.7645212 16
## [8425] {frankfurter,
## fruit/vegetable_juice} => {yogurt} 0.001728521 0.3269231 0.005287239 2.3435047 17
## [8426] {frankfurter,
## fruit/vegetable_juice} => {rolls/buns} 0.001525165 0.2884615 0.005287239 1.5682804 15
## [8427] {frankfurter,
## fruit/vegetable_juice} => {other_vegetables} 0.001626843 0.3076923 0.005287239 1.5902017 16
## [8428] {frankfurter,
## fruit/vegetable_juice} => {whole_milk} 0.002846975 0.5384615 0.005287239 2.1073495 28
## [8429] {frankfurter,
## whipped/sour_cream} => {citrus_fruit} 0.001525165 0.2459016 0.006202339 2.9710597 15
## [8430] {citrus_fruit,
## frankfurter} => {whipped/sour_cream} 0.001525165 0.2343750 0.006507372 3.2696144 15
## [8431] {frankfurter,
## whipped/sour_cream} => {tropical_fruit} 0.002236909 0.3606557 0.006202339 3.4370632 22
## [8432] {frankfurter,
## tropical_fruit} => {whipped/sour_cream} 0.002236909 0.2365591 0.009456024 3.3000839 22
## [8433] {frankfurter,
## whipped/sour_cream} => {root_vegetables} 0.001626843 0.2622951 0.006202339 2.4064106 16
## [8434] {frankfurter,
## whipped/sour_cream} => {yogurt} 0.002338587 0.3770492 0.006202339 2.7028270 23
## [8435] {frankfurter,
## yogurt} => {whipped/sour_cream} 0.002338587 0.2090909 0.011184545 2.9168923 23
## [8436] {frankfurter,
## whipped/sour_cream} => {rolls/buns} 0.002135231 0.3442623 0.006202339 1.8716527 21
## [8437] {frankfurter,
## whipped/sour_cream} => {other_vegetables} 0.003050330 0.4918033 0.006202339 2.5417158 30
## [8438] {frankfurter,
## whipped/sour_cream} => {whole_milk} 0.003050330 0.4918033 0.006202339 1.9247454 30
## [8439] {citrus_fruit,
## frankfurter} => {pip_fruit} 0.001321810 0.2031250 0.006507372 2.6851268 13
## [8440] {frankfurter,
## pip_fruit} => {tropical_fruit} 0.002338587 0.3239437 0.007219115 3.0871957 23
## [8441] {frankfurter,
## tropical_fruit} => {pip_fruit} 0.002338587 0.2473118 0.009456024 3.2692363 23
## [8442] {frankfurter,
## pip_fruit} => {root_vegetables} 0.001626843 0.2253521 0.007219115 2.0674795 16
## [8443] {frankfurter,
## pip_fruit} => {soda} 0.001728521 0.2394366 0.007219115 1.3730957 17
## [8444] {frankfurter,
## pip_fruit} => {yogurt} 0.002541942 0.3521127 0.007219115 2.5240730 25
## [8445] {frankfurter,
## yogurt} => {pip_fruit} 0.002541942 0.2272727 0.011184545 3.0043377 25
## [8446] {frankfurter,
## pip_fruit} => {other_vegetables} 0.003660397 0.5070423 0.007219115 2.6204732 36
## [8447] {frankfurter,
## other_vegetables} => {pip_fruit} 0.003660397 0.2222222 0.016471784 2.9375747 36
## [8448] {frankfurter,
## pip_fruit} => {whole_milk} 0.003355363 0.4647887 0.007219115 1.8190200 33
## [8449] {frankfurter,
## pastry} => {sausage} 0.002033554 0.2439024 0.008337570 2.5960828 20
## [8450] {frankfurter,
## sausage} => {pastry} 0.002033554 0.2020202 0.010066090 2.2707071 20
## [8451] {frankfurter,
## pastry} => {tropical_fruit} 0.001728521 0.2073171 0.008337570 1.9757397 17
## [8452] {frankfurter,
## pastry} => {soda} 0.002541942 0.3048780 0.008337570 1.7483823 25
## [8453] {frankfurter,
## soda} => {pastry} 0.002541942 0.2252252 0.011286223 2.5315315 25
## [8454] {frankfurter,
## pastry} => {yogurt} 0.002745297 0.3292683 0.008337570 2.3603161 27
## [8455] {frankfurter,
## yogurt} => {pastry} 0.002745297 0.2454545 0.011184545 2.7589091 27
## [8456] {frankfurter,
## pastry} => {rolls/buns} 0.002846975 0.3414634 0.008337570 1.8564360 28
## [8457] {frankfurter,
## pastry} => {other_vegetables} 0.002948653 0.3536585 0.008337570 1.8277623 29
## [8458] {frankfurter,
## pastry} => {whole_milk} 0.003965430 0.4756098 0.008337570 1.8613697 39
## [8459] {citrus_fruit,
## frankfurter} => {tropical_fruit} 0.001321810 0.2031250 0.006507372 1.9357891 13
## [8460] {citrus_fruit,
## frankfurter} => {root_vegetables} 0.001728521 0.2656250 0.006507372 2.4369607 17
## [8461] {citrus_fruit,
## frankfurter} => {yogurt} 0.001728521 0.2656250 0.006507372 1.9040976 17
## [8462] {citrus_fruit,
## frankfurter} => {rolls/buns} 0.002033554 0.3125000 0.006507372 1.6989704 20
## [8463] {citrus_fruit,
## frankfurter} => {other_vegetables} 0.002948653 0.4531250 0.006507372 2.3418205 29
## [8464] {citrus_fruit,
## frankfurter} => {whole_milk} 0.003152008 0.4843750 0.006507372 1.8956737 31
## [8465] {frankfurter,
## shopping_bags} => {root_vegetables} 0.001728521 0.2098765 0.008235892 1.9254998 17
## [8466] {frankfurter,
## shopping_bags} => {soda} 0.002440264 0.2962963 0.008235892 1.6991686 24
## [8467] {frankfurter,
## soda} => {shopping_bags} 0.002440264 0.2162162 0.011286223 2.1945165 24
## [8468] {frankfurter,
## shopping_bags} => {rolls/buns} 0.003152008 0.3827160 0.008235892 2.0807144 31
## [8469] {frankfurter,
## shopping_bags} => {other_vegetables} 0.002236909 0.2716049 0.008235892 1.4036966 22
## [8470] {frankfurter,
## shopping_bags} => {whole_milk} 0.002643620 0.3209877 0.008235892 1.2562330 26
## [8471] {bottled_water,
## frankfurter} => {sausage} 0.001525165 0.2083333 0.007320793 2.2174874 15
## [8472] {frankfurter,
## sausage} => {tropical_fruit} 0.002033554 0.2020202 0.010066090 1.9252604 20
## [8473] {frankfurter,
## tropical_fruit} => {sausage} 0.002033554 0.2150538 0.009456024 2.2890192 20
## [8474] {frankfurter,
## sausage} => {root_vegetables} 0.002541942 0.2525253 0.010066090 2.3167779 25
## [8475] {frankfurter,
## root_vegetables} => {sausage} 0.002541942 0.2500000 0.010167768 2.6609848 25
## [8476] {frankfurter,
## sausage} => {soda} 0.002236909 0.2222222 0.010066090 1.2743764 22
## [8477] {frankfurter,
## sausage} => {yogurt} 0.002440264 0.2424242 0.010066090 1.7377860 24
## [8478] {frankfurter,
## yogurt} => {sausage} 0.002440264 0.2181818 0.011184545 2.3223140 24
## [8479] {frankfurter,
## sausage} => {rolls/buns} 0.003863752 0.3838384 0.010066090 2.0868162 38
## [8480] {frankfurter,
## rolls/buns} => {sausage} 0.003863752 0.2010582 0.019217082 2.1400513 38
## [8481] {frankfurter,
## sausage} => {other_vegetables} 0.003152008 0.3131313 0.010066090 1.6183113 31
## [8482] {frankfurter,
## sausage} => {whole_milk} 0.003558719 0.3535354 0.010066090 1.3836133 35
## [8483] {bottled_water,
## frankfurter} => {soda} 0.002338587 0.3194444 0.007320793 1.8319161 23
## [8484] {frankfurter,
## soda} => {bottled_water} 0.002338587 0.2072072 0.011286223 1.8747773 23
## [8485] {bottled_water,
## frankfurter} => {yogurt} 0.002236909 0.3055556 0.007320793 2.1903345 22
## [8486] {frankfurter,
## yogurt} => {bottled_water} 0.002236909 0.2000000 0.011184545 1.8095676 22
## [8487] {bottled_water,
## frankfurter} => {rolls/buns} 0.003050330 0.4166667 0.007320793 2.2652939 30
## [8488] {bottled_water,
## frankfurter} => {other_vegetables} 0.001830198 0.2500000 0.007320793 1.2920389 18
## [8489] {bottled_water,
## frankfurter} => {whole_milk} 0.002643620 0.3611111 0.007320793 1.4132621 26
## [8490] {frankfurter,
## tropical_fruit} => {root_vegetables} 0.002745297 0.2903226 0.009456024 2.6635472 27
## [8491] {frankfurter,
## root_vegetables} => {tropical_fruit} 0.002745297 0.2700000 0.010167768 2.5731105 27
## [8492] {frankfurter,
## tropical_fruit} => {yogurt} 0.002948653 0.3118280 0.009456024 2.2352973 29
## [8493] {frankfurter,
## yogurt} => {tropical_fruit} 0.002948653 0.2636364 0.011184545 2.5124648 29
## [8494] {frankfurter,
## tropical_fruit} => {rolls/buns} 0.002948653 0.3118280 0.009456024 1.6953167 29
## [8495] {frankfurter,
## tropical_fruit} => {other_vegetables} 0.003965430 0.4193548 0.009456024 2.1672910 39
## [8496] {frankfurter,
## other_vegetables} => {tropical_fruit} 0.003965430 0.2407407 0.016471784 2.2942686 39
## [8497] {frankfurter,
## tropical_fruit} => {whole_milk} 0.005185562 0.5483871 0.009456024 2.1461946 51
## [8498] {frankfurter,
## whole_milk} => {tropical_fruit} 0.005185562 0.2524752 0.020538892 2.4060989 51
## [8499] {frankfurter,
## root_vegetables} => {yogurt} 0.003253686 0.3200000 0.010167768 2.2938776 32
## [8500] {frankfurter,
## yogurt} => {root_vegetables} 0.003253686 0.2909091 0.011184545 2.6689281 32
## [8501] {frankfurter,
## root_vegetables} => {rolls/buns} 0.003457041 0.3400000 0.010167768 1.8484798 34
## [8502] {frankfurter,
## root_vegetables} => {other_vegetables} 0.003965430 0.3900000 0.010167768 2.0155807 39
## [8503] {frankfurter,
## other_vegetables} => {root_vegetables} 0.003965430 0.2407407 0.016471784 2.2086616 39
## [8504] {frankfurter,
## root_vegetables} => {whole_milk} 0.005083884 0.5000000 0.010167768 1.9568245 50
## [8505] {frankfurter,
## whole_milk} => {root_vegetables} 0.005083884 0.2475248 0.020538892 2.2709011 50
## [8506] {frankfurter,
## soda} => {yogurt} 0.002846975 0.2522523 0.011286223 1.8082368 28
## [8507] {frankfurter,
## yogurt} => {soda} 0.002846975 0.2545455 0.011184545 1.4597403 28
## [8508] {frankfurter,
## soda} => {rolls/buns} 0.003863752 0.3423423 0.011286223 1.8612144 38
## [8509] {frankfurter,
## rolls/buns} => {soda} 0.003863752 0.2010582 0.019217082 1.1530072 38
## [8510] {frankfurter,
## soda} => {other_vegetables} 0.003253686 0.2882883 0.011286223 1.4899187 32
## [8511] {frankfurter,
## soda} => {whole_milk} 0.003355363 0.2972973 0.011286223 1.1635173 33
## [8512] {frankfurter,
## yogurt} => {rolls/buns} 0.004168785 0.3727273 0.011184545 2.0264084 41
## [8513] {frankfurter,
## rolls/buns} => {yogurt} 0.004168785 0.2169312 0.019217082 1.5550427 41
## [8514] {frankfurter,
## yogurt} => {other_vegetables} 0.004880529 0.4363636 0.011184545 2.2551951 48
## [8515] {frankfurter,
## other_vegetables} => {yogurt} 0.004880529 0.2962963 0.016471784 2.1239607 48
## [8516] {frankfurter,
## yogurt} => {whole_milk} 0.006202339 0.5545455 0.011184545 2.1702963 61
## [8517] {frankfurter,
## whole_milk} => {yogurt} 0.006202339 0.3019802 0.020538892 2.1647050 61
## [8518] {frankfurter,
## rolls/buns} => {other_vegetables} 0.005592272 0.2910053 0.019217082 1.5039606 55
## [8519] {frankfurter,
## other_vegetables} => {rolls/buns} 0.005592272 0.3395062 0.016471784 1.8457950 55
## [8520] {frankfurter,
## rolls/buns} => {whole_milk} 0.005998983 0.3121693 0.019217082 1.2217211 59
## [8521] {frankfurter,
## whole_milk} => {rolls/buns} 0.005998983 0.2920792 0.020538892 1.5879486 59
## [8522] {frankfurter,
## other_vegetables} => {whole_milk} 0.007625826 0.4629630 0.016471784 1.8118745 75
## [8523] {frankfurter,
## whole_milk} => {other_vegetables} 0.007625826 0.3712871 0.020538892 1.9188696 75
## [8524] {bottled_beer,
## brown_bread} => {bottled_water} 0.001220132 0.2352941 0.005185562 2.1289031 12
## [8525] {bottled_beer,
## brown_bread} => {soda} 0.001525165 0.2941176 0.005185562 1.6866747 15
## [8526] {bottled_beer,
## brown_bread} => {yogurt} 0.001118454 0.2156863 0.005185562 1.5461184 11
## [8527] {bottled_beer,
## brown_bread} => {rolls/buns} 0.001220132 0.2352941 0.005185562 1.2792248 12
## [8528] {bottled_beer,
## brown_bread} => {other_vegetables} 0.001118454 0.2156863 0.005185562 1.1147002 11
## [8529] {bottled_beer,
## brown_bread} => {whole_milk} 0.002745297 0.5294118 0.005185562 2.0719318 27
## [8530] {bottled_beer,
## domestic_eggs} => {margarine} 0.001118454 0.2391304 0.004677173 4.0830691 11
## [8531] {bottled_beer,
## margarine} => {bottled_water} 0.001423488 0.2333333 0.006100661 2.1111622 14
## [8532] {bottled_beer,
## margarine} => {soda} 0.001423488 0.2333333 0.006100661 1.3380952 14
## [8533] {bottled_beer,
## margarine} => {rolls/buns} 0.001728521 0.2833333 0.006100661 1.5403999 17
## [8534] {bottled_beer,
## margarine} => {other_vegetables} 0.002745297 0.4500000 0.006100661 2.3256700 27
## [8535] {bottled_beer,
## margarine} => {whole_milk} 0.003050330 0.5000000 0.006100661 1.9568245 30
## [8536] {bottled_beer,
## butter} => {domestic_eggs} 0.001321810 0.2280702 0.005795628 3.5946637 13
## [8537] {bottled_beer,
## domestic_eggs} => {butter} 0.001321810 0.2826087 0.004677173 5.0999202 13
## [8538] {bottled_beer,
## butter} => {citrus_fruit} 0.001321810 0.2280702 0.005795628 2.7556145 13
## [8539] {bottled_beer,
## citrus_fruit} => {butter} 0.001321810 0.2166667 0.006100661 3.9099388 13
## [8540] {bottled_beer,
## butter} => {bottled_water} 0.001830198 0.3157895 0.005795628 2.8572120 18
## [8541] {bottled_water,
## butter} => {bottled_beer} 0.001830198 0.2045455 0.008947636 2.5400310 18
## [8542] {bottled_beer,
## butter} => {root_vegetables} 0.001728521 0.2982456 0.005795628 2.7362366 17
## [8543] {bottled_beer,
## butter} => {yogurt} 0.001423488 0.2456140 0.005795628 1.7606516 14
## [8544] {bottled_beer,
## butter} => {rolls/buns} 0.001830198 0.3157895 0.005795628 1.7168543 18
## [8545] {bottled_beer,
## butter} => {other_vegetables} 0.002236909 0.3859649 0.005795628 1.9947267 22
## [8546] {bottled_beer,
## butter} => {whole_milk} 0.003253686 0.5614035 0.005795628 2.1971363 32
## [8547] {bottled_beer,
## newspapers} => {soda} 0.001016777 0.2040816 0.004982206 1.1703457 10
## [8548] {bottled_beer,
## newspapers} => {rolls/buns} 0.001220132 0.2448980 0.004982206 1.3314380 12
## [8549] {bottled_beer,
## newspapers} => {other_vegetables} 0.001931876 0.3877551 0.004982206 2.0039787 19
## [8550] {bottled_beer,
## newspapers} => {whole_milk} 0.002033554 0.4081633 0.004982206 1.5974078 20
## [8551] {bottled_beer,
## domestic_eggs} => {bottled_water} 0.001830198 0.3913043 0.004677173 3.5404584 18
## [8552] {bottled_water,
## domestic_eggs} => {bottled_beer} 0.001830198 0.2000000 0.009150991 2.4835859 18
## [8553] {bottled_beer,
## domestic_eggs} => {root_vegetables} 0.001220132 0.2608696 0.004677173 2.3933323 12
## [8554] {bottled_beer,
## domestic_eggs} => {soda} 0.001118454 0.2391304 0.004677173 1.3713398 11
## [8555] {bottled_beer,
## domestic_eggs} => {yogurt} 0.001321810 0.2826087 0.004677173 2.0258429 13
## [8556] {bottled_beer,
## domestic_eggs} => {rolls/buns} 0.001220132 0.2608696 0.004677173 1.4182710 12
## [8557] {bottled_beer,
## domestic_eggs} => {other_vegetables} 0.002643620 0.5652174 0.004677173 2.9211314 26
## [8558] {bottled_beer,
## domestic_eggs} => {whole_milk} 0.002948653 0.6304348 0.004677173 2.4673005 29
## [8559] {bottled_beer,
## citrus_fruit} => {fruit/vegetable_juice} 0.001321810 0.2166667 0.006100661 2.9970699 13
## [8560] {bottled_beer,
## fruit/vegetable_juice} => {bottled_water} 0.002541942 0.3623188 0.007015760 3.2782022 25
## [8561] {bottled_beer,
## fruit/vegetable_juice} => {soda} 0.002745297 0.3913043 0.007015760 2.2440106 27
## [8562] {bottled_beer,
## fruit/vegetable_juice} => {yogurt} 0.002033554 0.2898551 0.007015760 2.0777876 20
## [8563] {bottled_beer,
## yogurt} => {fruit/vegetable_juice} 0.002033554 0.2197802 0.009252669 3.0401385 20
## [8564] {bottled_beer,
## fruit/vegetable_juice} => {rolls/buns} 0.001423488 0.2028986 0.007015760 1.1030996 14
## [8565] {bottled_beer,
## fruit/vegetable_juice} => {other_vegetables} 0.002541942 0.3623188 0.007015760 1.8725201 25
## [8566] {bottled_beer,
## fruit/vegetable_juice} => {whole_milk} 0.002948653 0.4202899 0.007015760 1.6448670 29
## [8567] {bottled_beer,
## whipped/sour_cream} => {citrus_fruit} 0.001016777 0.2564103 0.003965430 3.0980281 10
## [8568] {bottled_beer,
## whipped/sour_cream} => {bottled_water} 0.001220132 0.3076923 0.003965430 2.7839502 12
## [8569] {bottled_beer,
## whipped/sour_cream} => {tropical_fruit} 0.001118454 0.2820513 0.003965430 2.6879597 11
## [8570] {bottled_beer,
## whipped/sour_cream} => {root_vegetables} 0.001321810 0.3333333 0.003965430 3.0581468 13
## [8571] {bottled_beer,
## whipped/sour_cream} => {yogurt} 0.001626843 0.4102564 0.003965430 2.9408687 16
## [8572] {bottled_beer,
## whipped/sour_cream} => {rolls/buns} 0.001220132 0.3076923 0.003965430 1.6728324 12
## [8573] {bottled_beer,
## whipped/sour_cream} => {other_vegetables} 0.002135231 0.5384615 0.003965430 2.7828530 21
## [8574] {bottled_beer,
## whipped/sour_cream} => {whole_milk} 0.002135231 0.5384615 0.003965430 2.1073495 21
## [8575] {bottled_beer,
## pip_fruit} => {citrus_fruit} 0.001321810 0.2241379 0.005897306 2.7081039 13
## [8576] {bottled_beer,
## citrus_fruit} => {pip_fruit} 0.001321810 0.2166667 0.006100661 2.8641353 13
## [8577] {bottled_beer,
## pip_fruit} => {tropical_fruit} 0.001931876 0.3275862 0.005897306 3.1219092 19
## [8578] {bottled_beer,
## tropical_fruit} => {pip_fruit} 0.001931876 0.2345679 0.008235892 3.1007733 19
## [8579] {bottled_beer,
## pip_fruit} => {root_vegetables} 0.001626843 0.2758621 0.005897306 2.5308801 16
## [8580] {bottled_beer,
## pip_fruit} => {soda} 0.001626843 0.2758621 0.005897306 1.5819845 16
## [8581] {bottled_beer,
## pip_fruit} => {yogurt} 0.001220132 0.2068966 0.005897306 1.4831105 12
## [8582] {bottled_beer,
## pip_fruit} => {other_vegetables} 0.001931876 0.3275862 0.005897306 1.6930165 19
## [8583] {bottled_beer,
## pip_fruit} => {whole_milk} 0.002440264 0.4137931 0.005897306 1.6194410 24
## [8584] {bottled_beer,
## pastry} => {soda} 0.001321810 0.2888889 0.004575496 1.6566893 13
## [8585] {bottled_beer,
## pastry} => {yogurt} 0.001321810 0.2888889 0.004575496 2.0708617 13
## [8586] {bottled_beer,
## pastry} => {rolls/buns} 0.001016777 0.2222222 0.004575496 1.2081567 10
## [8587] {bottled_beer,
## pastry} => {other_vegetables} 0.001118454 0.2444444 0.004575496 1.2633269 11
## [8588] {bottled_beer,
## pastry} => {whole_milk} 0.002033554 0.4444444 0.004575496 1.7393996 20
## [8589] {bottled_beer,
## citrus_fruit} => {sausage} 0.001220132 0.2000000 0.006100661 2.1287879 12
## [8590] {bottled_beer,
## citrus_fruit} => {bottled_water} 0.002236909 0.3666667 0.006100661 3.3175406 22
## [8591] {bottled_beer,
## citrus_fruit} => {root_vegetables} 0.001728521 0.2833333 0.006100661 2.5994248 17
## [8592] {bottled_beer,
## citrus_fruit} => {soda} 0.001626843 0.2666667 0.006100661 1.5292517 16
## [8593] {bottled_beer,
## citrus_fruit} => {yogurt} 0.001220132 0.2000000 0.006100661 1.4336735 12
## [8594] {bottled_beer,
## citrus_fruit} => {rolls/buns} 0.001728521 0.2833333 0.006100661 1.5403999 17
## [8595] {bottled_beer,
## citrus_fruit} => {other_vegetables} 0.002541942 0.4166667 0.006100661 2.1533981 25
## [8596] {bottled_beer,
## citrus_fruit} => {whole_milk} 0.003457041 0.5666667 0.006100661 2.2177344 34
## [8597] {bottled_beer,
## shopping_bags} => {soda} 0.001220132 0.2181818 0.005592272 1.2512059 12
## [8598] {bottled_beer,
## sausage} => {root_vegetables} 0.002033554 0.2597403 0.007829181 2.3829715 20
## [8599] {bottled_beer,
## root_vegetables} => {sausage} 0.002033554 0.2105263 0.009659380 2.2408293 20
## [8600] {bottled_beer,
## sausage} => {soda} 0.002236909 0.2857143 0.007829181 1.6384840 22
## [8601] {bottled_beer,
## sausage} => {rolls/buns} 0.002033554 0.2597403 0.007829181 1.4121313 20
## [8602] {bottled_beer,
## sausage} => {other_vegetables} 0.002440264 0.3116883 0.007829181 1.6108537 24
## [8603] {bottled_beer,
## sausage} => {whole_milk} 0.002846975 0.3636364 0.007829181 1.4231451 28
## [8604] {bottled_beer,
## tropical_fruit} => {bottled_water} 0.002643620 0.3209877 0.008235892 2.9042443 26
## [8605] {bottled_beer,
## root_vegetables} => {bottled_water} 0.002541942 0.2631579 0.009659380 2.3810100 25
## [8606] {bottled_beer,
## bottled_water} => {soda} 0.005083884 0.3225806 0.015760041 1.8499013 50
## [8607] {bottled_beer,
## soda} => {bottled_water} 0.005083884 0.2994012 0.016980173 2.7089336 50
## [8608] {bottled_beer,
## yogurt} => {bottled_water} 0.002846975 0.3076923 0.009252669 2.7839502 28
## [8609] {bottled_beer,
## rolls/buns} => {bottled_water} 0.002948653 0.2164179 0.013624809 1.9581142 29
## [8610] {bottled_beer,
## bottled_water} => {other_vegetables} 0.004168785 0.2645161 0.015760041 1.3670605 41
## [8611] {bottled_beer,
## other_vegetables} => {bottled_water} 0.004168785 0.2578616 0.016166751 2.3330903 41
## [8612] {bottled_beer,
## bottled_water} => {whole_milk} 0.006100661 0.3870968 0.015760041 1.5149609 60
## [8613] {bottled_beer,
## whole_milk} => {bottled_water} 0.006100661 0.2985075 0.020437214 2.7008472 60
## [8614] {bottled_beer,
## tropical_fruit} => {root_vegetables} 0.002033554 0.2469136 0.008235892 2.2652939 20
## [8615] {bottled_beer,
## root_vegetables} => {tropical_fruit} 0.002033554 0.2105263 0.009659380 2.0063239 20
## [8616] {bottled_beer,
## tropical_fruit} => {soda} 0.002745297 0.3333333 0.008235892 1.9115646 27
## [8617] {bottled_beer,
## tropical_fruit} => {yogurt} 0.002338587 0.2839506 0.008235892 2.0354623 23
## [8618] {bottled_beer,
## yogurt} => {tropical_fruit} 0.002338587 0.2527473 0.009252669 2.4086911 23
## [8619] {bottled_beer,
## tropical_fruit} => {rolls/buns} 0.002236909 0.2716049 0.008235892 1.4766360 22
## [8620] {bottled_beer,
## tropical_fruit} => {other_vegetables} 0.003253686 0.3950617 0.008235892 2.0417405 32
## [8621] {bottled_beer,
## other_vegetables} => {tropical_fruit} 0.003253686 0.2012579 0.016166751 1.9179952 32
## [8622] {bottled_beer,
## tropical_fruit} => {whole_milk} 0.003152008 0.3827160 0.008235892 1.4978163 31
## [8623] {bottled_beer,
## root_vegetables} => {soda} 0.002338587 0.2421053 0.009659380 1.3883996 23
## [8624] {bottled_beer,
## root_vegetables} => {rolls/buns} 0.002440264 0.2526316 0.009659380 1.3734835 24
## [8625] {bottled_beer,
## root_vegetables} => {other_vegetables} 0.004270463 0.4421053 0.009659380 2.2848688 42
## [8626] {bottled_beer,
## other_vegetables} => {root_vegetables} 0.004270463 0.2641509 0.016166751 2.4234371 42
## [8627] {bottled_beer,
## root_vegetables} => {whole_milk} 0.003965430 0.4105263 0.009659380 1.6066559 39
## [8628] {bottled_beer,
## yogurt} => {soda} 0.002135231 0.2307692 0.009252669 1.3233909 21
## [8629] {bottled_beer,
## rolls/buns} => {soda} 0.002948653 0.2164179 0.013624809 1.2410905 29
## [8630] {bottled_beer,
## soda} => {other_vegetables} 0.004067107 0.2395210 0.016980173 1.2378816 40
## [8631] {bottled_beer,
## other_vegetables} => {soda} 0.004067107 0.2515723 0.016166751 1.4426903 40
## [8632] {bottled_beer,
## soda} => {whole_milk} 0.003660397 0.2155689 0.016980173 0.8436609 36
## [8633] {bottled_beer,
## yogurt} => {rolls/buns} 0.002338587 0.2527473 0.009252669 1.3741123 23
## [8634] {bottled_beer,
## yogurt} => {other_vegetables} 0.003660397 0.3956044 0.009252669 2.0445451 36
## [8635] {bottled_beer,
## other_vegetables} => {yogurt} 0.003660397 0.2264151 0.016166751 1.6230266 36
## [8636] {bottled_beer,
## yogurt} => {whole_milk} 0.005185562 0.5604396 0.009252669 2.1933637 51
## [8637] {bottled_beer,
## whole_milk} => {yogurt} 0.005185562 0.2537313 0.020437214 1.8188395 51
## [8638] {bottled_beer,
## rolls/buns} => {other_vegetables} 0.004067107 0.2985075 0.013624809 1.5427330 40
## [8639] {bottled_beer,
## other_vegetables} => {rolls/buns} 0.004067107 0.2515723 0.016166751 1.3677246 40
## [8640] {bottled_beer,
## rolls/buns} => {whole_milk} 0.005388917 0.3955224 0.013624809 1.5479358 53
## [8641] {bottled_beer,
## whole_milk} => {rolls/buns} 0.005388917 0.2636816 0.020437214 1.4335591 53
## [8642] {bottled_beer,
## other_vegetables} => {whole_milk} 0.007625826 0.4716981 0.016166751 1.8460609 75
## [8643] {bottled_beer,
## whole_milk} => {other_vegetables} 0.007625826 0.3731343 0.020437214 1.9284162 75
## [8644] {brown_bread,
## margarine} => {sausage} 0.001728521 0.2656250 0.006507372 2.8272964 17
## [8645] {margarine,
## sausage} => {brown_bread} 0.001728521 0.2428571 0.007117438 3.7437304 17
## [8646] {brown_bread,
## margarine} => {root_vegetables} 0.001321810 0.2031250 0.006507372 1.8635582 13
## [8647] {brown_bread,
## margarine} => {soda} 0.001626843 0.2500000 0.006507372 1.4336735 16
## [8648] {brown_bread,
## margarine} => {yogurt} 0.001525165 0.2343750 0.006507372 1.6800861 15
## [8649] {brown_bread,
## margarine} => {rolls/buns} 0.001525165 0.2343750 0.006507372 1.2742278 15
## [8650] {brown_bread,
## margarine} => {other_vegetables} 0.002338587 0.3593750 0.006507372 1.8573059 23
## [8651] {brown_bread,
## margarine} => {whole_milk} 0.003050330 0.4687500 0.006507372 1.8345230 30
## [8652] {brown_bread,
## butter} => {fruit/vegetable_juice} 0.001423488 0.2456140 0.005795628 3.3974881 14
## [8653] {brown_bread,
## whipped/sour_cream} => {butter} 0.001016777 0.2173913 0.004677173 3.9230156 10
## [8654] {brown_bread,
## butter} => {pastry} 0.001423488 0.2456140 0.005795628 2.7607018 14
## [8655] {brown_bread,
## butter} => {sausage} 0.001931876 0.3333333 0.005795628 3.5479798 19
## [8656] {butter,
## sausage} => {brown_bread} 0.001931876 0.2235294 0.008642603 3.4457865 19
## [8657] {brown_bread,
## butter} => {tropical_fruit} 0.001525165 0.2631579 0.005795628 2.5079049 15
## [8658] {brown_bread,
## butter} => {yogurt} 0.001830198 0.3157895 0.005795628 2.2636950 18
## [8659] {brown_bread,
## butter} => {rolls/buns} 0.001626843 0.2807018 0.005795628 1.5260927 16
## [8660] {brown_bread,
## butter} => {other_vegetables} 0.002338587 0.4035088 0.005795628 2.0853961 23
## [8661] {brown_bread,
## butter} => {whole_milk} 0.002948653 0.5087719 0.005795628 1.9911548 29
## [8662] {brown_bread,
## newspapers} => {pastry} 0.001626843 0.2133333 0.007625826 2.3978667 16
## [8663] {brown_bread,
## newspapers} => {soda} 0.001931876 0.2533333 0.007625826 1.4527891 19
## [8664] {brown_bread,
## newspapers} => {yogurt} 0.002033554 0.2666667 0.007625826 1.9115646 20
## [8665] {brown_bread,
## newspapers} => {rolls/buns} 0.001830198 0.2400000 0.007625826 1.3048093 18
## [8666] {brown_bread,
## newspapers} => {other_vegetables} 0.002338587 0.3066667 0.007625826 1.5849010 23
## [8667] {brown_bread,
## newspapers} => {whole_milk} 0.004067107 0.5333333 0.007625826 2.0872795 40
## [8668] {brown_bread,
## domestic_eggs} => {citrus_fruit} 0.001423488 0.2089552 0.006812405 2.5246617 14
## [8669] {brown_bread,
## domestic_eggs} => {shopping_bags} 0.001423488 0.2089552 0.006812405 2.1208200 14
## [8670] {brown_bread,
## domestic_eggs} => {tropical_fruit} 0.001423488 0.2089552 0.006812405 1.9913514 14
## [8671] {brown_bread,
## domestic_eggs} => {root_vegetables} 0.001830198 0.2686567 0.006812405 2.4647750 18
## [8672] {brown_bread,
## domestic_eggs} => {soda} 0.002440264 0.3582090 0.006812405 2.0542187 24
## [8673] {brown_bread,
## domestic_eggs} => {yogurt} 0.001525165 0.2238806 0.006812405 1.6048584 15
## [8674] {brown_bread,
## domestic_eggs} => {rolls/buns} 0.001728521 0.2537313 0.006812405 1.3794626 17
## [8675] {brown_bread,
## domestic_eggs} => {other_vegetables} 0.002541942 0.3731343 0.006812405 1.9284162 25
## [8676] {brown_bread,
## domestic_eggs} => {whole_milk} 0.004067107 0.5970149 0.006812405 2.3365069 40
## [8677] {brown_bread,
## fruit/vegetable_juice} => {pip_fruit} 0.001830198 0.2195122 0.008337570 2.9017506 18
## [8678] {brown_bread,
## pip_fruit} => {fruit/vegetable_juice} 0.001830198 0.2400000 0.007625826 3.3198312 18
## [8679] {brown_bread,
## fruit/vegetable_juice} => {pastry} 0.001728521 0.2073171 0.008337570 2.3302439 17
## [8680] {fruit/vegetable_juice,
## pastry} => {brown_bread} 0.001728521 0.2023810 0.008540925 3.1197753 17
## [8681] {brown_bread,
## fruit/vegetable_juice} => {sausage} 0.001830198 0.2195122 0.008337570 2.3364745 18
## [8682] {brown_bread,
## fruit/vegetable_juice} => {tropical_fruit} 0.002541942 0.3048780 0.008337570 2.9054996 25
## [8683] {brown_bread,
## tropical_fruit} => {fruit/vegetable_juice} 0.002541942 0.2380952 0.010676157 3.2934834 25
## [8684] {brown_bread,
## fruit/vegetable_juice} => {root_vegetables} 0.002236909 0.2682927 0.008337570 2.4614352 22
## [8685] {brown_bread,
## root_vegetables} => {fruit/vegetable_juice} 0.002236909 0.2200000 0.010167768 3.0431786 22
## [8686] {brown_bread,
## fruit/vegetable_juice} => {soda} 0.002440264 0.2926829 0.008337570 1.6784470 24
## [8687] {brown_bread,
## fruit/vegetable_juice} => {yogurt} 0.002948653 0.3536585 0.008337570 2.5351543 29
## [8688] {brown_bread,
## yogurt} => {fruit/vegetable_juice} 0.002948653 0.2027972 0.014539908 2.8052187 29
## [8689] {brown_bread,
## fruit/vegetable_juice} => {rolls/buns} 0.001728521 0.2073171 0.008337570 1.1271218 17
## [8690] {brown_bread,
## fruit/vegetable_juice} => {other_vegetables} 0.003457041 0.4146341 0.008337570 2.1428938 34
## [8691] {brown_bread,
## fruit/vegetable_juice} => {whole_milk} 0.003863752 0.4634146 0.008337570 1.8136422 38
## [8692] {brown_bread,
## whipped/sour_cream} => {pip_fruit} 0.001118454 0.2391304 0.004677173 3.1610858 11
## [8693] {brown_bread,
## whipped/sour_cream} => {citrus_fruit} 0.001016777 0.2173913 0.004677173 2.6265890 10
## [8694] {brown_bread,
## whipped/sour_cream} => {sausage} 0.001220132 0.2608696 0.004677173 2.7766798 12
## [8695] {brown_bread,
## whipped/sour_cream} => {root_vegetables} 0.001118454 0.2391304 0.004677173 2.1938879 11
## [8696] {brown_bread,
## whipped/sour_cream} => {yogurt} 0.001931876 0.4130435 0.004677173 2.9608474 19
## [8697] {brown_bread,
## whipped/sour_cream} => {other_vegetables} 0.003050330 0.6521739 0.004677173 3.3705362 30
## [8698] {brown_bread,
## whipped/sour_cream} => {whole_milk} 0.002338587 0.5000000 0.004677173 1.9568245 23
## [8699] {brown_bread,
## pip_fruit} => {citrus_fruit} 0.002135231 0.2800000 0.007625826 3.3830467 21
## [8700] {brown_bread,
## citrus_fruit} => {pip_fruit} 0.002135231 0.2560976 0.008337570 3.3853757 21
## [8701] {brown_bread,
## pip_fruit} => {sausage} 0.002033554 0.2666667 0.007625826 2.8383838 20
## [8702] {brown_bread,
## pip_fruit} => {tropical_fruit} 0.002440264 0.3200000 0.007625826 3.0496124 24
## [8703] {brown_bread,
## tropical_fruit} => {pip_fruit} 0.002440264 0.2285714 0.010676157 3.0215054 24
## [8704] {brown_bread,
## pip_fruit} => {root_vegetables} 0.001626843 0.2133333 0.007625826 1.9572139 16
## [8705] {brown_bread,
## pip_fruit} => {soda} 0.001830198 0.2400000 0.007625826 1.3763265 18
## [8706] {brown_bread,
## pip_fruit} => {yogurt} 0.002643620 0.3466667 0.007625826 2.4850340 26
## [8707] {brown_bread,
## pip_fruit} => {other_vegetables} 0.003762074 0.4933333 0.007625826 2.5496234 37
## [8708] {brown_bread,
## other_vegetables} => {pip_fruit} 0.003762074 0.2010870 0.018708693 2.6581858 37
## [8709] {brown_bread,
## pip_fruit} => {whole_milk} 0.003660397 0.4800000 0.007625826 1.8785515 36
## [8710] {brown_bread,
## pastry} => {soda} 0.002338587 0.2421053 0.009659380 1.3883996 23
## [8711] {brown_bread,
## pastry} => {yogurt} 0.003050330 0.3157895 0.009659380 2.2636950 30
## [8712] {brown_bread,
## yogurt} => {pastry} 0.003050330 0.2097902 0.014539908 2.3580420 30
## [8713] {brown_bread,
## pastry} => {rolls/buns} 0.002033554 0.2105263 0.009659380 1.1445695 20
## [8714] {brown_bread,
## pastry} => {other_vegetables} 0.003355363 0.3473684 0.009659380 1.7952540 33
## [8715] {brown_bread,
## pastry} => {whole_milk} 0.004778851 0.4947368 0.009659380 1.9362264 47
## [8716] {brown_bread,
## citrus_fruit} => {shopping_bags} 0.001728521 0.2073171 0.008337570 2.1041934 17
## [8717] {brown_bread,
## citrus_fruit} => {sausage} 0.002033554 0.2439024 0.008337570 2.5960828 20
## [8718] {brown_bread,
## citrus_fruit} => {tropical_fruit} 0.002541942 0.3048780 0.008337570 2.9054996 25
## [8719] {brown_bread,
## tropical_fruit} => {citrus_fruit} 0.002541942 0.2380952 0.010676157 2.8767404 25
## [8720] {brown_bread,
## citrus_fruit} => {root_vegetables} 0.002541942 0.3048780 0.008337570 2.7970855 25
## [8721] {brown_bread,
## root_vegetables} => {citrus_fruit} 0.002541942 0.2500000 0.010167768 3.0205774 25
## [8722] {brown_bread,
## citrus_fruit} => {soda} 0.001728521 0.2073171 0.008337570 1.1889000 17
## [8723] {brown_bread,
## citrus_fruit} => {yogurt} 0.002948653 0.3536585 0.008337570 2.5351543 29
## [8724] {brown_bread,
## yogurt} => {citrus_fruit} 0.002948653 0.2027972 0.014539908 2.4502586 29
## [8725] {brown_bread,
## citrus_fruit} => {other_vegetables} 0.003457041 0.4146341 0.008337570 2.1428938 34
## [8726] {brown_bread,
## citrus_fruit} => {whole_milk} 0.003660397 0.4390244 0.008337570 1.7181874 36
## [8727] {brown_bread,
## shopping_bags} => {sausage} 0.002033554 0.2197802 0.009252669 2.3393273 20
## [8728] {brown_bread,
## shopping_bags} => {soda} 0.003050330 0.3296703 0.009252669 1.8905584 30
## [8729] {brown_bread,
## soda} => {shopping_bags} 0.003050330 0.2419355 0.012608033 2.4555578 30
## [8730] {brown_bread,
## shopping_bags} => {yogurt} 0.002135231 0.2307692 0.009252669 1.6542386 21
## [8731] {brown_bread,
## shopping_bags} => {other_vegetables} 0.003050330 0.3296703 0.009252669 1.7037875 30
## [8732] {brown_bread,
## shopping_bags} => {whole_milk} 0.003558719 0.3846154 0.009252669 1.5052496 35
## [8733] {brown_bread,
## sausage} => {soda} 0.002643620 0.2476190 0.010676157 1.4200194 26
## [8734] {brown_bread,
## soda} => {sausage} 0.002643620 0.2096774 0.012608033 2.2317937 26
## [8735] {brown_bread,
## sausage} => {yogurt} 0.003863752 0.3619048 0.010676157 2.5942663 38
## [8736] {brown_bread,
## yogurt} => {sausage} 0.003863752 0.2657343 0.014539908 2.8284594 38
## [8737] {brown_bread,
## sausage} => {rolls/buns} 0.002745297 0.2571429 0.010676157 1.3980100 27
## [8738] {brown_bread,
## rolls/buns} => {sausage} 0.002745297 0.2177419 0.012608033 2.3176320 27
## [8739] {brown_bread,
## sausage} => {other_vegetables} 0.004473818 0.4190476 0.010676157 2.1657033 44
## [8740] {brown_bread,
## other_vegetables} => {sausage} 0.004473818 0.2391304 0.018708693 2.5452899 44
## [8741] {brown_bread,
## sausage} => {whole_milk} 0.004473818 0.4190476 0.010676157 1.6400053 44
## [8742] {bottled_water,
## brown_bread} => {soda} 0.002745297 0.3333333 0.008235892 1.9115646 27
## [8743] {brown_bread,
## soda} => {bottled_water} 0.002745297 0.2177419 0.012608033 1.9700938 27
## [8744] {bottled_water,
## brown_bread} => {yogurt} 0.002236909 0.2716049 0.008235892 1.9469640 22
## [8745] {bottled_water,
## brown_bread} => {rolls/buns} 0.002135231 0.2592593 0.008235892 1.4095162 21
## [8746] {bottled_water,
## brown_bread} => {other_vegetables} 0.002643620 0.3209877 0.008235892 1.6589141 26
## [8747] {bottled_water,
## brown_bread} => {whole_milk} 0.002745297 0.3333333 0.008235892 1.3045497 27
## [8748] {brown_bread,
## tropical_fruit} => {root_vegetables} 0.002643620 0.2476190 0.010676157 2.2717662 26
## [8749] {brown_bread,
## root_vegetables} => {tropical_fruit} 0.002643620 0.2600000 0.010167768 2.4778101 26
## [8750] {brown_bread,
## tropical_fruit} => {yogurt} 0.003965430 0.3714286 0.010676157 2.6625364 39
## [8751] {brown_bread,
## yogurt} => {tropical_fruit} 0.003965430 0.2727273 0.014539908 2.5991015 39
## [8752] {brown_bread,
## tropical_fruit} => {other_vegetables} 0.004168785 0.3904762 0.010676157 2.0180417 41
## [8753] {brown_bread,
## other_vegetables} => {tropical_fruit} 0.004168785 0.2228261 0.018708693 2.1235412 41
## [8754] {brown_bread,
## tropical_fruit} => {whole_milk} 0.005693950 0.5333333 0.010676157 2.0872795 56
## [8755] {brown_bread,
## whole_milk} => {tropical_fruit} 0.005693950 0.2258065 0.025216065 2.1519442 56
## [8756] {brown_bread,
## root_vegetables} => {yogurt} 0.003253686 0.3200000 0.010167768 2.2938776 32
## [8757] {brown_bread,
## yogurt} => {root_vegetables} 0.003253686 0.2237762 0.014539908 2.0530216 32
## [8758] {brown_bread,
## root_vegetables} => {rolls/buns} 0.002135231 0.2100000 0.010167768 1.1417081 21
## [8759] {brown_bread,
## root_vegetables} => {other_vegetables} 0.004067107 0.4000000 0.010167768 2.0672622 40
## [8760] {brown_bread,
## other_vegetables} => {root_vegetables} 0.004067107 0.2173913 0.018708693 1.9944435 40
## [8761] {brown_bread,
## root_vegetables} => {whole_milk} 0.005693950 0.5600000 0.010167768 2.1916435 56
## [8762] {brown_bread,
## whole_milk} => {root_vegetables} 0.005693950 0.2258065 0.025216065 2.0716478 56
## [8763] {brown_bread,
## soda} => {yogurt} 0.003152008 0.2500000 0.012608033 1.7920918 31
## [8764] {brown_bread,
## yogurt} => {soda} 0.003152008 0.2167832 0.014539908 1.2431854 31
## [8765] {brown_bread,
## soda} => {rolls/buns} 0.002948653 0.2338710 0.012608033 1.2714875 29
## [8766] {brown_bread,
## rolls/buns} => {soda} 0.002948653 0.2338710 0.012608033 1.3411784 29
## [8767] {brown_bread,
## soda} => {other_vegetables} 0.004168785 0.3306452 0.012608033 1.7088256 41
## [8768] {brown_bread,
## other_vegetables} => {soda} 0.004168785 0.2228261 0.018708693 1.2778394 41
## [8769] {brown_bread,
## soda} => {whole_milk} 0.005083884 0.4032258 0.012608033 1.5780843 50
## [8770] {brown_bread,
## whole_milk} => {soda} 0.005083884 0.2016129 0.025216065 1.1561883 50
## [8771] {brown_bread,
## yogurt} => {rolls/buns} 0.003152008 0.2167832 0.014539908 1.1785865 31
## [8772] {brown_bread,
## rolls/buns} => {yogurt} 0.003152008 0.2500000 0.012608033 1.7920918 31
## [8773] {brown_bread,
## yogurt} => {other_vegetables} 0.005185562 0.3566434 0.014539908 1.8431883 51
## [8774] {brown_bread,
## other_vegetables} => {yogurt} 0.005185562 0.2771739 0.018708693 1.9868844 51
## [8775] {brown_bread,
## yogurt} => {whole_milk} 0.007117438 0.4895105 0.014539908 1.9157723 70
## [8776] {brown_bread,
## whole_milk} => {yogurt} 0.007117438 0.2822581 0.025216065 2.0233295 70
## [8777] {brown_bread,
## rolls/buns} => {other_vegetables} 0.004067107 0.3225806 0.012608033 1.6671469 40
## [8778] {brown_bread,
## other_vegetables} => {rolls/buns} 0.004067107 0.2173913 0.018708693 1.1818925 40
## [8779] {brown_bread,
## rolls/buns} => {whole_milk} 0.005287239 0.4193548 0.012608033 1.6412077 52
## [8780] {brown_bread,
## whole_milk} => {rolls/buns} 0.005287239 0.2096774 0.025216065 1.1399544 52
## [8781] {brown_bread,
## other_vegetables} => {whole_milk} 0.009354347 0.5000000 0.018708693 1.9568245 92
## [8782] {brown_bread,
## whole_milk} => {other_vegetables} 0.009354347 0.3709677 0.025216065 1.9172190 92
## [8783] {butter,
## margarine} => {domestic_eggs} 0.001626843 0.2424242 0.006710727 3.8209013 16
## [8784] {butter,
## margarine} => {whipped/sour_cream} 0.001525165 0.2272727 0.006710727 3.1705351 15
## [8785] {margarine,
## whipped/sour_cream} => {butter} 0.001525165 0.2238806 0.006812405 4.0401205 15
## [8786] {butter,
## margarine} => {pip_fruit} 0.001423488 0.2121212 0.006710727 2.8040486 14
## [8787] {butter,
## margarine} => {citrus_fruit} 0.001525165 0.2272727 0.006710727 2.7459795 15
## [8788] {butter,
## margarine} => {sausage} 0.001525165 0.2272727 0.006710727 2.4190771 15
## [8789] {margarine,
## sausage} => {butter} 0.001525165 0.2142857 0.007117438 3.8669725 15
## [8790] {butter,
## margarine} => {root_vegetables} 0.001626843 0.2424242 0.006710727 2.2241067 16
## [8791] {butter,
## margarine} => {yogurt} 0.002440264 0.3636364 0.006710727 2.6066790 24
## [8792] {butter,
## margarine} => {rolls/buns} 0.002033554 0.3030303 0.006710727 1.6474865 20
## [8793] {butter,
## margarine} => {other_vegetables} 0.003558719 0.5303030 0.006710727 2.7406885 35
## [8794] {butter,
## margarine} => {whole_milk} 0.003050330 0.4545455 0.006710727 1.7789314 30
## [8795] {margarine,
## newspapers} => {bottled_water} 0.001626843 0.2285714 0.007117438 2.0680773 16
## [8796] {margarine,
## newspapers} => {soda} 0.001525165 0.2142857 0.007117438 1.2288630 15
## [8797] {margarine,
## newspapers} => {yogurt} 0.001525165 0.2142857 0.007117438 1.5360787 15
## [8798] {margarine,
## newspapers} => {rolls/buns} 0.002135231 0.3000000 0.007117438 1.6310116 21
## [8799] {margarine,
## newspapers} => {other_vegetables} 0.002236909 0.3142857 0.007117438 1.6242775 22
## [8800] {margarine,
## newspapers} => {whole_milk} 0.003152008 0.4428571 0.007117438 1.7331874 31
## [8801] {margarine,
## whipped/sour_cream} => {domestic_eggs} 0.001525165 0.2238806 0.006812405 3.5286309 15
## [8802] {domestic_eggs,
## margarine} => {pip_fruit} 0.001830198 0.2195122 0.008337570 2.9017506 18
## [8803] {margarine,
## pip_fruit} => {domestic_eggs} 0.001830198 0.2142857 0.008540925 3.3774038 18
## [8804] {domestic_eggs,
## pip_fruit} => {margarine} 0.001830198 0.2117647 0.008642603 3.6158088 18
## [8805] {citrus_fruit,
## margarine} => {domestic_eggs} 0.001626843 0.2051282 0.007930859 3.2330703 16
## [8806] {margarine,
## shopping_bags} => {domestic_eggs} 0.001220132 0.2142857 0.005693950 3.3774038 12
## [8807] {margarine,
## sausage} => {domestic_eggs} 0.001525165 0.2142857 0.007117438 3.3774038 15
## [8808] {domestic_eggs,
## margarine} => {bottled_water} 0.002135231 0.2560976 0.008337570 2.3171293 21
## [8809] {bottled_water,
## margarine} => {domestic_eggs} 0.002135231 0.2079208 0.010269446 3.2770849 21
## [8810] {bottled_water,
## domestic_eggs} => {margarine} 0.002135231 0.2333333 0.009150991 3.9840856 21
## [8811] {domestic_eggs,
## margarine} => {tropical_fruit} 0.002236909 0.2682927 0.008337570 2.5568397 22
## [8812] {margarine,
## tropical_fruit} => {domestic_eggs} 0.002236909 0.2391304 0.009354347 3.7689869 22
## [8813] {domestic_eggs,
## margarine} => {root_vegetables} 0.002541942 0.3048780 0.008337570 2.7970855 25
## [8814] {margarine,
## root_vegetables} => {domestic_eggs} 0.002541942 0.2293578 0.011082867 3.6149582 25
## [8815] {domestic_eggs,
## margarine} => {yogurt} 0.002236909 0.2682927 0.008337570 1.9232205 22
## [8816] {domestic_eggs,
## margarine} => {rolls/buns} 0.002440264 0.2926829 0.008337570 1.5912308 24
## [8817] {domestic_eggs,
## margarine} => {other_vegetables} 0.003965430 0.4756098 0.008337570 2.4580252 39
## [8818] {margarine,
## other_vegetables} => {domestic_eggs} 0.003965430 0.2010309 0.019725470 3.1684923 39
## [8819] {domestic_eggs,
## margarine} => {whole_milk} 0.005185562 0.6219512 0.008337570 2.4340988 51
## [8820] {margarine,
## whole_milk} => {domestic_eggs} 0.005185562 0.2142857 0.024199288 3.3774038 51
## [8821] {fruit/vegetable_juice,
## margarine} => {bottled_water} 0.001626843 0.2622951 0.006202339 2.3732034 16
## [8822] {fruit/vegetable_juice,
## margarine} => {tropical_fruit} 0.001423488 0.2295082 0.006202339 2.1872220 14
## [8823] {fruit/vegetable_juice,
## margarine} => {yogurt} 0.002338587 0.3770492 0.006202339 2.7028270 23
## [8824] {fruit/vegetable_juice,
## margarine} => {rolls/buns} 0.001321810 0.2131148 0.006202339 1.1586421 13
## [8825] {fruit/vegetable_juice,
## margarine} => {other_vegetables} 0.002541942 0.4098361 0.006202339 2.1180965 25
## [8826] {fruit/vegetable_juice,
## margarine} => {whole_milk} 0.003355363 0.5409836 0.006202339 2.1172200 33
## [8827] {margarine,
## whipped/sour_cream} => {tropical_fruit} 0.002135231 0.3134328 0.006812405 2.9870271 21
## [8828] {margarine,
## tropical_fruit} => {whipped/sour_cream} 0.002135231 0.2282609 0.009354347 3.1843201 21
## [8829] {margarine,
## whipped/sour_cream} => {root_vegetables} 0.002236909 0.3283582 0.006812405 3.0125028 22
## [8830] {margarine,
## root_vegetables} => {whipped/sour_cream} 0.002236909 0.2018349 0.011082867 2.8156679 22
## [8831] {margarine,
## whipped/sour_cream} => {yogurt} 0.003152008 0.4626866 0.006812405 3.3167073 31
## [8832] {margarine,
## yogurt} => {whipped/sour_cream} 0.003152008 0.2214286 0.014234875 3.0890071 31
## [8833] {margarine,
## whipped/sour_cream} => {rolls/buns} 0.001830198 0.2686567 0.006812405 1.4606074 18
## [8834] {margarine,
## whipped/sour_cream} => {other_vegetables} 0.003457041 0.5074627 0.006812405 2.6226461 34
## [8835] {margarine,
## whipped/sour_cream} => {whole_milk} 0.004067107 0.5970149 0.006812405 2.3365069 40
## [8836] {margarine,
## pip_fruit} => {bottled_water} 0.001830198 0.2142857 0.008540925 1.9388224 18
## [8837] {margarine,
## pip_fruit} => {tropical_fruit} 0.002338587 0.2738095 0.008540925 2.6094154 23
## [8838] {margarine,
## tropical_fruit} => {pip_fruit} 0.002338587 0.2500000 0.009354347 3.3047715 23
## [8839] {margarine,
## pip_fruit} => {root_vegetables} 0.002846975 0.3333333 0.008540925 3.0581468 28
## [8840] {margarine,
## root_vegetables} => {pip_fruit} 0.002846975 0.2568807 0.011082867 3.3957285 28
## [8841] {margarine,
## pip_fruit} => {yogurt} 0.002643620 0.3095238 0.008540925 2.2187804 26
## [8842] {margarine,
## pip_fruit} => {rolls/buns} 0.001830198 0.2142857 0.008540925 1.1650083 18
## [8843] {margarine,
## pip_fruit} => {other_vegetables} 0.003558719 0.4166667 0.008540925 2.1533981 35
## [8844] {margarine,
## pip_fruit} => {whole_milk} 0.003965430 0.4642857 0.008540925 1.8170513 39
## [8845] {margarine,
## pastry} => {tropical_fruit} 0.001728521 0.2537313 0.006812405 2.4180695 17
## [8846] {margarine,
## pastry} => {yogurt} 0.002541942 0.3731343 0.006812405 2.6747639 25
## [8847] {margarine,
## pastry} => {rolls/buns} 0.001931876 0.2835821 0.006812405 1.5417523 19
## [8848] {margarine,
## pastry} => {other_vegetables} 0.002440264 0.3582090 0.006812405 1.8512796 24
## [8849] {margarine,
## pastry} => {whole_milk} 0.003558719 0.5223881 0.006812405 2.0444435 35
## [8850] {margarine,
## sausage} => {citrus_fruit} 0.001525165 0.2142857 0.007117438 2.5890663 15
## [8851] {citrus_fruit,
## margarine} => {tropical_fruit} 0.001728521 0.2179487 0.007930859 2.0770597 17
## [8852] {citrus_fruit,
## margarine} => {root_vegetables} 0.002033554 0.2564103 0.007930859 2.3524206 20
## [8853] {citrus_fruit,
## margarine} => {yogurt} 0.002643620 0.3333333 0.007930859 2.3894558 26
## [8854] {citrus_fruit,
## margarine} => {rolls/buns} 0.001626843 0.2051282 0.007930859 1.1152216 16
## [8855] {citrus_fruit,
## margarine} => {other_vegetables} 0.002541942 0.3205128 0.007930859 1.6564601 25
## [8856] {citrus_fruit,
## margarine} => {whole_milk} 0.002948653 0.3717949 0.007930859 1.4550746 29
## [8857] {margarine,
## shopping_bags} => {yogurt} 0.001321810 0.2321429 0.005693950 1.6640853 13
## [8858] {margarine,
## shopping_bags} => {rolls/buns} 0.001525165 0.2678571 0.005693950 1.4562604 15
## [8859] {margarine,
## shopping_bags} => {other_vegetables} 0.002135231 0.3750000 0.005693950 1.9380583 21
## [8860] {margarine,
## shopping_bags} => {whole_milk} 0.002541942 0.4464286 0.005693950 1.7471647 25
## [8861] {margarine,
## sausage} => {root_vegetables} 0.001626843 0.2285714 0.007117438 2.0970149 16
## [8862] {margarine,
## sausage} => {soda} 0.001525165 0.2142857 0.007117438 1.2288630 15
## [8863] {margarine,
## sausage} => {yogurt} 0.002033554 0.2857143 0.007117438 2.0481050 20
## [8864] {margarine,
## sausage} => {rolls/buns} 0.002846975 0.4000000 0.007117438 2.1746821 28
## [8865] {margarine,
## sausage} => {other_vegetables} 0.002135231 0.3000000 0.007117438 1.5504467 21
## [8866] {margarine,
## sausage} => {whole_milk} 0.003355363 0.4714286 0.007117438 1.8450060 33
## [8867] {bottled_water,
## margarine} => {tropical_fruit} 0.002338587 0.2277228 0.010269446 2.1702068 23
## [8868] {margarine,
## tropical_fruit} => {bottled_water} 0.002338587 0.2500000 0.009354347 2.2619595 23
## [8869] {bottled_water,
## margarine} => {root_vegetables} 0.002846975 0.2772277 0.010269446 2.5434092 28
## [8870] {margarine,
## root_vegetables} => {bottled_water} 0.002846975 0.2568807 0.011082867 2.3242153 28
## [8871] {bottled_water,
## margarine} => {soda} 0.002440264 0.2376238 0.010269446 1.3626995 24
## [8872] {margarine,
## soda} => {bottled_water} 0.002440264 0.2400000 0.010167768 2.1714811 24
## [8873] {bottled_water,
## margarine} => {yogurt} 0.003558719 0.3465347 0.010269446 2.4840877 35
## [8874] {margarine,
## yogurt} => {bottled_water} 0.003558719 0.2500000 0.014234875 2.2619595 35
## [8875] {bottled_water,
## margarine} => {rolls/buns} 0.003558719 0.3465347 0.010269446 1.8840068 35
## [8876] {margarine,
## rolls/buns} => {bottled_water} 0.003558719 0.2413793 0.014743264 2.1839609 35
## [8877] {bottled_water,
## margarine} => {other_vegetables} 0.003457041 0.3366337 0.010269446 1.7397751 34
## [8878] {bottled_water,
## margarine} => {whole_milk} 0.004982206 0.4851485 0.010269446 1.8987010 49
## [8879] {margarine,
## whole_milk} => {bottled_water} 0.004982206 0.2058824 0.024199288 1.8627902 49
## [8880] {margarine,
## tropical_fruit} => {root_vegetables} 0.002338587 0.2500000 0.009354347 2.2936101 23
## [8881] {margarine,
## root_vegetables} => {tropical_fruit} 0.002338587 0.2110092 0.011082867 2.0109256 23
## [8882] {margarine,
## tropical_fruit} => {soda} 0.002033554 0.2173913 0.009354347 1.2466726 20
## [8883] {margarine,
## soda} => {tropical_fruit} 0.002033554 0.2000000 0.010167768 1.9060078 20
## [8884] {margarine,
## tropical_fruit} => {yogurt} 0.004067107 0.4347826 0.009354347 3.1166815 40
## [8885] {margarine,
## yogurt} => {tropical_fruit} 0.004067107 0.2857143 0.014234875 2.7228682 40
## [8886] {margarine,
## tropical_fruit} => {rolls/buns} 0.002948653 0.3152174 0.009354347 1.7137441 29
## [8887] {margarine,
## rolls/buns} => {tropical_fruit} 0.002948653 0.2000000 0.014743264 1.9060078 29
## [8888] {margarine,
## tropical_fruit} => {other_vegetables} 0.003965430 0.4239130 0.009354347 2.1908485 39
## [8889] {margarine,
## other_vegetables} => {tropical_fruit} 0.003965430 0.2010309 0.019725470 1.9158325 39
## [8890] {margarine,
## tropical_fruit} => {whole_milk} 0.004473818 0.4782609 0.009354347 1.8717452 44
## [8891] {margarine,
## root_vegetables} => {soda} 0.002236909 0.2018349 0.011082867 1.1574611 22
## [8892] {margarine,
## soda} => {root_vegetables} 0.002236909 0.2200000 0.010167768 2.0183769 22
## [8893] {margarine,
## root_vegetables} => {yogurt} 0.003457041 0.3119266 0.011082867 2.2360045 34
## [8894] {margarine,
## yogurt} => {root_vegetables} 0.003457041 0.2428571 0.014234875 2.2280784 34
## [8895] {margarine,
## root_vegetables} => {rolls/buns} 0.002846975 0.2568807 0.011082867 1.3965849 28
## [8896] {margarine,
## root_vegetables} => {other_vegetables} 0.005897306 0.5321101 0.011082867 2.7500277 58
## [8897] {margarine,
## other_vegetables} => {root_vegetables} 0.005897306 0.2989691 0.019725470 2.7428739 58
## [8898] {margarine,
## root_vegetables} => {whole_milk} 0.004982206 0.4495413 0.011082867 1.7593468 49
## [8899] {margarine,
## whole_milk} => {root_vegetables} 0.004982206 0.2058824 0.024199288 1.8888554 49
## [8900] {margarine,
## soda} => {yogurt} 0.002846975 0.2800000 0.010167768 2.0071429 28
## [8901] {margarine,
## yogurt} => {soda} 0.002846975 0.2000000 0.014234875 1.1469388 28
## [8902] {margarine,
## soda} => {rolls/buns} 0.003152008 0.3100000 0.010167768 1.6853787 31
## [8903] {margarine,
## rolls/buns} => {soda} 0.003152008 0.2137931 0.014743264 1.2260380 31
## [8904] {margarine,
## soda} => {other_vegetables} 0.002643620 0.2600000 0.010167768 1.3437204 26
## [8905] {margarine,
## soda} => {whole_milk} 0.003762074 0.3700000 0.010167768 1.4480501 37
## [8906] {margarine,
## yogurt} => {rolls/buns} 0.004575496 0.3214286 0.014234875 1.7475124 45
## [8907] {margarine,
## rolls/buns} => {yogurt} 0.004575496 0.3103448 0.014743264 2.2246657 45
## [8908] {margarine,
## yogurt} => {other_vegetables} 0.005693950 0.4000000 0.014234875 2.0672622 56
## [8909] {margarine,
## other_vegetables} => {yogurt} 0.005693950 0.2886598 0.019725470 2.0692194 56
## [8910] {margarine,
## yogurt} => {whole_milk} 0.007015760 0.4928571 0.014234875 1.9288699 69
## [8911] {margarine,
## whole_milk} => {yogurt} 0.007015760 0.2899160 0.024199288 2.0782241 69
## [8912] {margarine,
## rolls/buns} => {other_vegetables} 0.005185562 0.3517241 0.014743264 1.8177651 51
## [8913] {margarine,
## other_vegetables} => {rolls/buns} 0.005185562 0.2628866 0.019725470 1.4292370 51
## [8914] {margarine,
## rolls/buns} => {whole_milk} 0.007930859 0.5379310 0.014743264 2.1052733 78
## [8915] {margarine,
## whole_milk} => {rolls/buns} 0.007930859 0.3277311 0.024199288 1.7817774 78
## [8916] {margarine,
## other_vegetables} => {whole_milk} 0.009252669 0.4690722 0.019725470 1.8357838 91
## [8917] {margarine,
## whole_milk} => {other_vegetables} 0.009252669 0.3823529 0.024199288 1.9760595 91
## [8918] {butter,
## newspapers} => {fruit/vegetable_juice} 0.001220132 0.2105263 0.005795628 2.9121327 12
## [8919] {butter,
## newspapers} => {citrus_fruit} 0.001423488 0.2456140 0.005795628 2.9675848 14
## [8920] {butter,
## newspapers} => {tropical_fruit} 0.001321810 0.2280702 0.005795628 2.1735176 13
## [8921] {butter,
## newspapers} => {root_vegetables} 0.001423488 0.2456140 0.005795628 2.2533713 14
## [8922] {butter,
## newspapers} => {soda} 0.001626843 0.2807018 0.005795628 1.6097386 16
## [8923] {butter,
## newspapers} => {yogurt} 0.002033554 0.3508772 0.005795628 2.5152166 20
## [8924] {butter,
## newspapers} => {rolls/buns} 0.001728521 0.2982456 0.005795628 1.6214735 17
## [8925] {butter,
## newspapers} => {other_vegetables} 0.002135231 0.3684211 0.005795628 1.9040573 21
## [8926] {butter,
## newspapers} => {whole_milk} 0.003152008 0.5438596 0.005795628 2.1284758 31
## [8927] {butter,
## domestic_eggs} => {whipped/sour_cream} 0.001931876 0.2000000 0.009659380 2.7900709 19
## [8928] {butter,
## shopping_bags} => {domestic_eggs} 0.001016777 0.2040816 0.004982206 3.2165751 10
## [8929] {butter,
## domestic_eggs} => {sausage} 0.002033554 0.2105263 0.009659380 2.2408293 20
## [8930] {butter,
## sausage} => {domestic_eggs} 0.002033554 0.2352941 0.008642603 3.7085219 20
## [8931] {domestic_eggs,
## sausage} => {butter} 0.002033554 0.2127660 0.009557702 3.8395471 20
## [8932] {butter,
## domestic_eggs} => {bottled_water} 0.001931876 0.2000000 0.009659380 1.8095676 19
## [8933] {bottled_water,
## butter} => {domestic_eggs} 0.001931876 0.2159091 0.008947636 3.4029902 19
## [8934] {bottled_water,
## domestic_eggs} => {butter} 0.001931876 0.2111111 0.009150991 3.8096840 19
## [8935] {butter,
## domestic_eggs} => {tropical_fruit} 0.002338587 0.2421053 0.009659380 2.3072725 23
## [8936] {butter,
## tropical_fruit} => {domestic_eggs} 0.002338587 0.2346939 0.009964413 3.6990614 23
## [8937] {domestic_eggs,
## tropical_fruit} => {butter} 0.002338587 0.2053571 0.011387900 3.7058486 23
## [8938] {butter,
## domestic_eggs} => {root_vegetables} 0.003253686 0.3368421 0.009659380 3.0903378 32
## [8939] {butter,
## root_vegetables} => {domestic_eggs} 0.003253686 0.2519685 0.012913066 3.9713305 32
## [8940] {domestic_eggs,
## root_vegetables} => {butter} 0.003253686 0.2269504 0.014336553 4.0955169 32
## [8941] {butter,
## domestic_eggs} => {yogurt} 0.002948653 0.3052632 0.009659380 2.1882385 29
## [8942] {butter,
## yogurt} => {domestic_eggs} 0.002948653 0.2013889 0.014641586 3.1741342 29
## [8943] {domestic_eggs,
## yogurt} => {butter} 0.002948653 0.2056738 0.014336553 3.7115622 29
## [8944] {butter,
## domestic_eggs} => {rolls/buns} 0.002541942 0.2631579 0.009659380 1.4307119 25
## [8945] {butter,
## domestic_eggs} => {other_vegetables} 0.004575496 0.4736842 0.009659380 2.4480737 45
## [8946] {butter,
## other_vegetables} => {domestic_eggs} 0.004575496 0.2284264 0.020030503 3.6002782 45
## [8947] {domestic_eggs,
## other_vegetables} => {butter} 0.004575496 0.2054795 0.022267412 3.7080558 45
## [8948] {butter,
## domestic_eggs} => {whole_milk} 0.005998983 0.6210526 0.009659380 2.4305820 59
## [8949] {butter,
## whole_milk} => {domestic_eggs} 0.005998983 0.2177122 0.027554652 3.4314091 59
## [8950] {domestic_eggs,
## whole_milk} => {butter} 0.005998983 0.2000000 0.029994916 3.6091743 59
## [8951] {butter,
## fruit/vegetable_juice} => {whipped/sour_cream} 0.002135231 0.2658228 0.008032537 3.7083221 21
## [8952] {butter,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.002135231 0.2100000 0.010167768 2.9048523 21
## [8953] {fruit/vegetable_juice,
## whipped/sour_cream} => {butter} 0.002135231 0.2359551 0.009049314 4.2580146 21
## [8954] {butter,
## shopping_bags} => {fruit/vegetable_juice} 0.001016777 0.2040816 0.004982206 2.8229857 10
## [8955] {butter,
## fruit/vegetable_juice} => {sausage} 0.002033554 0.2531646 0.008032537 2.6946682 20
## [8956] {butter,
## sausage} => {fruit/vegetable_juice} 0.002033554 0.2352941 0.008642603 3.2547365 20
## [8957] {fruit/vegetable_juice,
## sausage} => {butter} 0.002033554 0.2020202 0.010066090 3.6456306 20
## [8958] {butter,
## fruit/vegetable_juice} => {bottled_water} 0.001626843 0.2025316 0.008032537 1.8324735 16
## [8959] {butter,
## fruit/vegetable_juice} => {tropical_fruit} 0.002541942 0.3164557 0.008032537 3.0158351 25
## [8960] {butter,
## tropical_fruit} => {fruit/vegetable_juice} 0.002541942 0.2551020 0.009964413 3.5287322 25
## [8961] {butter,
## fruit/vegetable_juice} => {root_vegetables} 0.002033554 0.2531646 0.008032537 2.3226431 20
## [8962] {butter,
## fruit/vegetable_juice} => {soda} 0.002033554 0.2531646 0.008032537 1.4518212 20
## [8963] {butter,
## soda} => {fruit/vegetable_juice} 0.002033554 0.2298851 0.008845958 3.1799150 20
## [8964] {butter,
## fruit/vegetable_juice} => {yogurt} 0.003558719 0.4430380 0.008032537 3.1758590 35
## [8965] {butter,
## yogurt} => {fruit/vegetable_juice} 0.003558719 0.2430556 0.014641586 3.3620976 35
## [8966] {butter,
## fruit/vegetable_juice} => {rolls/buns} 0.001728521 0.2151899 0.008032537 1.1699239 17
## [8967] {butter,
## fruit/vegetable_juice} => {other_vegetables} 0.003355363 0.4177215 0.008032537 2.1588498 33
## [8968] {butter,
## fruit/vegetable_juice} => {whole_milk} 0.004168785 0.5189873 0.008032537 2.0311343 41
## [8969] {butter,
## whipped/sour_cream} => {pip_fruit} 0.002033554 0.2000000 0.010167768 2.6438172 20
## [8970] {butter,
## pip_fruit} => {whipped/sour_cream} 0.002033554 0.2777778 0.007320793 3.8750985 20
## [8971] {pip_fruit,
## whipped/sour_cream} => {butter} 0.002033554 0.2197802 0.009252669 3.9661256 20
## [8972] {butter,
## pastry} => {whipped/sour_cream} 0.001830198 0.2400000 0.007625826 3.3480851 18
## [8973] {pastry,
## whipped/sour_cream} => {butter} 0.001830198 0.2432432 0.007524148 4.3895363 18
## [8974] {butter,
## whipped/sour_cream} => {citrus_fruit} 0.002338587 0.2300000 0.010167768 2.7789312 23
## [8975] {butter,
## citrus_fruit} => {whipped/sour_cream} 0.002338587 0.2555556 0.009150991 3.5650906 23
## [8976] {citrus_fruit,
## whipped/sour_cream} => {butter} 0.002338587 0.2149533 0.010879512 3.8790191 23
## [8977] {butter,
## whipped/sour_cream} => {sausage} 0.002541942 0.2500000 0.010167768 2.6609848 25
## [8978] {butter,
## sausage} => {whipped/sour_cream} 0.002541942 0.2941176 0.008642603 4.1030455 25
## [8979] {sausage,
## whipped/sour_cream} => {butter} 0.002541942 0.2808989 0.009049314 5.0690650 25
## [8980] {butter,
## whipped/sour_cream} => {tropical_fruit} 0.003050330 0.3000000 0.010167768 2.8590116 30
## [8981] {butter,
## tropical_fruit} => {whipped/sour_cream} 0.003050330 0.3061224 0.009964413 4.2705167 30
## [8982] {tropical_fruit,
## whipped/sour_cream} => {butter} 0.003050330 0.2205882 0.013828165 3.9807070 30
## [8983] {butter,
## whipped/sour_cream} => {root_vegetables} 0.003457041 0.3400000 0.010167768 3.1193097 34
## [8984] {butter,
## root_vegetables} => {whipped/sour_cream} 0.003457041 0.2677165 0.012913066 3.7347406 34
## [8985] {root_vegetables,
## whipped/sour_cream} => {butter} 0.003457041 0.2023810 0.017081851 3.6521407 34
## [8986] {butter,
## whipped/sour_cream} => {yogurt} 0.003863752 0.3800000 0.010167768 2.7239796 38
## [8987] {butter,
## yogurt} => {whipped/sour_cream} 0.003863752 0.2638889 0.014641586 3.6813436 38
## [8988] {butter,
## whipped/sour_cream} => {rolls/buns} 0.002745297 0.2700000 0.010167768 1.4679104 27
## [8989] {butter,
## rolls/buns} => {whipped/sour_cream} 0.002745297 0.2045455 0.013421454 2.8534816 27
## [8990] {butter,
## whipped/sour_cream} => {other_vegetables} 0.005795628 0.5700000 0.010167768 2.9458487 57
## [8991] {butter,
## other_vegetables} => {whipped/sour_cream} 0.005795628 0.2893401 0.020030503 4.0363970 57
## [8992] {other_vegetables,
## whipped/sour_cream} => {butter} 0.005795628 0.2007042 0.028876462 3.6218827 57
## [8993] {butter,
## whipped/sour_cream} => {whole_milk} 0.006710727 0.6600000 0.010167768 2.5830084 66
## [8994] {butter,
## whole_milk} => {whipped/sour_cream} 0.006710727 0.2435424 0.027554652 3.3975033 66
## [8995] {whipped/sour_cream,
## whole_milk} => {butter} 0.006710727 0.2082019 0.032231825 3.7571846 66
## [8996] {butter,
## pip_fruit} => {citrus_fruit} 0.001728521 0.2361111 0.007320793 2.8527675 17
## [8997] {butter,
## pip_fruit} => {sausage} 0.001728521 0.2361111 0.007320793 2.5131524 17
## [8998] {butter,
## sausage} => {pip_fruit} 0.001728521 0.2000000 0.008642603 2.6438172 17
## [8999] {butter,
## pip_fruit} => {bottled_water} 0.001626843 0.2222222 0.007320793 2.0106307 16
## [9000] {butter,
## pip_fruit} => {tropical_fruit} 0.001728521 0.2361111 0.007320793 2.2501480 17
## [9001] {butter,
## pip_fruit} => {root_vegetables} 0.002135231 0.2916667 0.007320793 2.6758784 21
## [9002] {butter,
## pip_fruit} => {yogurt} 0.002338587 0.3194444 0.007320793 2.2898951 23
## [9003] {butter,
## pip_fruit} => {rolls/buns} 0.001525165 0.2083333 0.007320793 1.1326470 15
## [9004] {butter,
## pip_fruit} => {other_vegetables} 0.004067107 0.5555556 0.007320793 2.8711975 40
## [9005] {butter,
## other_vegetables} => {pip_fruit} 0.004067107 0.2030457 0.020030503 2.6840784 40
## [9006] {butter,
## pip_fruit} => {whole_milk} 0.004473818 0.6111111 0.007320793 2.3916744 44
## [9007] {butter,
## shopping_bags} => {pastry} 0.001321810 0.2653061 0.004982206 2.9820408 13
## [9008] {butter,
## pastry} => {sausage} 0.001931876 0.2533333 0.007625826 2.6964646 19
## [9009] {butter,
## sausage} => {pastry} 0.001931876 0.2235294 0.008642603 2.5124706 19
## [9010] {butter,
## pastry} => {tropical_fruit} 0.001626843 0.2133333 0.007625826 2.0330749 16
## [9011] {butter,
## pastry} => {soda} 0.002033554 0.2666667 0.007625826 1.5292517 20
## [9012] {butter,
## soda} => {pastry} 0.002033554 0.2298851 0.008845958 2.5839080 20
## [9013] {butter,
## pastry} => {yogurt} 0.002033554 0.2666667 0.007625826 1.9115646 20
## [9014] {butter,
## pastry} => {rolls/buns} 0.002236909 0.2933333 0.007625826 1.5947669 22
## [9015] {butter,
## pastry} => {other_vegetables} 0.003863752 0.5066667 0.007625826 2.6185321 38
## [9016] {butter,
## pastry} => {whole_milk} 0.003965430 0.5200000 0.007625826 2.0350975 39
## [9017] {butter,
## citrus_fruit} => {bottled_water} 0.001931876 0.2111111 0.009150991 1.9100992 19
## [9018] {bottled_water,
## butter} => {citrus_fruit} 0.001931876 0.2159091 0.008947636 2.6086805 19
## [9019] {butter,
## citrus_fruit} => {tropical_fruit} 0.002033554 0.2222222 0.009150991 2.1177864 20
## [9020] {butter,
## tropical_fruit} => {citrus_fruit} 0.002033554 0.2040816 0.009964413 2.4657775 20
## [9021] {butter,
## citrus_fruit} => {root_vegetables} 0.002643620 0.2888889 0.009150991 2.6503939 26
## [9022] {butter,
## root_vegetables} => {citrus_fruit} 0.002643620 0.2047244 0.012913066 2.4735437 26
## [9023] {butter,
## citrus_fruit} => {yogurt} 0.003050330 0.3333333 0.009150991 2.3894558 30
## [9024] {butter,
## yogurt} => {citrus_fruit} 0.003050330 0.2083333 0.014641586 2.5171478 30
## [9025] {butter,
## citrus_fruit} => {rolls/buns} 0.001931876 0.2111111 0.009150991 1.1477489 19
## [9026] {butter,
## citrus_fruit} => {other_vegetables} 0.004575496 0.5000000 0.009150991 2.5840778 45
## [9027] {butter,
## other_vegetables} => {citrus_fruit} 0.004575496 0.2284264 0.020030503 2.7599184 45
## [9028] {butter,
## citrus_fruit} => {whole_milk} 0.005083884 0.5555556 0.009150991 2.1742495 50
## [9029] {butter,
## shopping_bags} => {tropical_fruit} 0.001118454 0.2244898 0.004982206 2.1393965 11
## [9030] {butter,
## shopping_bags} => {yogurt} 0.001423488 0.2857143 0.004982206 2.0481050 14
## [9031] {butter,
## shopping_bags} => {rolls/buns} 0.001016777 0.2040816 0.004982206 1.1095317 10
## [9032] {butter,
## shopping_bags} => {other_vegetables} 0.001626843 0.3265306 0.004982206 1.6875610 16
## [9033] {butter,
## shopping_bags} => {whole_milk} 0.002135231 0.4285714 0.004982206 1.6772782 21
## [9034] {butter,
## sausage} => {tropical_fruit} 0.002338587 0.2705882 0.008642603 2.5787164 23
## [9035] {butter,
## tropical_fruit} => {sausage} 0.002338587 0.2346939 0.009964413 2.4980674 23
## [9036] {butter,
## sausage} => {root_vegetables} 0.002236909 0.2588235 0.008642603 2.3745610 22
## [9037] {butter,
## sausage} => {soda} 0.001728521 0.2000000 0.008642603 1.1469388 17
## [9038] {butter,
## sausage} => {yogurt} 0.002541942 0.2941176 0.008642603 2.1083433 25
## [9039] {butter,
## sausage} => {rolls/buns} 0.002338587 0.2705882 0.008642603 1.4711085 23
## [9040] {butter,
## sausage} => {other_vegetables} 0.003863752 0.4470588 0.008642603 2.3104695 38
## [9041] {butter,
## sausage} => {whole_milk} 0.004778851 0.5529412 0.008642603 2.1640177 47
## [9042] {bottled_water,
## butter} => {tropical_fruit} 0.002135231 0.2386364 0.008947636 2.2742138 21
## [9043] {butter,
## tropical_fruit} => {bottled_water} 0.002135231 0.2142857 0.009964413 1.9388224 21
## [9044] {bottled_water,
## butter} => {root_vegetables} 0.003355363 0.3750000 0.008947636 3.4404151 33
## [9045] {butter,
## root_vegetables} => {bottled_water} 0.003355363 0.2598425 0.012913066 2.3510130 33
## [9046] {bottled_water,
## root_vegetables} => {butter} 0.003355363 0.2142857 0.015658363 3.8669725 33
## [9047] {bottled_water,
## butter} => {soda} 0.002135231 0.2386364 0.008947636 1.3685065 21
## [9048] {butter,
## soda} => {bottled_water} 0.002135231 0.2413793 0.008845958 2.1839609 21
## [9049] {bottled_water,
## butter} => {yogurt} 0.002440264 0.2727273 0.008947636 1.9550093 24
## [9050] {bottled_water,
## butter} => {rolls/buns} 0.001931876 0.2159091 0.008947636 1.1738341 19
## [9051] {bottled_water,
## butter} => {other_vegetables} 0.003660397 0.4090909 0.008947636 2.1142454 36
## [9052] {bottled_water,
## butter} => {whole_milk} 0.005388917 0.6022727 0.008947636 2.3570841 53
## [9053] {butter,
## tropical_fruit} => {root_vegetables} 0.003558719 0.3571429 0.009964413 3.2765858 35
## [9054] {butter,
## root_vegetables} => {tropical_fruit} 0.003558719 0.2755906 0.012913066 2.6263886 35
## [9055] {butter,
## tropical_fruit} => {yogurt} 0.004575496 0.4591837 0.009964413 3.2915973 45
## [9056] {butter,
## yogurt} => {tropical_fruit} 0.004575496 0.3125000 0.014641586 2.9781371 45
## [9057] {butter,
## tropical_fruit} => {rolls/buns} 0.002541942 0.2551020 0.009964413 1.3869146 25
## [9058] {butter,
## tropical_fruit} => {other_vegetables} 0.005490595 0.5510204 0.009964413 2.8477592 54
## [9059] {butter,
## other_vegetables} => {tropical_fruit} 0.005490595 0.2741117 0.020030503 2.6122949 54
## [9060] {butter,
## tropical_fruit} => {whole_milk} 0.006202339 0.6224490 0.009964413 2.4360468 61
## [9061] {butter,
## whole_milk} => {tropical_fruit} 0.006202339 0.2250923 0.027554652 2.1451379 61
## [9062] {butter,
## soda} => {root_vegetables} 0.002135231 0.2413793 0.008845958 2.2145201 21
## [9063] {butter,
## root_vegetables} => {yogurt} 0.003863752 0.2992126 0.012913066 2.1448658 38
## [9064] {butter,
## yogurt} => {root_vegetables} 0.003863752 0.2638889 0.014641586 2.4210329 38
## [9065] {butter,
## root_vegetables} => {rolls/buns} 0.003863752 0.2992126 0.012913066 1.6267307 38
## [9066] {butter,
## rolls/buns} => {root_vegetables} 0.003863752 0.2878788 0.013421454 2.6411268 38
## [9067] {butter,
## root_vegetables} => {other_vegetables} 0.006609049 0.5118110 0.012913066 2.6451190 65
## [9068] {butter,
## other_vegetables} => {root_vegetables} 0.006609049 0.3299492 0.020030503 3.0270996 65
## [9069] {butter,
## root_vegetables} => {whole_milk} 0.008235892 0.6377953 0.012913066 2.4961069 81
## [9070] {butter,
## whole_milk} => {root_vegetables} 0.008235892 0.2988930 0.027554652 2.7421759 81
## [9071] {butter,
## soda} => {yogurt} 0.002338587 0.2643678 0.008845958 1.8950856 23
## [9072] {butter,
## soda} => {rolls/buns} 0.002541942 0.2873563 0.008845958 1.5622717 25
## [9073] {butter,
## soda} => {other_vegetables} 0.003558719 0.4022989 0.008845958 2.0791430 35
## [9074] {butter,
## soda} => {whole_milk} 0.003050330 0.3448276 0.008845958 1.3495341 30
## [9075] {butter,
## yogurt} => {rolls/buns} 0.004473818 0.3055556 0.014641586 1.6612155 44
## [9076] {butter,
## rolls/buns} => {yogurt} 0.004473818 0.3333333 0.013421454 2.3894558 44
## [9077] {butter,
## yogurt} => {other_vegetables} 0.006405694 0.4375000 0.014641586 2.2610681 63
## [9078] {butter,
## other_vegetables} => {yogurt} 0.006405694 0.3197970 0.020030503 2.2924220 63
## [9079] {butter,
## yogurt} => {whole_milk} 0.009354347 0.6388889 0.014641586 2.5003869 92
## [9080] {butter,
## whole_milk} => {yogurt} 0.009354347 0.3394834 0.027554652 2.4335417 92
## [9081] {butter,
## rolls/buns} => {other_vegetables} 0.005693950 0.4242424 0.013421454 2.1925508 56
## [9082] {butter,
## other_vegetables} => {rolls/buns} 0.005693950 0.2842640 0.020030503 1.5454594 56
## [9083] {butter,
## rolls/buns} => {whole_milk} 0.006609049 0.4924242 0.013421454 1.9271757 65
## [9084] {butter,
## whole_milk} => {rolls/buns} 0.006609049 0.2398524 0.027554652 1.3040068 65
## [9085] {butter,
## other_vegetables} => {whole_milk} 0.011489578 0.5736041 0.020030503 2.2448850 113
## [9086] {butter,
## whole_milk} => {other_vegetables} 0.011489578 0.4169742 0.027554652 2.1549874 113
## [9087] {domestic_eggs,
## newspapers} => {sausage} 0.001830198 0.2647059 0.006914082 2.8175134 18
## [9088] {newspapers,
## sausage} => {domestic_eggs} 0.001830198 0.2278481 0.008032537 3.5911636 18
## [9089] {domestic_eggs,
## newspapers} => {bottled_water} 0.001423488 0.2058824 0.006914082 1.8627902 14
## [9090] {domestic_eggs,
## newspapers} => {root_vegetables} 0.001728521 0.2500000 0.006914082 2.2936101 17
## [9091] {domestic_eggs,
## newspapers} => {yogurt} 0.001525165 0.2205882 0.006914082 1.5812575 15
## [9092] {domestic_eggs,
## newspapers} => {other_vegetables} 0.002440264 0.3529412 0.006914082 1.8240549 24
## [9093] {domestic_eggs,
## newspapers} => {whole_milk} 0.002948653 0.4264706 0.006914082 1.6690562 29
## [9094] {fruit/vegetable_juice,
## newspapers} => {bottled_water} 0.001830198 0.2222222 0.008235892 2.0106307 18
## [9095] {fruit/vegetable_juice,
## newspapers} => {soda} 0.002440264 0.2962963 0.008235892 1.6991686 24
## [9096] {fruit/vegetable_juice,
## newspapers} => {yogurt} 0.002338587 0.2839506 0.008235892 2.0354623 23
## [9097] {fruit/vegetable_juice,
## newspapers} => {rolls/buns} 0.002033554 0.2469136 0.008235892 1.3423964 20
## [9098] {fruit/vegetable_juice,
## newspapers} => {other_vegetables} 0.002135231 0.2592593 0.008235892 1.3398922 21
## [9099] {fruit/vegetable_juice,
## newspapers} => {whole_milk} 0.002135231 0.2592593 0.008235892 1.0146497 21
## [9100] {newspapers,
## whipped/sour_cream} => {tropical_fruit} 0.001525165 0.2112676 0.007219115 2.0133885 15
## [9101] {newspapers,
## whipped/sour_cream} => {root_vegetables} 0.001830198 0.2535211 0.007219115 2.3259144 18
## [9102] {newspapers,
## whipped/sour_cream} => {yogurt} 0.002745297 0.3802817 0.007219115 2.7259989 27
## [9103] {newspapers,
## whipped/sour_cream} => {rolls/buns} 0.001931876 0.2676056 0.007219115 1.4548930 19
## [9104] {newspapers,
## whipped/sour_cream} => {other_vegetables} 0.003253686 0.4507042 0.007219115 2.3293095 32
## [9105] {newspapers,
## whipped/sour_cream} => {whole_milk} 0.002846975 0.3943662 0.007219115 1.5434109 28
## [9106] {newspapers,
## pip_fruit} => {bottled_water} 0.001728521 0.2575758 0.006710727 2.3305037 17
## [9107] {newspapers,
## pip_fruit} => {tropical_fruit} 0.001728521 0.2575758 0.006710727 2.4547070 17
## [9108] {newspapers,
## pip_fruit} => {root_vegetables} 0.001626843 0.2424242 0.006710727 2.2241067 16
## [9109] {newspapers,
## pip_fruit} => {yogurt} 0.001931876 0.2878788 0.006710727 2.0636209 19
## [9110] {newspapers,
## pip_fruit} => {rolls/buns} 0.002135231 0.3181818 0.006710727 1.7298608 21
## [9111] {newspapers,
## pip_fruit} => {other_vegetables} 0.001525165 0.2272727 0.006710727 1.1745808 15
## [9112] {newspapers,
## pip_fruit} => {whole_milk} 0.002643620 0.3939394 0.006710727 1.5417405 26
## [9113] {newspapers,
## shopping_bags} => {pastry} 0.001525165 0.2205882 0.006914082 2.4794118 15
## [9114] {newspapers,
## pastry} => {soda} 0.002236909 0.2650602 0.008439248 1.5200393 22
## [9115] {newspapers,
## pastry} => {yogurt} 0.001830198 0.2168675 0.008439248 1.5545857 18
## [9116] {newspapers,
## pastry} => {rolls/buns} 0.002948653 0.3493976 0.008439248 1.8995718 29
## [9117] {newspapers,
## pastry} => {other_vegetables} 0.002440264 0.2891566 0.008439248 1.4944064 24
## [9118] {newspapers,
## pastry} => {whole_milk} 0.003863752 0.4578313 0.008439248 1.7917911 38
## [9119] {newspapers,
## sausage} => {citrus_fruit} 0.001626843 0.2025316 0.008032537 2.4470500 16
## [9120] {citrus_fruit,
## newspapers} => {tropical_fruit} 0.001931876 0.2317073 0.008337570 2.2081797 19
## [9121] {citrus_fruit,
## newspapers} => {root_vegetables} 0.001931876 0.2317073 0.008337570 2.1257849 19
## [9122] {citrus_fruit,
## newspapers} => {soda} 0.002135231 0.2560976 0.008337570 1.4686411 21
## [9123] {citrus_fruit,
## newspapers} => {yogurt} 0.002643620 0.3170732 0.008337570 2.2728970 26
## [9124] {citrus_fruit,
## newspapers} => {rolls/buns} 0.002338587 0.2804878 0.008337570 1.5249296 23
## [9125] {citrus_fruit,
## newspapers} => {other_vegetables} 0.003762074 0.4512195 0.008337570 2.3319726 37
## [9126] {citrus_fruit,
## newspapers} => {whole_milk} 0.003355363 0.4024390 0.008337570 1.5750051 33
## [9127] {newspapers,
## shopping_bags} => {soda} 0.002135231 0.3088235 0.006914082 1.7710084 21
## [9128] {newspapers,
## shopping_bags} => {yogurt} 0.001525165 0.2205882 0.006914082 1.5812575 15
## [9129] {newspapers,
## shopping_bags} => {rolls/buns} 0.001525165 0.2205882 0.006914082 1.1992732 15
## [9130] {newspapers,
## shopping_bags} => {other_vegetables} 0.002338587 0.3382353 0.006914082 1.7480526 23
## [9131] {newspapers,
## shopping_bags} => {whole_milk} 0.002135231 0.3088235 0.006914082 1.2086269 21
## [9132] {newspapers,
## sausage} => {bottled_water} 0.002033554 0.2531646 0.008032537 2.2905919 20
## [9133] {newspapers,
## sausage} => {tropical_fruit} 0.001931876 0.2405063 0.008032537 2.2920346 19
## [9134] {newspapers,
## sausage} => {root_vegetables} 0.001830198 0.2278481 0.008032537 2.0903788 18
## [9135] {newspapers,
## sausage} => {soda} 0.002135231 0.2658228 0.008032537 1.5244123 21
## [9136] {newspapers,
## sausage} => {yogurt} 0.002846975 0.3544304 0.008032537 2.5406872 28
## [9137] {newspapers,
## sausage} => {rolls/buns} 0.003050330 0.3797468 0.008032537 2.0645717 30
## [9138] {newspapers,
## sausage} => {other_vegetables} 0.003355363 0.4177215 0.008032537 2.1588498 33
## [9139] {newspapers,
## sausage} => {whole_milk} 0.003050330 0.3797468 0.008032537 1.4861958 30
## [9140] {bottled_water,
## newspapers} => {tropical_fruit} 0.002846975 0.2522523 0.011286223 2.4039737 28
## [9141] {newspapers,
## tropical_fruit} => {bottled_water} 0.002846975 0.2413793 0.011794611 2.1839609 28
## [9142] {bottled_water,
## newspapers} => {soda} 0.003558719 0.3153153 0.011286223 1.8082368 35
## [9143] {newspapers,
## soda} => {bottled_water} 0.003558719 0.2430556 0.014641586 2.1991273 35
## [9144] {bottled_water,
## newspapers} => {yogurt} 0.003253686 0.2882883 0.011286223 2.0665564 32
## [9145] {newspapers,
## yogurt} => {bottled_water} 0.003253686 0.2119205 0.015353330 1.9174226 32
## [9146] {bottled_water,
## newspapers} => {rolls/buns} 0.003863752 0.3423423 0.011286223 1.8612144 38
## [9147] {bottled_water,
## newspapers} => {other_vegetables} 0.003355363 0.2972973 0.011286223 1.5364787 33
## [9148] {bottled_water,
## newspapers} => {whole_milk} 0.004067107 0.3603604 0.011286223 1.4103240 40
## [9149] {newspapers,
## tropical_fruit} => {root_vegetables} 0.003253686 0.2758621 0.011794611 2.5308801 32
## [9150] {newspapers,
## root_vegetables} => {tropical_fruit} 0.003253686 0.2831858 0.011489578 2.6987720 32
## [9151] {newspapers,
## tropical_fruit} => {soda} 0.002541942 0.2155172 0.011794611 1.2359254 25
## [9152] {newspapers,
## tropical_fruit} => {yogurt} 0.004270463 0.3620690 0.011794611 2.5954433 42
## [9153] {newspapers,
## yogurt} => {tropical_fruit} 0.004270463 0.2781457 0.015353330 2.6507393 42
## [9154] {newspapers,
## tropical_fruit} => {rolls/buns} 0.004168785 0.3534483 0.011794611 1.9215941 41
## [9155] {newspapers,
## rolls/buns} => {tropical_fruit} 0.004168785 0.2113402 0.019725470 2.0140804 41
## [9156] {newspapers,
## tropical_fruit} => {other_vegetables} 0.004270463 0.3620690 0.011794611 1.8712287 42
## [9157] {newspapers,
## other_vegetables} => {tropical_fruit} 0.004270463 0.2210526 0.019318760 2.1066401 42
## [9158] {newspapers,
## tropical_fruit} => {whole_milk} 0.005083884 0.4310345 0.011794611 1.6869177 50
## [9159] {newspapers,
## root_vegetables} => {soda} 0.002745297 0.2389381 0.011489578 1.3702366 27
## [9160] {newspapers,
## root_vegetables} => {yogurt} 0.003355363 0.2920354 0.011489578 2.0934170 33
## [9161] {newspapers,
## yogurt} => {root_vegetables} 0.003355363 0.2185430 0.015353330 2.0050101 33
## [9162] {newspapers,
## root_vegetables} => {rolls/buns} 0.003152008 0.2743363 0.011489578 1.4914855 31
## [9163] {newspapers,
## root_vegetables} => {other_vegetables} 0.005998983 0.5221239 0.011489578 2.6984175 59
## [9164] {newspapers,
## other_vegetables} => {root_vegetables} 0.005998983 0.3105263 0.019318760 2.8489051 59
## [9165] {newspapers,
## root_vegetables} => {whole_milk} 0.005795628 0.5044248 0.011489578 1.9741415 57
## [9166] {newspapers,
## whole_milk} => {root_vegetables} 0.005795628 0.2118959 0.027351296 1.9440264 57
## [9167] {newspapers,
## soda} => {yogurt} 0.004270463 0.2916667 0.014641586 2.0907738 42
## [9168] {newspapers,
## yogurt} => {soda} 0.004270463 0.2781457 0.015353330 1.5950804 42
## [9169] {newspapers,
## soda} => {rolls/buns} 0.004067107 0.2777778 0.014641586 1.5101959 40
## [9170] {newspapers,
## rolls/buns} => {soda} 0.004067107 0.2061856 0.019725470 1.1824111 40
## [9171] {newspapers,
## soda} => {other_vegetables} 0.004982206 0.3402778 0.014641586 1.7586085 49
## [9172] {newspapers,
## other_vegetables} => {soda} 0.004982206 0.2578947 0.019318760 1.4789474 49
## [9173] {newspapers,
## soda} => {whole_milk} 0.004778851 0.3263889 0.014641586 1.2773716 47
## [9174] {newspapers,
## yogurt} => {rolls/buns} 0.005083884 0.3311258 0.015353330 1.8002336 50
## [9175] {newspapers,
## rolls/buns} => {yogurt} 0.005083884 0.2577320 0.019725470 1.8475174 50
## [9176] {newspapers,
## yogurt} => {other_vegetables} 0.005592272 0.3642384 0.015353330 1.8824408 55
## [9177] {newspapers,
## other_vegetables} => {yogurt} 0.005592272 0.2894737 0.019318760 2.0750537 55
## [9178] {newspapers,
## yogurt} => {whole_milk} 0.006609049 0.4304636 0.015353330 1.6846834 65
## [9179] {newspapers,
## whole_milk} => {yogurt} 0.006609049 0.2416357 0.027351296 1.7321334 65
## [9180] {newspapers,
## rolls/buns} => {other_vegetables} 0.005490595 0.2783505 0.019725470 1.4385588 54
## [9181] {newspapers,
## other_vegetables} => {rolls/buns} 0.005490595 0.2842105 0.019318760 1.5451689 54
## [9182] {newspapers,
## rolls/buns} => {whole_milk} 0.007625826 0.3865979 0.019725470 1.5130086 75
## [9183] {newspapers,
## whole_milk} => {rolls/buns} 0.007625826 0.2788104 0.027351296 1.5158100 75
## [9184] {newspapers,
## other_vegetables} => {whole_milk} 0.008337570 0.4315789 0.019318760 1.6890485 82
## [9185] {newspapers,
## whole_milk} => {other_vegetables} 0.008337570 0.3048327 0.027351296 1.5754229 82
## [9186] {domestic_eggs,
## fruit/vegetable_juice} => {whipped/sour_cream} 0.001728521 0.2151899 0.008032537 3.0019750 17
## [9187] {domestic_eggs,
## fruit/vegetable_juice} => {pip_fruit} 0.001830198 0.2278481 0.008032537 3.0119437 18
## [9188] {domestic_eggs,
## pip_fruit} => {fruit/vegetable_juice} 0.001830198 0.2117647 0.008642603 2.9292628 18
## [9189] {domestic_eggs,
## fruit/vegetable_juice} => {citrus_fruit} 0.001626843 0.2025316 0.008032537 2.4470500 16
## [9190] {domestic_eggs,
## fruit/vegetable_juice} => {bottled_water} 0.001626843 0.2025316 0.008032537 1.8324735 16
## [9191] {domestic_eggs,
## fruit/vegetable_juice} => {tropical_fruit} 0.002338587 0.2911392 0.008032537 2.7745682 23
## [9192] {domestic_eggs,
## tropical_fruit} => {fruit/vegetable_juice} 0.002338587 0.2053571 0.011387900 2.8406294 23
## [9193] {domestic_eggs,
## fruit/vegetable_juice} => {root_vegetables} 0.002541942 0.3164557 0.008032537 2.9033039 25
## [9194] {fruit/vegetable_juice,
## root_vegetables} => {domestic_eggs} 0.002541942 0.2118644 0.011997966 3.3392411 25
## [9195] {domestic_eggs,
## fruit/vegetable_juice} => {soda} 0.001931876 0.2405063 0.008032537 1.3792302 19
## [9196] {domestic_eggs,
## fruit/vegetable_juice} => {yogurt} 0.002541942 0.3164557 0.008032537 2.2684707 25
## [9197] {domestic_eggs,
## fruit/vegetable_juice} => {rolls/buns} 0.002135231 0.2658228 0.008032537 1.4452002 21
## [9198] {domestic_eggs,
## fruit/vegetable_juice} => {other_vegetables} 0.003457041 0.4303797 0.008032537 2.2242695 34
## [9199] {domestic_eggs,
## fruit/vegetable_juice} => {whole_milk} 0.004778851 0.5949367 0.008032537 2.3283735 47
## [9200] {domestic_eggs,
## pip_fruit} => {whipped/sour_cream} 0.001931876 0.2235294 0.008642603 3.1183146 19
## [9201] {pip_fruit,
## whipped/sour_cream} => {domestic_eggs} 0.001931876 0.2087912 0.009252669 3.2908037 19
## [9202] {domestic_eggs,
## sausage} => {whipped/sour_cream} 0.001931876 0.2021277 0.009557702 2.8197525 19
## [9203] {sausage,
## whipped/sour_cream} => {domestic_eggs} 0.001931876 0.2134831 0.009049314 3.3647544 19
## [9204] {domestic_eggs,
## whipped/sour_cream} => {tropical_fruit} 0.002033554 0.2040816 0.009964413 1.9449059 20
## [9205] {domestic_eggs,
## whipped/sour_cream} => {root_vegetables} 0.003355363 0.3367347 0.009964413 3.0893523 33
## [9206] {domestic_eggs,
## root_vegetables} => {whipped/sour_cream} 0.003355363 0.2340426 0.014336553 3.2649766 33
## [9207] {domestic_eggs,
## whipped/sour_cream} => {yogurt} 0.003558719 0.3571429 0.009964413 2.5601312 35
## [9208] {domestic_eggs,
## yogurt} => {whipped/sour_cream} 0.003558719 0.2482270 0.014336553 3.4628540 35
## [9209] {domestic_eggs,
## whipped/sour_cream} => {rolls/buns} 0.002541942 0.2551020 0.009964413 1.3869146 25
## [9210] {domestic_eggs,
## whipped/sour_cream} => {other_vegetables} 0.005083884 0.5102041 0.009964413 2.6368141 50
## [9211] {domestic_eggs,
## other_vegetables} => {whipped/sour_cream} 0.005083884 0.2283105 0.022267412 3.1850125 50
## [9212] {domestic_eggs,
## whipped/sour_cream} => {whole_milk} 0.005693950 0.5714286 0.009964413 2.2363709 56
## [9213] {domestic_eggs,
## pip_fruit} => {citrus_fruit} 0.001931876 0.2235294 0.008642603 2.7007516 19
## [9214] {domestic_eggs,
## pip_fruit} => {sausage} 0.001728521 0.2000000 0.008642603 2.1287879 17
## [9215] {domestic_eggs,
## pip_fruit} => {tropical_fruit} 0.002338587 0.2705882 0.008642603 2.5787164 23
## [9216] {domestic_eggs,
## tropical_fruit} => {pip_fruit} 0.002338587 0.2053571 0.011387900 2.7146337 23
## [9217] {domestic_eggs,
## pip_fruit} => {root_vegetables} 0.002643620 0.3058824 0.008642603 2.8062994 26
## [9218] {domestic_eggs,
## pip_fruit} => {yogurt} 0.002643620 0.3058824 0.008642603 2.1926771 26
## [9219] {domestic_eggs,
## pip_fruit} => {other_vegetables} 0.003965430 0.4588235 0.008642603 2.3712714 39
## [9220] {domestic_eggs,
## pip_fruit} => {whole_milk} 0.005388917 0.6235294 0.008642603 2.4402753 53
## [9221] {domestic_eggs,
## pastry} => {soda} 0.002236909 0.2471910 0.009049314 1.4175648 22
## [9222] {domestic_eggs,
## pastry} => {yogurt} 0.002338587 0.2584270 0.009049314 1.8524994 23
## [9223] {domestic_eggs,
## pastry} => {rolls/buns} 0.002948653 0.3258427 0.009049314 1.7715107 29
## [9224] {domestic_eggs,
## pastry} => {other_vegetables} 0.004067107 0.4494382 0.009049314 2.3227665 40
## [9225] {domestic_eggs,
## pastry} => {whole_milk} 0.004168785 0.4606742 0.009049314 1.8029170 41
## [9226] {domestic_eggs,
## sausage} => {citrus_fruit} 0.002033554 0.2127660 0.009557702 2.5707042 20
## [9227] {citrus_fruit,
## domestic_eggs} => {tropical_fruit} 0.002338587 0.2254902 0.010371124 2.1489303 23
## [9228] {domestic_eggs,
## tropical_fruit} => {citrus_fruit} 0.002338587 0.2053571 0.011387900 2.4811886 23
## [9229] {citrus_fruit,
## domestic_eggs} => {root_vegetables} 0.002440264 0.2352941 0.010371124 2.1586918 24
## [9230] {citrus_fruit,
## domestic_eggs} => {yogurt} 0.002948653 0.2843137 0.010371124 2.0380652 29
## [9231] {domestic_eggs,
## yogurt} => {citrus_fruit} 0.002948653 0.2056738 0.014336553 2.4850140 29
## [9232] {citrus_fruit,
## domestic_eggs} => {rolls/buns} 0.002440264 0.2352941 0.010371124 1.2792248 24
## [9233] {citrus_fruit,
## domestic_eggs} => {other_vegetables} 0.004473818 0.4313725 0.010371124 2.2294004 44
## [9234] {domestic_eggs,
## other_vegetables} => {citrus_fruit} 0.004473818 0.2009132 0.022267412 2.4274960 44
## [9235] {citrus_fruit,
## domestic_eggs} => {whole_milk} 0.005693950 0.5490196 0.010371124 2.1486701 56
## [9236] {domestic_eggs,
## shopping_bags} => {soda} 0.003152008 0.3483146 0.009049314 1.9974776 31
## [9237] {domestic_eggs,
## soda} => {shopping_bags} 0.003152008 0.2540984 0.012404677 2.5790066 31
## [9238] {domestic_eggs,
## shopping_bags} => {yogurt} 0.002236909 0.2471910 0.009049314 1.7719560 22
## [9239] {domestic_eggs,
## shopping_bags} => {rolls/buns} 0.002541942 0.2808989 0.009049314 1.5271644 25
## [9240] {domestic_eggs,
## shopping_bags} => {other_vegetables} 0.003457041 0.3820225 0.009049314 1.9743516 34
## [9241] {domestic_eggs,
## shopping_bags} => {whole_milk} 0.004168785 0.4606742 0.009049314 1.8029170 41
## [9242] {domestic_eggs,
## sausage} => {soda} 0.003152008 0.3297872 0.009557702 1.8912288 31
## [9243] {domestic_eggs,
## soda} => {sausage} 0.003152008 0.2540984 0.012404677 2.7046076 31
## [9244] {domestic_eggs,
## sausage} => {yogurt} 0.002440264 0.2553191 0.009557702 1.8302215 24
## [9245] {domestic_eggs,
## sausage} => {rolls/buns} 0.003558719 0.3723404 0.009557702 2.0243052 35
## [9246] {domestic_eggs,
## rolls/buns} => {sausage} 0.003558719 0.2272727 0.015658363 2.4190771 35
## [9247] {domestic_eggs,
## sausage} => {other_vegetables} 0.003762074 0.3936170 0.009557702 2.0342740 37
## [9248] {domestic_eggs,
## sausage} => {whole_milk} 0.004473818 0.4680851 0.009557702 1.8319208 44
## [9249] {bottled_water,
## domestic_eggs} => {tropical_fruit} 0.002236909 0.2444444 0.009150991 2.3295650 22
## [9250] {bottled_water,
## domestic_eggs} => {root_vegetables} 0.002236909 0.2444444 0.009150991 2.2426410 22
## [9251] {bottled_water,
## domestic_eggs} => {soda} 0.002846975 0.3111111 0.009150991 1.7841270 28
## [9252] {domestic_eggs,
## soda} => {bottled_water} 0.002846975 0.2295082 0.012404677 2.0765530 28
## [9253] {bottled_water,
## domestic_eggs} => {yogurt} 0.002846975 0.3111111 0.009150991 2.2301587 28
## [9254] {bottled_water,
## domestic_eggs} => {rolls/buns} 0.003152008 0.3444444 0.009150991 1.8726430 31
## [9255] {domestic_eggs,
## rolls/buns} => {bottled_water} 0.003152008 0.2012987 0.015658363 1.8213181 31
## [9256] {bottled_water,
## domestic_eggs} => {other_vegetables} 0.004067107 0.4444444 0.009150991 2.2969580 40
## [9257] {bottled_water,
## domestic_eggs} => {whole_milk} 0.004880529 0.5333333 0.009150991 2.0872795 48
## [9258] {domestic_eggs,
## tropical_fruit} => {root_vegetables} 0.003558719 0.3125000 0.011387900 2.8670126 35
## [9259] {domestic_eggs,
## root_vegetables} => {tropical_fruit} 0.003558719 0.2482270 0.014336553 2.3656125 35
## [9260] {domestic_eggs,
## tropical_fruit} => {soda} 0.002948653 0.2589286 0.011387900 1.4848761 29
## [9261] {domestic_eggs,
## soda} => {tropical_fruit} 0.002948653 0.2377049 0.012404677 2.2653371 29
## [9262] {domestic_eggs,
## tropical_fruit} => {yogurt} 0.004270463 0.3750000 0.011387900 2.6881378 42
## [9263] {domestic_eggs,
## yogurt} => {tropical_fruit} 0.004270463 0.2978723 0.014336553 2.8387349 42
## [9264] {domestic_eggs,
## tropical_fruit} => {rolls/buns} 0.002541942 0.2232143 0.011387900 1.2135503 25
## [9265] {domestic_eggs,
## tropical_fruit} => {other_vegetables} 0.004778851 0.4196429 0.011387900 2.1687796 47
## [9266] {domestic_eggs,
## other_vegetables} => {tropical_fruit} 0.004778851 0.2146119 0.022267412 2.0452595 47
## [9267] {domestic_eggs,
## tropical_fruit} => {whole_milk} 0.006914082 0.6071429 0.011387900 2.3761441 68
## [9268] {domestic_eggs,
## whole_milk} => {tropical_fruit} 0.006914082 0.2305085 0.029994916 2.1967547 68
## [9269] {domestic_eggs,
## soda} => {root_vegetables} 0.002745297 0.2213115 0.012404677 2.0304089 27
## [9270] {domestic_eggs,
## root_vegetables} => {yogurt} 0.003660397 0.2553191 0.014336553 1.8302215 36
## [9271] {domestic_eggs,
## yogurt} => {root_vegetables} 0.003660397 0.2553191 0.014336553 2.3424103 36
## [9272] {domestic_eggs,
## root_vegetables} => {other_vegetables} 0.007320793 0.5106383 0.014336553 2.6390582 72
## [9273] {domestic_eggs,
## other_vegetables} => {root_vegetables} 0.007320793 0.3287671 0.022267412 3.0162543 72
## [9274] {domestic_eggs,
## root_vegetables} => {whole_milk} 0.008540925 0.5957447 0.014336553 2.3315356 84
## [9275] {domestic_eggs,
## whole_milk} => {root_vegetables} 0.008540925 0.2847458 0.029994916 2.6123830 84
## [9276] {domestic_eggs,
## soda} => {yogurt} 0.002541942 0.2049180 0.012404677 1.4689277 25
## [9277] {domestic_eggs,
## soda} => {rolls/buns} 0.003457041 0.2786885 0.012404677 1.5151474 34
## [9278] {domestic_eggs,
## rolls/buns} => {soda} 0.003457041 0.2207792 0.015658363 1.2661012 34
## [9279] {domestic_eggs,
## soda} => {other_vegetables} 0.005083884 0.4098361 0.012404677 2.1180965 50
## [9280] {domestic_eggs,
## other_vegetables} => {soda} 0.005083884 0.2283105 0.022267412 1.3092908 50
## [9281] {domestic_eggs,
## soda} => {whole_milk} 0.005185562 0.4180328 0.012404677 1.6360336 51
## [9282] {domestic_eggs,
## yogurt} => {rolls/buns} 0.004270463 0.2978723 0.014336553 1.6194442 42
## [9283] {domestic_eggs,
## rolls/buns} => {yogurt} 0.004270463 0.2727273 0.015658363 1.9550093 42
## [9284] {domestic_eggs,
## yogurt} => {other_vegetables} 0.005795628 0.4042553 0.014336553 2.0892544 57
## [9285] {domestic_eggs,
## other_vegetables} => {yogurt} 0.005795628 0.2602740 0.022267412 1.8657394 57
## [9286] {domestic_eggs,
## yogurt} => {whole_milk} 0.007727504 0.5390071 0.014336553 2.1094846 76
## [9287] {domestic_eggs,
## whole_milk} => {yogurt} 0.007727504 0.2576271 0.029994916 1.8467658 76
## [9288] {domestic_eggs,
## rolls/buns} => {other_vegetables} 0.005897306 0.3766234 0.015658363 1.9464482 58
## [9289] {domestic_eggs,
## other_vegetables} => {rolls/buns} 0.005897306 0.2648402 0.022267412 1.4398580 58
## [9290] {domestic_eggs,
## rolls/buns} => {whole_milk} 0.006609049 0.4220779 0.015658363 1.6518648 65
## [9291] {domestic_eggs,
## whole_milk} => {rolls/buns} 0.006609049 0.2203390 0.029994916 1.1979181 65
## [9292] {domestic_eggs,
## other_vegetables} => {whole_milk} 0.012302999 0.5525114 0.022267412 2.1623358 121
## [9293] {domestic_eggs,
## whole_milk} => {other_vegetables} 0.012302999 0.4101695 0.029994916 2.1198197 121
## [9294] {fruit/vegetable_juice,
## whipped/sour_cream} => {pip_fruit} 0.001830198 0.2022472 0.009049314 2.6735230 18
## [9295] {pastry,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001525165 0.2027027 0.007524148 2.8039115 15
## [9296] {fruit/vegetable_juice,
## whipped/sour_cream} => {bottled_water} 0.001830198 0.2022472 0.009049314 1.8298998 18
## [9297] {bottled_water,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001830198 0.2093023 0.008744281 2.8952016 18
## [9298] {fruit/vegetable_juice,
## whipped/sour_cream} => {tropical_fruit} 0.002135231 0.2359551 0.009049314 2.2486608 21
## [9299] {fruit/vegetable_juice,
## whipped/sour_cream} => {root_vegetables} 0.002846975 0.3146067 0.009049314 2.8863408 28
## [9300] {fruit/vegetable_juice,
## root_vegetables} => {whipped/sour_cream} 0.002846975 0.2372881 0.011997966 3.3102536 28
## [9301] {fruit/vegetable_juice,
## whipped/sour_cream} => {soda} 0.002440264 0.2696629 0.009049314 1.5464343 24
## [9302] {soda,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.002440264 0.2105263 0.011591256 2.9121327 24
## [9303] {fruit/vegetable_juice,
## whipped/sour_cream} => {yogurt} 0.003863752 0.4269663 0.009049314 3.0606512 38
## [9304] {fruit/vegetable_juice,
## yogurt} => {whipped/sour_cream} 0.003863752 0.2065217 0.018708693 2.8810515 38
## [9305] {fruit/vegetable_juice,
## whipped/sour_cream} => {other_vegetables} 0.004270463 0.4719101 0.009049314 2.4389049 42
## [9306] {fruit/vegetable_juice,
## other_vegetables} => {whipped/sour_cream} 0.004270463 0.2028986 0.021047280 2.8305067 42
## [9307] {fruit/vegetable_juice,
## whipped/sour_cream} => {whole_milk} 0.004473818 0.4943820 0.009049314 1.9348377 44
## [9308] {fruit/vegetable_juice,
## pastry} => {pip_fruit} 0.001728521 0.2023810 0.008540925 2.6752912 17
## [9309] {fruit/vegetable_juice,
## pip_fruit} => {citrus_fruit} 0.002338587 0.2446809 0.009557702 2.9563098 23
## [9310] {citrus_fruit,
## fruit/vegetable_juice} => {pip_fruit} 0.002338587 0.2254902 0.010371124 2.9807743 23
## [9311] {fruit/vegetable_juice,
## pip_fruit} => {bottled_water} 0.001931876 0.2021277 0.009557702 1.8288183 19
## [9312] {fruit/vegetable_juice,
## pip_fruit} => {tropical_fruit} 0.003152008 0.3297872 0.009557702 3.1428851 31
## [9313] {fruit/vegetable_juice,
## tropical_fruit} => {pip_fruit} 0.003152008 0.2296296 0.013726487 3.0354938 31
## [9314] {fruit/vegetable_juice,
## pip_fruit} => {root_vegetables} 0.002643620 0.2765957 0.009557702 2.5376111 26
## [9315] {fruit/vegetable_juice,
## root_vegetables} => {pip_fruit} 0.002643620 0.2203390 0.011997966 2.9126800 26
## [9316] {fruit/vegetable_juice,
## pip_fruit} => {soda} 0.002541942 0.2659574 0.009557702 1.5251845 25
## [9317] {fruit/vegetable_juice,
## pip_fruit} => {yogurt} 0.003558719 0.3723404 0.009557702 2.6690729 35
## [9318] {fruit/vegetable_juice,
## pip_fruit} => {other_vegetables} 0.004372140 0.4574468 0.009557702 2.3641563 43
## [9319] {fruit/vegetable_juice,
## other_vegetables} => {pip_fruit} 0.004372140 0.2077295 0.021047280 2.7459937 43
## [9320] {fruit/vegetable_juice,
## pip_fruit} => {whole_milk} 0.004778851 0.5000000 0.009557702 1.9568245 47
## [9321] {fruit/vegetable_juice,
## pastry} => {bottled_water} 0.001728521 0.2023810 0.008540925 1.8311101 17
## [9322] {fruit/vegetable_juice,
## pastry} => {tropical_fruit} 0.001931876 0.2261905 0.008540925 2.1556040 19
## [9323] {fruit/vegetable_juice,
## pastry} => {soda} 0.002338587 0.2738095 0.008540925 1.5702138 23
## [9324] {fruit/vegetable_juice,
## pastry} => {yogurt} 0.003253686 0.3809524 0.008540925 2.7308066 32
## [9325] {fruit/vegetable_juice,
## pastry} => {rolls/buns} 0.002440264 0.2857143 0.008540925 1.5533444 24
## [9326] {fruit/vegetable_juice,
## pastry} => {other_vegetables} 0.002846975 0.3333333 0.008540925 1.7227185 28
## [9327] {fruit/vegetable_juice,
## pastry} => {whole_milk} 0.004270463 0.5000000 0.008540925 1.9568245 42
## [9328] {citrus_fruit,
## fruit/vegetable_juice} => {sausage} 0.002135231 0.2058824 0.010371124 2.1913993 21
## [9329] {fruit/vegetable_juice,
## sausage} => {citrus_fruit} 0.002135231 0.2121212 0.010066090 2.5629142 21
## [9330] {citrus_fruit,
## fruit/vegetable_juice} => {tropical_fruit} 0.003965430 0.3823529 0.010371124 3.6438383 39
## [9331] {fruit/vegetable_juice,
## tropical_fruit} => {citrus_fruit} 0.003965430 0.2888889 0.013726487 3.4904450 39
## [9332] {citrus_fruit,
## fruit/vegetable_juice} => {root_vegetables} 0.003457041 0.3333333 0.010371124 3.0581468 34
## [9333] {fruit/vegetable_juice,
## root_vegetables} => {citrus_fruit} 0.003457041 0.2881356 0.011997966 3.4813434 34
## [9334] {citrus_fruit,
## fruit/vegetable_juice} => {soda} 0.003355363 0.3235294 0.010371124 1.8553421 33
## [9335] {citrus_fruit,
## soda} => {fruit/vegetable_juice} 0.003355363 0.2619048 0.012811388 3.6228317 33
## [9336] {citrus_fruit,
## fruit/vegetable_juice} => {yogurt} 0.003355363 0.3235294 0.010371124 2.3191777 33
## [9337] {citrus_fruit,
## fruit/vegetable_juice} => {other_vegetables} 0.004778851 0.4607843 0.010371124 2.3814050 47
## [9338] {fruit/vegetable_juice,
## other_vegetables} => {citrus_fruit} 0.004778851 0.2270531 0.021047280 2.7433263 47
## [9339] {citrus_fruit,
## fruit/vegetable_juice} => {whole_milk} 0.004270463 0.4117647 0.010371124 1.6115025 42
## [9340] {fruit/vegetable_juice,
## shopping_bags} => {soda} 0.003558719 0.3333333 0.010676157 1.9115646 35
## [9341] {fruit/vegetable_juice,
## shopping_bags} => {yogurt} 0.003050330 0.2857143 0.010676157 2.0481050 30
## [9342] {shopping_bags,
## yogurt} => {fruit/vegetable_juice} 0.003050330 0.2000000 0.015251652 2.7665260 30
## [9343] {fruit/vegetable_juice,
## shopping_bags} => {other_vegetables} 0.002846975 0.2666667 0.010676157 1.3781748 28
## [9344] {fruit/vegetable_juice,
## shopping_bags} => {whole_milk} 0.003762074 0.3523810 0.010676157 1.3790954 37
## [9345] {fruit/vegetable_juice,
## sausage} => {root_vegetables} 0.002135231 0.2121212 0.010066090 1.9460934 21
## [9346] {fruit/vegetable_juice,
## sausage} => {soda} 0.002948653 0.2929293 0.010066090 1.6798598 29
## [9347] {fruit/vegetable_juice,
## sausage} => {yogurt} 0.002846975 0.2828283 0.010066090 2.0274170 28
## [9348] {fruit/vegetable_juice,
## sausage} => {rolls/buns} 0.002643620 0.2626263 0.010066090 1.4278216 26
## [9349] {fruit/vegetable_juice,
## sausage} => {other_vegetables} 0.003457041 0.3434343 0.010066090 1.7749221 34
## [9350] {fruit/vegetable_juice,
## sausage} => {whole_milk} 0.004880529 0.4848485 0.010066090 1.8975268 48
## [9351] {bottled_water,
## fruit/vegetable_juice} => {tropical_fruit} 0.002948653 0.2071429 0.014234875 1.9740795 29
## [9352] {fruit/vegetable_juice,
## tropical_fruit} => {bottled_water} 0.002948653 0.2148148 0.013726487 1.9436097 29
## [9353] {bottled_water,
## fruit/vegetable_juice} => {root_vegetables} 0.002846975 0.2000000 0.014234875 1.8348881 28
## [9354] {fruit/vegetable_juice,
## root_vegetables} => {bottled_water} 0.002846975 0.2372881 0.011997966 2.1469446 28
## [9355] {bottled_water,
## fruit/vegetable_juice} => {soda} 0.005185562 0.3642857 0.014234875 2.0890671 51
## [9356] {fruit/vegetable_juice,
## soda} => {bottled_water} 0.005185562 0.2817680 0.018403660 2.5493908 51
## [9357] {bottled_water,
## fruit/vegetable_juice} => {yogurt} 0.004372140 0.3071429 0.014234875 2.2017128 43
## [9358] {fruit/vegetable_juice,
## yogurt} => {bottled_water} 0.004372140 0.2336957 0.018708693 2.1144404 43
## [9359] {bottled_water,
## fruit/vegetable_juice} => {rolls/buns} 0.003355363 0.2357143 0.014234875 1.2815091 33
## [9360] {fruit/vegetable_juice,
## rolls/buns} => {bottled_water} 0.003355363 0.2307692 0.014539908 2.0879626 33
## [9361] {bottled_water,
## fruit/vegetable_juice} => {other_vegetables} 0.004067107 0.2857143 0.014234875 1.4766159 40
## [9362] {bottled_water,
## fruit/vegetable_juice} => {whole_milk} 0.005795628 0.4071429 0.014234875 1.5934142 57
## [9363] {fruit/vegetable_juice,
## whole_milk} => {bottled_water} 0.005795628 0.2175573 0.026639553 1.9684228 57
## [9364] {fruit/vegetable_juice,
## tropical_fruit} => {root_vegetables} 0.003253686 0.2370370 0.013726487 2.1746821 32
## [9365] {fruit/vegetable_juice,
## root_vegetables} => {tropical_fruit} 0.003253686 0.2711864 0.011997966 2.5844173 32
## [9366] {fruit/vegetable_juice,
## tropical_fruit} => {soda} 0.003355363 0.2444444 0.013726487 1.4018141 33
## [9367] {fruit/vegetable_juice,
## tropical_fruit} => {yogurt} 0.004880529 0.3555556 0.013726487 2.5487528 48
## [9368] {fruit/vegetable_juice,
## yogurt} => {tropical_fruit} 0.004880529 0.2608696 0.018708693 2.4860971 48
## [9369] {fruit/vegetable_juice,
## tropical_fruit} => {rolls/buns} 0.002948653 0.2148148 0.013726487 1.1678849 29
## [9370] {fruit/vegetable_juice,
## rolls/buns} => {tropical_fruit} 0.002948653 0.2027972 0.014539908 1.9326652 29
## [9371] {fruit/vegetable_juice,
## tropical_fruit} => {other_vegetables} 0.006609049 0.4814815 0.013726487 2.4883712 65
## [9372] {fruit/vegetable_juice,
## other_vegetables} => {tropical_fruit} 0.006609049 0.3140097 0.021047280 2.9925242 65
## [9373] {fruit/vegetable_juice,
## tropical_fruit} => {whole_milk} 0.005998983 0.4370370 0.013726487 1.7104096 59
## [9374] {fruit/vegetable_juice,
## whole_milk} => {tropical_fruit} 0.005998983 0.2251908 0.026639553 2.1460774 59
## [9375] {fruit/vegetable_juice,
## root_vegetables} => {soda} 0.003355363 0.2796610 0.011997966 1.6037703 33
## [9376] {fruit/vegetable_juice,
## root_vegetables} => {yogurt} 0.003457041 0.2881356 0.011997966 2.0654618 34
## [9377] {fruit/vegetable_juice,
## root_vegetables} => {rolls/buns} 0.002541942 0.2118644 0.011997966 1.1518444 25
## [9378] {fruit/vegetable_juice,
## root_vegetables} => {other_vegetables} 0.006609049 0.5508475 0.011997966 2.8468653 65
## [9379] {fruit/vegetable_juice,
## other_vegetables} => {root_vegetables} 0.006609049 0.3140097 0.021047280 2.8808629 65
## [9380] {fruit/vegetable_juice,
## root_vegetables} => {whole_milk} 0.006507372 0.5423729 0.011997966 2.1226571 64
## [9381] {fruit/vegetable_juice,
## whole_milk} => {root_vegetables} 0.006507372 0.2442748 0.026639553 2.2410847 64
## [9382] {fruit/vegetable_juice,
## soda} => {yogurt} 0.005083884 0.2762431 0.018403660 1.9802120 50
## [9383] {fruit/vegetable_juice,
## yogurt} => {soda} 0.005083884 0.2717391 0.018708693 1.5583407 50
## [9384] {fruit/vegetable_juice,
## soda} => {rolls/buns} 0.003965430 0.2154696 0.018403660 1.1714448 39
## [9385] {fruit/vegetable_juice,
## rolls/buns} => {soda} 0.003965430 0.2727273 0.014539908 1.5640074 39
## [9386] {fruit/vegetable_juice,
## soda} => {other_vegetables} 0.004473818 0.2430939 0.018403660 1.2563472 44
## [9387] {fruit/vegetable_juice,
## other_vegetables} => {soda} 0.004473818 0.2125604 0.021047280 1.2189687 44
## [9388] {fruit/vegetable_juice,
## soda} => {whole_milk} 0.006100661 0.3314917 0.018403660 1.2973422 60
## [9389] {fruit/vegetable_juice,
## whole_milk} => {soda} 0.006100661 0.2290076 0.026639553 1.3132887 60
## [9390] {fruit/vegetable_juice,
## yogurt} => {rolls/buns} 0.003762074 0.2010870 0.018708693 1.0932505 37
## [9391] {fruit/vegetable_juice,
## rolls/buns} => {yogurt} 0.003762074 0.2587413 0.014539908 1.8547524 37
## [9392] {fruit/vegetable_juice,
## yogurt} => {other_vegetables} 0.008235892 0.4402174 0.018708693 2.2751120 81
## [9393] {fruit/vegetable_juice,
## other_vegetables} => {yogurt} 0.008235892 0.3913043 0.021047280 2.8050133 81
## [9394] {fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.009456024 0.5054348 0.018708693 1.9780943 93
## [9395] {fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.009456024 0.3549618 0.026639553 2.5444968 93
## [9396] {fruit/vegetable_juice,
## rolls/buns} => {other_vegetables} 0.004372140 0.3006993 0.014539908 1.5540608 43
## [9397] {fruit/vegetable_juice,
## other_vegetables} => {rolls/buns} 0.004372140 0.2077295 0.021047280 1.1293639 43
## [9398] {fruit/vegetable_juice,
## rolls/buns} => {whole_milk} 0.005592272 0.3846154 0.014539908 1.5052496 55
## [9399] {fruit/vegetable_juice,
## whole_milk} => {rolls/buns} 0.005592272 0.2099237 0.026639553 1.1412931 55
## [9400] {fruit/vegetable_juice,
## other_vegetables} => {whole_milk} 0.010472801 0.4975845 0.021047280 1.9473713 103
## [9401] {fruit/vegetable_juice,
## whole_milk} => {other_vegetables} 0.010472801 0.3931298 0.026639553 2.0317558 103
## [9402] {shopping_bags,
## whipped/sour_cream} => {pip_fruit} 0.001830198 0.2307692 0.007930859 3.0505583 18
## [9403] {pip_fruit,
## whipped/sour_cream} => {tropical_fruit} 0.003762074 0.4065934 0.009252669 3.8748509 37
## [9404] {tropical_fruit,
## whipped/sour_cream} => {pip_fruit} 0.003762074 0.2720588 0.013828165 3.5963690 37
## [9405] {pip_fruit,
## whipped/sour_cream} => {root_vegetables} 0.003050330 0.3296703 0.009252669 3.0245408 30
## [9406] {pip_fruit,
## whipped/sour_cream} => {yogurt} 0.003660397 0.3956044 0.009252669 2.8358376 36
## [9407] {pip_fruit,
## yogurt} => {whipped/sour_cream} 0.003660397 0.2033898 0.017996950 2.8373603 36
## [9408] {pip_fruit,
## whipped/sour_cream} => {other_vegetables} 0.005592272 0.6043956 0.009252669 3.1236105 55
## [9409] {other_vegetables,
## pip_fruit} => {whipped/sour_cream} 0.005592272 0.2140078 0.026131164 2.9854844 55
## [9410] {pip_fruit,
## whipped/sour_cream} => {whole_milk} 0.005998983 0.6483516 0.009252669 2.5374208 59
## [9411] {pastry,
## whipped/sour_cream} => {citrus_fruit} 0.001728521 0.2297297 0.007524148 2.7756657 17
## [9412] {pastry,
## whipped/sour_cream} => {sausage} 0.001830198 0.2432432 0.007524148 2.5890663 18
## [9413] {sausage,
## whipped/sour_cream} => {pastry} 0.001830198 0.2022472 0.009049314 2.2732584 18
## [9414] {pastry,
## whipped/sour_cream} => {tropical_fruit} 0.001830198 0.2432432 0.007524148 2.3181175 18
## [9415] {pastry,
## whipped/sour_cream} => {root_vegetables} 0.002033554 0.2702703 0.007524148 2.4795785 20
## [9416] {pastry,
## whipped/sour_cream} => {yogurt} 0.002745297 0.3648649 0.007524148 2.6154854 27
## [9417] {pastry,
## whipped/sour_cream} => {rolls/buns} 0.002440264 0.3243243 0.007524148 1.7632558 24
## [9418] {pastry,
## whipped/sour_cream} => {other_vegetables} 0.004168785 0.5540541 0.007524148 2.8634375 41
## [9419] {pastry,
## whipped/sour_cream} => {whole_milk} 0.004168785 0.5540541 0.007524148 2.1683731 41
## [9420] {citrus_fruit,
## whipped/sour_cream} => {sausage} 0.002338587 0.2149533 0.010879512 2.2879496 23
## [9421] {sausage,
## whipped/sour_cream} => {citrus_fruit} 0.002338587 0.2584270 0.009049314 3.1223946 23
## [9422] {citrus_fruit,
## sausage} => {whipped/sour_cream} 0.002338587 0.2072072 0.011286223 2.8906140 23
## [9423] {citrus_fruit,
## whipped/sour_cream} => {tropical_fruit} 0.003152008 0.2897196 0.010879512 2.7610393 31
## [9424] {tropical_fruit,
## whipped/sour_cream} => {citrus_fruit} 0.003152008 0.2279412 0.013828165 2.7540559 31
## [9425] {citrus_fruit,
## whipped/sour_cream} => {root_vegetables} 0.003355363 0.3084112 0.010879512 2.8295003 33
## [9426] {citrus_fruit,
## whipped/sour_cream} => {yogurt} 0.004575496 0.4205607 0.010879512 3.0147339 45
## [9427] {whipped/sour_cream,
## yogurt} => {citrus_fruit} 0.004575496 0.2205882 0.020742247 2.6652153 45
## [9428] {citrus_fruit,
## yogurt} => {whipped/sour_cream} 0.004575496 0.2112676 0.021657346 2.9472580 45
## [9429] {citrus_fruit,
## whipped/sour_cream} => {rolls/buns} 0.002846975 0.2616822 0.010879512 1.4226893 28
## [9430] {citrus_fruit,
## whipped/sour_cream} => {other_vegetables} 0.005693950 0.5233645 0.010879512 2.7048291 56
## [9431] {citrus_fruit,
## whipped/sour_cream} => {whole_milk} 0.006304016 0.5794393 0.010879512 2.2677219 62
## [9432] {citrus_fruit,
## whole_milk} => {whipped/sour_cream} 0.006304016 0.2066667 0.030503305 2.8830733 62
## [9433] {shopping_bags,
## whipped/sour_cream} => {tropical_fruit} 0.001728521 0.2179487 0.007930859 2.0770597 17
## [9434] {shopping_bags,
## whipped/sour_cream} => {root_vegetables} 0.002236909 0.2820513 0.007930859 2.5876626 22
## [9435] {shopping_bags,
## whipped/sour_cream} => {soda} 0.001728521 0.2179487 0.007930859 1.2498692 17
## [9436] {shopping_bags,
## whipped/sour_cream} => {yogurt} 0.002135231 0.2692308 0.007930859 1.9299451 21
## [9437] {shopping_bags,
## whipped/sour_cream} => {other_vegetables} 0.003660397 0.4615385 0.007930859 2.3853026 36
## [9438] {shopping_bags,
## whipped/sour_cream} => {whole_milk} 0.002643620 0.3333333 0.007930859 1.3045497 26
## [9439] {sausage,
## whipped/sour_cream} => {tropical_fruit} 0.002135231 0.2359551 0.009049314 2.2486608 21
## [9440] {sausage,
## whipped/sour_cream} => {root_vegetables} 0.002135231 0.2359551 0.009049314 2.1647556 21
## [9441] {sausage,
## whipped/sour_cream} => {soda} 0.002135231 0.2359551 0.009049314 1.3531300 21
## [9442] {sausage,
## whipped/sour_cream} => {yogurt} 0.003558719 0.3932584 0.009049314 2.8190209 35
## [9443] {sausage,
## whipped/sour_cream} => {rolls/buns} 0.002440264 0.2696629 0.009049314 1.4660779 24
## [9444] {sausage,
## whipped/sour_cream} => {other_vegetables} 0.004880529 0.5393258 0.009049314 2.7873198 48
## [9445] {sausage,
## whipped/sour_cream} => {whole_milk} 0.005083884 0.5617978 0.009049314 2.1986792 50
## [9446] {bottled_water,
## whipped/sour_cream} => {tropical_fruit} 0.002643620 0.3023256 0.008744281 2.8811745 26
## [9447] {bottled_water,
## whipped/sour_cream} => {root_vegetables} 0.002338587 0.2674419 0.008744281 2.4536294 23
## [9448] {bottled_water,
## whipped/sour_cream} => {soda} 0.002338587 0.2674419 0.008744281 1.5336972 23
## [9449] {soda,
## whipped/sour_cream} => {bottled_water} 0.002338587 0.2017544 0.011591256 1.8254410 23
## [9450] {bottled_water,
## whipped/sour_cream} => {yogurt} 0.003050330 0.3488372 0.008744281 2.5005933 30
## [9451] {bottled_water,
## whipped/sour_cream} => {rolls/buns} 0.002236909 0.2558140 0.008744281 1.3907851 22
## [9452] {bottled_water,
## whipped/sour_cream} => {other_vegetables} 0.003863752 0.4418605 0.008744281 2.2836036 38
## [9453] {bottled_water,
## whipped/sour_cream} => {whole_milk} 0.004372140 0.5000000 0.008744281 1.9568245 43
## [9454] {tropical_fruit,
## whipped/sour_cream} => {root_vegetables} 0.004575496 0.3308824 0.013828165 3.0356604 45
## [9455] {root_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.004575496 0.2678571 0.017081851 2.5526890 45
## [9456] {root_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.004575496 0.2173913 0.021047280 3.0326858 45
## [9457] {soda,
## whipped/sour_cream} => {tropical_fruit} 0.002745297 0.2368421 0.011591256 2.2571144 27
## [9458] {tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.006202339 0.4485294 0.013828165 3.2152236 61
## [9459] {whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.006202339 0.2990196 0.020742247 2.8496685 61
## [9460] {tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.006202339 0.2118056 0.029283172 2.9547626 61
## [9461] {tropical_fruit,
## whipped/sour_cream} => {rolls/buns} 0.003457041 0.2500000 0.013828165 1.3591763 34
## [9462] {rolls/buns,
## whipped/sour_cream} => {tropical_fruit} 0.003457041 0.2361111 0.014641586 2.2501480 34
## [9463] {tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.007829181 0.5661765 0.013828165 2.9260881 77
## [9464] {other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.007829181 0.2711268 0.028876462 2.5838485 77
## [9465] {other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.007829181 0.2181303 0.035892222 3.0429952 77
## [9466] {tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.007930859 0.5735294 0.013828165 2.2445928 78
## [9467] {whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.007930859 0.2460568 0.032231825 2.3449307 78
## [9468] {soda,
## whipped/sour_cream} => {root_vegetables} 0.002541942 0.2192982 0.011591256 2.0119387 25
## [9469] {root_vegetables,
## whipped/sour_cream} => {yogurt} 0.006405694 0.3750000 0.017081851 2.6881378 63
## [9470] {whipped/sour_cream,
## yogurt} => {root_vegetables} 0.006405694 0.3088235 0.020742247 2.8332830 63
## [9471] {root_vegetables,
## yogurt} => {whipped/sour_cream} 0.006405694 0.2480315 0.025826131 3.4601273 63
## [9472] {root_vegetables,
## whipped/sour_cream} => {rolls/buns} 0.004372140 0.2559524 0.017081851 1.3915377 43
## [9473] {rolls/buns,
## whipped/sour_cream} => {root_vegetables} 0.004372140 0.2986111 0.014641586 2.7395898 43
## [9474] {root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.008540925 0.5000000 0.017081851 2.5840778 84
## [9475] {other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.008540925 0.2957746 0.028876462 2.7135668 84
## [9476] {root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.009456024 0.5535714 0.017081851 2.1664843 93
## [9477] {whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.009456024 0.2933754 0.032231825 2.6915550 93
## [9478] {soda,
## whipped/sour_cream} => {yogurt} 0.004067107 0.3508772 0.011591256 2.5152166 40
## [9479] {soda,
## whipped/sour_cream} => {rolls/buns} 0.003152008 0.2719298 0.011591256 1.4784023 31
## [9480] {rolls/buns,
## whipped/sour_cream} => {soda} 0.003152008 0.2152778 0.014641586 1.2345522 31
## [9481] {soda,
## whipped/sour_cream} => {other_vegetables} 0.004880529 0.4210526 0.011591256 2.1760655 48
## [9482] {soda,
## whipped/sour_cream} => {whole_milk} 0.005490595 0.4736842 0.011591256 1.8538337 54
## [9483] {whipped/sour_cream,
## yogurt} => {rolls/buns} 0.004778851 0.2303922 0.020742247 1.2525743 47
## [9484] {rolls/buns,
## whipped/sour_cream} => {yogurt} 0.004778851 0.3263889 0.014641586 2.3396755 47
## [9485] {whipped/sour_cream,
## yogurt} => {other_vegetables} 0.010167768 0.4901961 0.020742247 2.5334096 100
## [9486] {other_vegetables,
## whipped/sour_cream} => {yogurt} 0.010167768 0.3521127 0.028876462 2.5240730 100
## [9487] {other_vegetables,
## yogurt} => {whipped/sour_cream} 0.010167768 0.2341920 0.043416370 3.2670620 100
## [9488] {whipped/sour_cream,
## yogurt} => {whole_milk} 0.010879512 0.5245098 0.020742247 2.0527473 107
## [9489] {whipped/sour_cream,
## whole_milk} => {yogurt} 0.010879512 0.3375394 0.032231825 2.4196066 107
## [9490] {rolls/buns,
## whipped/sour_cream} => {other_vegetables} 0.006710727 0.4583333 0.014641586 2.3687380 66
## [9491] {other_vegetables,
## whipped/sour_cream} => {rolls/buns} 0.006710727 0.2323944 0.028876462 1.2634597 66
## [9492] {rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.007829181 0.5347222 0.014641586 2.0927151 77
## [9493] {whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.007829181 0.2429022 0.032231825 1.3205877 77
## [9494] {other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.014641586 0.5070423 0.028876462 1.9843854 144
## [9495] {whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.014641586 0.4542587 0.032231825 2.3476795 144
## [9496] {pastry,
## pip_fruit} => {sausage} 0.002541942 0.2380952 0.010676157 2.5342713 25
## [9497] {pip_fruit,
## sausage} => {pastry} 0.002541942 0.2358491 0.010777834 2.6509434 25
## [9498] {pastry,
## sausage} => {pip_fruit} 0.002541942 0.2032520 0.012506355 2.6868061 25
## [9499] {pastry,
## pip_fruit} => {tropical_fruit} 0.003762074 0.3523810 0.010676157 3.3582041 37
## [9500] {pastry,
## tropical_fruit} => {pip_fruit} 0.003762074 0.2846154 0.013218099 3.7623553 37
## [9501] {pastry,
## pip_fruit} => {root_vegetables} 0.002440264 0.2285714 0.010676157 2.0970149 24
## [9502] {pastry,
## root_vegetables} => {pip_fruit} 0.002440264 0.2222222 0.010981190 2.9375747 24
## [9503] {pastry,
## pip_fruit} => {soda} 0.002338587 0.2190476 0.010676157 1.2561710 23
## [9504] {pastry,
## pip_fruit} => {yogurt} 0.003558719 0.3333333 0.010676157 2.3894558 35
## [9505] {pastry,
## yogurt} => {pip_fruit} 0.003558719 0.2011494 0.017691917 2.6590116 35
## [9506] {pastry,
## pip_fruit} => {rolls/buns} 0.002745297 0.2571429 0.010676157 1.3980100 27
## [9507] {pastry,
## pip_fruit} => {other_vegetables} 0.004677173 0.4380952 0.010676157 2.2641443 46
## [9508] {other_vegetables,
## pastry} => {pip_fruit} 0.004677173 0.2072072 0.022572445 2.7390899 46
## [9509] {pastry,
## pip_fruit} => {whole_milk} 0.005083884 0.4761905 0.010676157 1.8636424 50
## [9510] {pip_fruit,
## shopping_bags} => {citrus_fruit} 0.002643620 0.2826087 0.009354347 3.4145658 26
## [9511] {citrus_fruit,
## shopping_bags} => {pip_fruit} 0.002643620 0.2708333 0.009761057 3.5801691 26
## [9512] {bottled_water,
## pip_fruit} => {citrus_fruit} 0.002236909 0.2115385 0.010574479 2.5558732 22
## [9513] {citrus_fruit,
## pip_fruit} => {tropical_fruit} 0.005592272 0.4044118 0.013828165 3.8540598 55
## [9514] {pip_fruit,
## tropical_fruit} => {citrus_fruit} 0.005592272 0.2736318 0.020437214 3.3061046 55
## [9515] {citrus_fruit,
## tropical_fruit} => {pip_fruit} 0.005592272 0.2806122 0.019928826 3.7094374 55
## [9516] {citrus_fruit,
## pip_fruit} => {root_vegetables} 0.003863752 0.2794118 0.013828165 2.5634466 38
## [9517] {pip_fruit,
## root_vegetables} => {citrus_fruit} 0.003863752 0.2483660 0.015556685 3.0008351 38
## [9518] {citrus_fruit,
## root_vegetables} => {pip_fruit} 0.003863752 0.2183908 0.017691917 2.8869268 38
## [9519] {citrus_fruit,
## pip_fruit} => {yogurt} 0.003253686 0.2352941 0.013828165 1.6866747 32
## [9520] {citrus_fruit,
## pip_fruit} => {other_vegetables} 0.005897306 0.4264706 0.013828165 2.2040663 58
## [9521] {other_vegetables,
## pip_fruit} => {citrus_fruit} 0.005897306 0.2256809 0.026131164 2.7267469 58
## [9522] {citrus_fruit,
## other_vegetables} => {pip_fruit} 0.005897306 0.2042254 0.028876462 2.6996725 58
## [9523] {citrus_fruit,
## pip_fruit} => {whole_milk} 0.005185562 0.3750000 0.013828165 1.4676184 51
## [9524] {pip_fruit,
## shopping_bags} => {tropical_fruit} 0.003253686 0.3478261 0.009354347 3.3147961 32
## [9525] {shopping_bags,
## tropical_fruit} => {pip_fruit} 0.003253686 0.2406015 0.013523132 3.1805320 32
## [9526] {pip_fruit,
## shopping_bags} => {root_vegetables} 0.002541942 0.2717391 0.009354347 2.4930544 25
## [9527] {pip_fruit,
## shopping_bags} => {soda} 0.002033554 0.2173913 0.009354347 1.2466726 20
## [9528] {pip_fruit,
## shopping_bags} => {yogurt} 0.002338587 0.2500000 0.009354347 1.7920918 23
## [9529] {pip_fruit,
## shopping_bags} => {other_vegetables} 0.002948653 0.3152174 0.009354347 1.6290925 29
## [9530] {pip_fruit,
## shopping_bags} => {whole_milk} 0.003355363 0.3586957 0.009354347 1.4038089 33
## [9531] {pip_fruit,
## sausage} => {bottled_water} 0.002236909 0.2075472 0.010777834 1.8778532 22
## [9532] {bottled_water,
## pip_fruit} => {sausage} 0.002236909 0.2115385 0.010574479 2.2516026 22
## [9533] {pip_fruit,
## sausage} => {tropical_fruit} 0.003050330 0.2830189 0.010777834 2.6971808 30
## [9534] {sausage,
## tropical_fruit} => {pip_fruit} 0.003050330 0.2189781 0.013929842 2.8946904 30
## [9535] {pip_fruit,
## sausage} => {root_vegetables} 0.002541942 0.2358491 0.010777834 2.1637831 25
## [9536] {pip_fruit,
## sausage} => {soda} 0.002948653 0.2735849 0.010777834 1.5689257 29
## [9537] {pip_fruit,
## soda} => {sausage} 0.002948653 0.2213740 0.013319776 2.3562919 29
## [9538] {pip_fruit,
## sausage} => {yogurt} 0.003965430 0.3679245 0.010777834 2.6374182 39
## [9539] {pip_fruit,
## yogurt} => {sausage} 0.003965430 0.2203390 0.017996950 2.3452748 39
## [9540] {sausage,
## yogurt} => {pip_fruit} 0.003965430 0.2020725 0.019623793 2.6712143 39
## [9541] {pip_fruit,
## sausage} => {rolls/buns} 0.002745297 0.2547170 0.010777834 1.3848212 27
## [9542] {pip_fruit,
## sausage} => {other_vegetables} 0.003660397 0.3396226 0.010777834 1.7552226 36
## [9543] {pip_fruit,
## sausage} => {whole_milk} 0.005592272 0.5188679 0.010777834 2.0306669 55
## [9544] {bottled_water,
## pip_fruit} => {tropical_fruit} 0.002846975 0.2692308 0.010574479 2.5657797 28
## [9545] {bottled_water,
## pip_fruit} => {root_vegetables} 0.002236909 0.2115385 0.010574479 1.9407470 22
## [9546] {bottled_water,
## pip_fruit} => {soda} 0.002643620 0.2500000 0.010574479 1.4336735 26
## [9547] {bottled_water,
## pip_fruit} => {yogurt} 0.003050330 0.2884615 0.010574479 2.0677983 30
## [9548] {bottled_water,
## pip_fruit} => {rolls/buns} 0.002338587 0.2211538 0.010574479 1.2023483 23
## [9549] {bottled_water,
## pip_fruit} => {other_vegetables} 0.003050330 0.2884615 0.010574479 1.4908141 30
## [9550] {bottled_water,
## pip_fruit} => {whole_milk} 0.004575496 0.4326923 0.010574479 1.6934058 45
## [9551] {pip_fruit,
## tropical_fruit} => {root_vegetables} 0.005287239 0.2587065 0.020437214 2.3734870 52
## [9552] {pip_fruit,
## root_vegetables} => {tropical_fruit} 0.005287239 0.3398693 0.015556685 3.2389674 52
## [9553] {root_vegetables,
## tropical_fruit} => {pip_fruit} 0.005287239 0.2512077 0.021047280 3.3207366 52
## [9554] {pip_fruit,
## soda} => {tropical_fruit} 0.003863752 0.2900763 0.013319776 2.7644387 38
## [9555] {pip_fruit,
## tropical_fruit} => {yogurt} 0.006405694 0.3134328 0.020437214 2.2468017 63
## [9556] {pip_fruit,
## yogurt} => {tropical_fruit} 0.006405694 0.3559322 0.017996950 3.3920477 63
## [9557] {tropical_fruit,
## yogurt} => {pip_fruit} 0.006405694 0.2187500 0.029283172 2.8916751 63
## [9558] {pip_fruit,
## tropical_fruit} => {rolls/buns} 0.004473818 0.2189055 0.020437214 1.1901246 44
## [9559] {pip_fruit,
## rolls/buns} => {tropical_fruit} 0.004473818 0.3211679 0.013929842 3.0607424 44
## [9560] {pip_fruit,
## tropical_fruit} => {other_vegetables} 0.009456024 0.4626866 0.020437214 2.3912361 93
## [9561] {other_vegetables,
## pip_fruit} => {tropical_fruit} 0.009456024 0.3618677 0.026131164 3.4486132 93
## [9562] {other_vegetables,
## tropical_fruit} => {pip_fruit} 0.009456024 0.2634561 0.035892222 3.4826487 93
## [9563] {pip_fruit,
## tropical_fruit} => {whole_milk} 0.008439248 0.4129353 0.020437214 1.6160839 83
## [9564] {pip_fruit,
## whole_milk} => {tropical_fruit} 0.008439248 0.2804054 0.030096594 2.6722744 83
## [9565] {pip_fruit,
## soda} => {root_vegetables} 0.002846975 0.2137405 0.013319776 1.9609491 28
## [9566] {pip_fruit,
## root_vegetables} => {yogurt} 0.005287239 0.3398693 0.015556685 2.4363079 52
## [9567] {pip_fruit,
## yogurt} => {root_vegetables} 0.005287239 0.2937853 0.017996950 2.6953158 52
## [9568] {root_vegetables,
## yogurt} => {pip_fruit} 0.005287239 0.2047244 0.025826131 2.7062696 52
## [9569] {pip_fruit,
## root_vegetables} => {rolls/buns} 0.003253686 0.2091503 0.015556685 1.1370887 32
## [9570] {pip_fruit,
## rolls/buns} => {root_vegetables} 0.003253686 0.2335766 0.013929842 2.1429350 32
## [9571] {pip_fruit,
## root_vegetables} => {other_vegetables} 0.008134215 0.5228758 0.015556685 2.7023036 80
## [9572] {other_vegetables,
## pip_fruit} => {root_vegetables} 0.008134215 0.3112840 0.026131164 2.8558569 80
## [9573] {pip_fruit,
## root_vegetables} => {whole_milk} 0.008947636 0.5751634 0.015556685 2.2509877 88
## [9574] {pip_fruit,
## whole_milk} => {root_vegetables} 0.008947636 0.2972973 0.030096594 2.7275363 88
## [9575] {pip_fruit,
## soda} => {yogurt} 0.003863752 0.2900763 0.013319776 2.0793737 38
## [9576] {pip_fruit,
## yogurt} => {soda} 0.003863752 0.2146893 0.017996950 1.2311772 38
## [9577] {pip_fruit,
## soda} => {rolls/buns} 0.003558719 0.2671756 0.013319776 1.4525549 35
## [9578] {pip_fruit,
## rolls/buns} => {soda} 0.003558719 0.2554745 0.013929842 1.4650678 35
## [9579] {pip_fruit,
## soda} => {other_vegetables} 0.004677173 0.3511450 0.013319776 1.8147722 46
## [9580] {pip_fruit,
## soda} => {whole_milk} 0.004982206 0.3740458 0.013319776 1.4638840 49
## [9581] {pip_fruit,
## yogurt} => {rolls/buns} 0.003965430 0.2203390 0.017996950 1.1979181 39
## [9582] {pip_fruit,
## rolls/buns} => {yogurt} 0.003965430 0.2846715 0.013929842 2.0406301 39
## [9583] {pip_fruit,
## yogurt} => {other_vegetables} 0.008134215 0.4519774 0.017996950 2.3358895 80
## [9584] {other_vegetables,
## pip_fruit} => {yogurt} 0.008134215 0.3112840 0.026131164 2.2313984 80
## [9585] {pip_fruit,
## yogurt} => {whole_milk} 0.009557702 0.5310734 0.017996950 2.0784351 94
## [9586] {pip_fruit,
## whole_milk} => {yogurt} 0.009557702 0.3175676 0.030096594 2.2764410 94
## [9587] {pip_fruit,
## rolls/buns} => {other_vegetables} 0.005083884 0.3649635 0.013929842 1.8861882 50
## [9588] {pip_fruit,
## rolls/buns} => {whole_milk} 0.006202339 0.4452555 0.013929842 1.7425737 61
## [9589] {pip_fruit,
## whole_milk} => {rolls/buns} 0.006202339 0.2060811 0.030096594 1.1204021 61
## [9590] {other_vegetables,
## pip_fruit} => {whole_milk} 0.013523132 0.5175097 0.026131164 2.0253514 133
## [9591] {pip_fruit,
## whole_milk} => {other_vegetables} 0.013523132 0.4493243 0.030096594 2.3221780 133
## [9592] {citrus_fruit,
## pastry} => {tropical_fruit} 0.002643620 0.2708333 0.009761057 2.5810522 26
## [9593] {pastry,
## tropical_fruit} => {citrus_fruit} 0.002643620 0.2000000 0.013218099 2.4164619 26
## [9594] {citrus_fruit,
## pastry} => {soda} 0.002033554 0.2083333 0.009761057 1.1947279 20
## [9595] {citrus_fruit,
## pastry} => {yogurt} 0.002948653 0.3020833 0.009761057 2.1654443 29
## [9596] {citrus_fruit,
## pastry} => {rolls/buns} 0.003050330 0.3125000 0.009761057 1.6989704 30
## [9597] {citrus_fruit,
## pastry} => {other_vegetables} 0.003253686 0.3333333 0.009761057 1.7227185 32
## [9598] {citrus_fruit,
## pastry} => {whole_milk} 0.004880529 0.5000000 0.009761057 1.9568245 48
## [9599] {pastry,
## shopping_bags} => {soda} 0.004168785 0.3504274 0.011896289 2.0095936 41
## [9600] {pastry,
## shopping_bags} => {yogurt} 0.002745297 0.2307692 0.011896289 1.6542386 27
## [9601] {pastry,
## shopping_bags} => {rolls/buns} 0.002541942 0.2136752 0.011896289 1.1616892 25
## [9602] {pastry,
## shopping_bags} => {other_vegetables} 0.003355363 0.2820513 0.011896289 1.4576849 33
## [9603] {pastry,
## shopping_bags} => {whole_milk} 0.004575496 0.3846154 0.011896289 1.5052496 45
## [9604] {pastry,
## sausage} => {tropical_fruit} 0.002948653 0.2357724 0.012506355 2.2469197 29
## [9605] {pastry,
## tropical_fruit} => {sausage} 0.002948653 0.2230769 0.013218099 2.3744172 29
## [9606] {sausage,
## tropical_fruit} => {pastry} 0.002948653 0.2116788 0.013929842 2.3792701 29
## [9607] {pastry,
## root_vegetables} => {sausage} 0.002338587 0.2129630 0.010981190 2.2667649 23
## [9608] {pastry,
## sausage} => {soda} 0.003457041 0.2764228 0.012506355 1.5851999 34
## [9609] {pastry,
## sausage} => {yogurt} 0.004270463 0.3414634 0.012506355 2.4477352 42
## [9610] {pastry,
## yogurt} => {sausage} 0.004270463 0.2413793 0.017691917 2.5692268 42
## [9611] {sausage,
## yogurt} => {pastry} 0.004270463 0.2176166 0.019623793 2.4460104 42
## [9612] {pastry,
## sausage} => {rolls/buns} 0.003863752 0.3089431 0.012506355 1.6796326 38
## [9613] {pastry,
## sausage} => {other_vegetables} 0.003965430 0.3170732 0.012506355 1.6386835 39
## [9614] {pastry,
## sausage} => {whole_milk} 0.005693950 0.4552846 0.012506355 1.7818239 56
## [9615] {bottled_water,
## pastry} => {tropical_fruit} 0.001931876 0.2159091 0.008947636 2.0576220 19
## [9616] {bottled_water,
## pastry} => {soda} 0.002948653 0.3295455 0.008947636 1.8898423 29
## [9617] {bottled_water,
## pastry} => {yogurt} 0.003152008 0.3522727 0.008947636 2.5252203 31
## [9618] {bottled_water,
## pastry} => {rolls/buns} 0.003050330 0.3409091 0.008947636 1.8534223 30
## [9619] {bottled_water,
## pastry} => {other_vegetables} 0.002846975 0.3181818 0.008947636 1.6444131 28
## [9620] {bottled_water,
## pastry} => {whole_milk} 0.004067107 0.4545455 0.008947636 1.7789314 40
## [9621] {pastry,
## root_vegetables} => {tropical_fruit} 0.002338587 0.2129630 0.010981190 2.0295453 23
## [9622] {pastry,
## tropical_fruit} => {soda} 0.003152008 0.2384615 0.013218099 1.3675039 31
## [9623] {pastry,
## tropical_fruit} => {yogurt} 0.004677173 0.3538462 0.013218099 2.5364992 46
## [9624] {pastry,
## yogurt} => {tropical_fruit} 0.004677173 0.2643678 0.017691917 2.5194355 46
## [9625] {pastry,
## tropical_fruit} => {rolls/buns} 0.004067107 0.3076923 0.013218099 1.6728324 40
## [9626] {pastry,
## tropical_fruit} => {other_vegetables} 0.005083884 0.3846154 0.013218099 1.9877521 50
## [9627] {other_vegetables,
## pastry} => {tropical_fruit} 0.005083884 0.2252252 0.022572445 2.1464051 50
## [9628] {pastry,
## tropical_fruit} => {whole_milk} 0.006710727 0.5076923 0.013218099 1.9869295 66
## [9629] {pastry,
## whole_milk} => {tropical_fruit} 0.006710727 0.2018349 0.033248602 1.9234941 66
## [9630] {pastry,
## root_vegetables} => {soda} 0.002440264 0.2222222 0.010981190 1.2743764 24
## [9631] {pastry,
## root_vegetables} => {yogurt} 0.003762074 0.3425926 0.010981190 2.4558296 37
## [9632] {pastry,
## yogurt} => {root_vegetables} 0.003762074 0.2126437 0.017691917 1.9508867 37
## [9633] {pastry,
## root_vegetables} => {rolls/buns} 0.003762074 0.3425926 0.010981190 1.8625750 37
## [9634] {pastry,
## root_vegetables} => {other_vegetables} 0.005897306 0.5370370 0.010981190 2.7754909 58
## [9635] {other_vegetables,
## pastry} => {root_vegetables} 0.005897306 0.2612613 0.022572445 2.3969258 58
## [9636] {pastry,
## root_vegetables} => {whole_milk} 0.005693950 0.5185185 0.010981190 2.0292995 56
## [9637] {pastry,
## soda} => {yogurt} 0.004982206 0.2367150 0.021047280 1.6968599 49
## [9638] {pastry,
## yogurt} => {soda} 0.004982206 0.2816092 0.017691917 1.6149425 49
## [9639] {pastry,
## soda} => {rolls/buns} 0.005388917 0.2560386 0.021047280 1.3920067 53
## [9640] {pastry,
## rolls/buns} => {soda} 0.005388917 0.2572816 0.020945602 1.4754309 53
## [9641] {pastry,
## soda} => {other_vegetables} 0.005490595 0.2608696 0.021047280 1.3482145 54
## [9642] {other_vegetables,
## pastry} => {soda} 0.005490595 0.2432432 0.022572445 1.3949255 54
## [9643] {pastry,
## soda} => {whole_milk} 0.008235892 0.3913043 0.021047280 1.5314279 81
## [9644] {pastry,
## whole_milk} => {soda} 0.008235892 0.2477064 0.033248602 1.4205205 81
## [9645] {soda,
## whole_milk} => {pastry} 0.008235892 0.2055838 0.040061007 2.3107614 81
## [9646] {pastry,
## yogurt} => {rolls/buns} 0.005795628 0.3275862 0.017691917 1.7809897 57
## [9647] {pastry,
## rolls/buns} => {yogurt} 0.005795628 0.2766990 0.020945602 1.9834803 57
## [9648] {pastry,
## yogurt} => {other_vegetables} 0.006609049 0.3735632 0.017691917 1.9306328 65
## [9649] {other_vegetables,
## pastry} => {yogurt} 0.006609049 0.2927928 0.022572445 2.0988463 65
## [9650] {pastry,
## yogurt} => {whole_milk} 0.009150991 0.5172414 0.017691917 2.0243012 90
## [9651] {pastry,
## whole_milk} => {yogurt} 0.009150991 0.2752294 0.033248602 1.9729451 90
## [9652] {pastry,
## rolls/buns} => {other_vegetables} 0.006100661 0.2912621 0.020945602 1.5052880 60
## [9653] {other_vegetables,
## pastry} => {rolls/buns} 0.006100661 0.2702703 0.022572445 1.4693798 60
## [9654] {pastry,
## rolls/buns} => {whole_milk} 0.008540925 0.4077670 0.020945602 1.5958569 84
## [9655] {pastry,
## whole_milk} => {rolls/buns} 0.008540925 0.2568807 0.033248602 1.3965849 84
## [9656] {other_vegetables,
## pastry} => {whole_milk} 0.010574479 0.4684685 0.022572445 1.8334212 104
## [9657] {pastry,
## whole_milk} => {other_vegetables} 0.010574479 0.3180428 0.033248602 1.6436947 104
## [9658] {citrus_fruit,
## shopping_bags} => {tropical_fruit} 0.002338587 0.2395833 0.009761057 2.2832385 23
## [9659] {citrus_fruit,
## shopping_bags} => {soda} 0.002236909 0.2291667 0.009761057 1.3142007 22
## [9660] {citrus_fruit,
## shopping_bags} => {yogurt} 0.002338587 0.2395833 0.009761057 1.7174213 23
## [9661] {citrus_fruit,
## shopping_bags} => {other_vegetables} 0.002948653 0.3020833 0.009761057 1.5612137 29
## [9662] {citrus_fruit,
## shopping_bags} => {whole_milk} 0.002948653 0.3020833 0.009761057 1.1822481 29
## [9663] {citrus_fruit,
## sausage} => {tropical_fruit} 0.002440264 0.2162162 0.011286223 2.0605489 24
## [9664] {citrus_fruit,
## sausage} => {root_vegetables} 0.002948653 0.2612613 0.011286223 2.3969258 29
## [9665] {citrus_fruit,
## sausage} => {soda} 0.003253686 0.2882883 0.011286223 1.6532451 32
## [9666] {citrus_fruit,
## soda} => {sausage} 0.003253686 0.2539683 0.012811388 2.7032227 32
## [9667] {citrus_fruit,
## sausage} => {yogurt} 0.003863752 0.3423423 0.011286223 2.4540357 38
## [9668] {citrus_fruit,
## sausage} => {rolls/buns} 0.002541942 0.2252252 0.011286223 1.2244832 25
## [9669] {citrus_fruit,
## sausage} => {other_vegetables} 0.004473818 0.3963964 0.011286223 2.0486382 44
## [9670] {citrus_fruit,
## sausage} => {whole_milk} 0.004982206 0.4414414 0.011286223 1.7276469 49
## [9671] {bottled_water,
## citrus_fruit} => {tropical_fruit} 0.004168785 0.3082707 0.013523132 2.9378315 41
## [9672] {citrus_fruit,
## tropical_fruit} => {bottled_water} 0.004168785 0.2091837 0.019928826 1.8926600 41
## [9673] {bottled_water,
## tropical_fruit} => {citrus_fruit} 0.004168785 0.2252747 0.018505338 2.7218390 41
## [9674] {bottled_water,
## citrus_fruit} => {root_vegetables} 0.003355363 0.2481203 0.013523132 2.2763649 33
## [9675] {bottled_water,
## root_vegetables} => {citrus_fruit} 0.003355363 0.2142857 0.015658363 2.5890663 33
## [9676] {bottled_water,
## citrus_fruit} => {soda} 0.002745297 0.2030075 0.013523132 1.1641860 27
## [9677] {citrus_fruit,
## soda} => {bottled_water} 0.002745297 0.2142857 0.012811388 1.9388224 27
## [9678] {bottled_water,
## citrus_fruit} => {yogurt} 0.004067107 0.3007519 0.013523132 2.1559000 40
## [9679] {bottled_water,
## citrus_fruit} => {rolls/buns} 0.003152008 0.2330827 0.013523132 1.2672020 31
## [9680] {bottled_water,
## citrus_fruit} => {other_vegetables} 0.005083884 0.3759398 0.013523132 1.9429156 50
## [9681] {bottled_water,
## other_vegetables} => {citrus_fruit} 0.005083884 0.2049180 0.024809354 2.4758831 50
## [9682] {bottled_water,
## citrus_fruit} => {whole_milk} 0.005897306 0.4360902 0.013523132 1.7067041 58
## [9683] {citrus_fruit,
## tropical_fruit} => {root_vegetables} 0.005693950 0.2857143 0.019928826 2.6212687 56
## [9684] {citrus_fruit,
## root_vegetables} => {tropical_fruit} 0.005693950 0.3218391 0.017691917 3.0671389 56
## [9685] {root_vegetables,
## tropical_fruit} => {citrus_fruit} 0.005693950 0.2705314 0.021047280 3.2686441 56
## [9686] {citrus_fruit,
## soda} => {tropical_fruit} 0.003457041 0.2698413 0.012811388 2.5715978 34
## [9687] {citrus_fruit,
## tropical_fruit} => {yogurt} 0.006304016 0.3163265 0.019928826 2.2675448 62
## [9688] {citrus_fruit,
## yogurt} => {tropical_fruit} 0.006304016 0.2910798 0.021657346 2.7740019 62
## [9689] {tropical_fruit,
## yogurt} => {citrus_fruit} 0.006304016 0.2152778 0.029283172 2.6010528 62
## [9690] {citrus_fruit,
## tropical_fruit} => {rolls/buns} 0.004372140 0.2193878 0.019928826 1.1927466 43
## [9691] {citrus_fruit,
## rolls/buns} => {tropical_fruit} 0.004372140 0.2606061 0.016776817 2.4835859 43
## [9692] {citrus_fruit,
## tropical_fruit} => {other_vegetables} 0.009049314 0.4540816 0.019928826 2.3467645 89
## [9693] {citrus_fruit,
## other_vegetables} => {tropical_fruit} 0.009049314 0.3133803 0.028876462 2.9865262 89
## [9694] {other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.009049314 0.2521246 0.035892222 3.0462480 89
## [9695] {citrus_fruit,
## tropical_fruit} => {whole_milk} 0.009049314 0.4540816 0.019928826 1.7771161 89
## [9696] {citrus_fruit,
## whole_milk} => {tropical_fruit} 0.009049314 0.2966667 0.030503305 2.8272448 89
## [9697] {tropical_fruit,
## whole_milk} => {citrus_fruit} 0.009049314 0.2139423 0.042297916 2.5849172 89
## [9698] {citrus_fruit,
## soda} => {root_vegetables} 0.003050330 0.2380952 0.012811388 2.1843905 30
## [9699] {citrus_fruit,
## root_vegetables} => {yogurt} 0.004880529 0.2758621 0.017691917 1.9774806 48
## [9700] {citrus_fruit,
## yogurt} => {root_vegetables} 0.004880529 0.2253521 0.021657346 2.0674795 48
## [9701] {citrus_fruit,
## rolls/buns} => {root_vegetables} 0.003457041 0.2060606 0.016776817 1.8904907 34
## [9702] {citrus_fruit,
## root_vegetables} => {other_vegetables} 0.010371124 0.5862069 0.017691917 3.0296084 102
## [9703] {citrus_fruit,
## other_vegetables} => {root_vegetables} 0.010371124 0.3591549 0.028876462 3.2950455 102
## [9704] {other_vegetables,
## root_vegetables} => {citrus_fruit} 0.010371124 0.2188841 0.047381800 2.6446257 102
## [9705] {citrus_fruit,
## root_vegetables} => {whole_milk} 0.009150991 0.5172414 0.017691917 2.0243012 90
## [9706] {citrus_fruit,
## whole_milk} => {root_vegetables} 0.009150991 0.3000000 0.030503305 2.7523321 90
## [9707] {citrus_fruit,
## soda} => {yogurt} 0.004168785 0.3253968 0.012811388 2.3325640 41
## [9708] {citrus_fruit,
## soda} => {rolls/buns} 0.003355363 0.2619048 0.012811388 1.4238990 33
## [9709] {citrus_fruit,
## rolls/buns} => {soda} 0.003355363 0.2000000 0.016776817 1.1469388 33
## [9710] {citrus_fruit,
## soda} => {other_vegetables} 0.004168785 0.3253968 0.012811388 1.6817014 41
## [9711] {citrus_fruit,
## soda} => {whole_milk} 0.004473818 0.3492063 0.012811388 1.3666711 44
## [9712] {citrus_fruit,
## yogurt} => {rolls/buns} 0.005795628 0.2676056 0.021657346 1.4548930 57
## [9713] {citrus_fruit,
## rolls/buns} => {yogurt} 0.005795628 0.3454545 0.016776817 2.4763451 57
## [9714] {citrus_fruit,
## yogurt} => {other_vegetables} 0.007625826 0.3521127 0.021657346 1.8197731 75
## [9715] {citrus_fruit,
## other_vegetables} => {yogurt} 0.007625826 0.2640845 0.028876462 1.8930548 75
## [9716] {citrus_fruit,
## yogurt} => {whole_milk} 0.010269446 0.4741784 0.021657346 1.8557678 101
## [9717] {citrus_fruit,
## whole_milk} => {yogurt} 0.010269446 0.3366667 0.030503305 2.4133503 101
## [9718] {citrus_fruit,
## rolls/buns} => {other_vegetables} 0.005998983 0.3575758 0.016776817 1.8480071 59
## [9719] {citrus_fruit,
## other_vegetables} => {rolls/buns} 0.005998983 0.2077465 0.028876462 1.1294564 59
## [9720] {citrus_fruit,
## rolls/buns} => {whole_milk} 0.007219115 0.4303030 0.016776817 1.6840550 71
## [9721] {citrus_fruit,
## whole_milk} => {rolls/buns} 0.007219115 0.2366667 0.030503305 1.2866869 71
## [9722] {citrus_fruit,
## other_vegetables} => {whole_milk} 0.013014743 0.4507042 0.028876462 1.7638982 128
## [9723] {citrus_fruit,
## whole_milk} => {other_vegetables} 0.013014743 0.4266667 0.030503305 2.2050797 128
## [9724] {bottled_water,
## shopping_bags} => {sausage} 0.002541942 0.2314815 0.010981190 2.4638749 25
## [9725] {bottled_water,
## sausage} => {shopping_bags} 0.002541942 0.2118644 0.011997966 2.1503472 25
## [9726] {sausage,
## shopping_bags} => {soda} 0.005693950 0.3636364 0.015658363 2.0853432 56
## [9727] {shopping_bags,
## soda} => {sausage} 0.005693950 0.2314050 0.024605999 2.4630604 56
## [9728] {sausage,
## soda} => {shopping_bags} 0.005693950 0.2343096 0.024300966 2.3781580 56
## [9729] {sausage,
## shopping_bags} => {yogurt} 0.003457041 0.2207792 0.015658363 1.5826266 34
## [9730] {shopping_bags,
## yogurt} => {sausage} 0.003457041 0.2266667 0.015251652 2.4126263 34
## [9731] {sausage,
## shopping_bags} => {rolls/buns} 0.005998983 0.3831169 0.015658363 2.0828936 59
## [9732] {rolls/buns,
## shopping_bags} => {sausage} 0.005998983 0.3072917 0.019522115 3.2707939 59
## [9733] {sausage,
## shopping_bags} => {other_vegetables} 0.005388917 0.3441558 0.015658363 1.7786509 53
## [9734] {other_vegetables,
## shopping_bags} => {sausage} 0.005388917 0.2324561 0.023182511 2.4742491 53
## [9735] {other_vegetables,
## sausage} => {shopping_bags} 0.005388917 0.2000000 0.026944586 2.0299278 53
## [9736] {sausage,
## shopping_bags} => {whole_milk} 0.003253686 0.2077922 0.015658363 0.8132258 32
## [9737] {bottled_water,
## shopping_bags} => {tropical_fruit} 0.002236909 0.2037037 0.010981190 1.9413042 22
## [9738] {bottled_water,
## shopping_bags} => {soda} 0.004067107 0.3703704 0.010981190 2.1239607 40
## [9739] {bottled_water,
## shopping_bags} => {yogurt} 0.002846975 0.2592593 0.010981190 1.8584656 28
## [9740] {bottled_water,
## shopping_bags} => {rolls/buns} 0.003050330 0.2777778 0.010981190 1.5101959 30
## [9741] {bottled_water,
## shopping_bags} => {other_vegetables} 0.003050330 0.2777778 0.010981190 1.4355988 30
## [9742] {shopping_bags,
## tropical_fruit} => {soda} 0.003660397 0.2706767 0.013523132 1.5522480 36
## [9743] {shopping_bags,
## tropical_fruit} => {yogurt} 0.003355363 0.2481203 0.013523132 1.7786175 33
## [9744] {shopping_bags,
## yogurt} => {tropical_fruit} 0.003355363 0.2200000 0.015251652 2.0966085 33
## [9745] {shopping_bags,
## tropical_fruit} => {rolls/buns} 0.003355363 0.2481203 0.013523132 1.3489570 33
## [9746] {shopping_bags,
## tropical_fruit} => {other_vegetables} 0.004778851 0.3533835 0.013523132 1.8263407 47
## [9747] {other_vegetables,
## shopping_bags} => {tropical_fruit} 0.004778851 0.2061404 0.023182511 1.9645255 47
## [9748] {shopping_bags,
## tropical_fruit} => {whole_milk} 0.004982206 0.3684211 0.013523132 1.4418707 49
## [9749] {shopping_bags,
## whole_milk} => {tropical_fruit} 0.004982206 0.2033195 0.024504321 1.9376427 49
## [9750] {root_vegetables,
## shopping_bags} => {yogurt} 0.002948653 0.2301587 0.012811388 1.6498623 29
## [9751] {root_vegetables,
## shopping_bags} => {other_vegetables} 0.006609049 0.5158730 0.012811388 2.6661120 65
## [9752] {other_vegetables,
## shopping_bags} => {root_vegetables} 0.006609049 0.2850877 0.023182511 2.6155203 65
## [9753] {root_vegetables,
## shopping_bags} => {whole_milk} 0.005287239 0.4126984 0.012811388 1.6151567 52
## [9754] {shopping_bags,
## whole_milk} => {root_vegetables} 0.005287239 0.2157676 0.024504321 1.9795473 52
## [9755] {shopping_bags,
## yogurt} => {soda} 0.004270463 0.2800000 0.015251652 1.6057143 42
## [9756] {shopping_bags,
## soda} => {rolls/buns} 0.006304016 0.2561983 0.024605999 1.3928749 62
## [9757] {rolls/buns,
## shopping_bags} => {soda} 0.006304016 0.3229167 0.019522115 1.8518282 62
## [9758] {shopping_bags,
## soda} => {other_vegetables} 0.005388917 0.2190083 0.024605999 1.1318688 53
## [9759] {other_vegetables,
## shopping_bags} => {soda} 0.005388917 0.2324561 0.023182511 1.3330648 53
## [9760] {shopping_bags,
## soda} => {whole_milk} 0.006812405 0.2768595 0.024605999 1.0835309 67
## [9761] {shopping_bags,
## whole_milk} => {soda} 0.006812405 0.2780083 0.024504321 1.5942925 67
## [9762] {shopping_bags,
## yogurt} => {rolls/buns} 0.003965430 0.2600000 0.015251652 1.4135434 39
## [9763] {rolls/buns,
## shopping_bags} => {yogurt} 0.003965430 0.2031250 0.019522115 1.4560746 39
## [9764] {shopping_bags,
## yogurt} => {other_vegetables} 0.005388917 0.3533333 0.015251652 1.8260816 53
## [9765] {other_vegetables,
## shopping_bags} => {yogurt} 0.005388917 0.2324561 0.023182511 1.6663310 53
## [9766] {shopping_bags,
## yogurt} => {whole_milk} 0.005287239 0.3466667 0.015251652 1.3567317 52
## [9767] {shopping_bags,
## whole_milk} => {yogurt} 0.005287239 0.2157676 0.024504321 1.5467017 52
## [9768] {rolls/buns,
## shopping_bags} => {other_vegetables} 0.005287239 0.2708333 0.019522115 1.3997088 52
## [9769] {other_vegetables,
## shopping_bags} => {rolls/buns} 0.005287239 0.2280702 0.023182511 1.2399503 52
## [9770] {rolls/buns,
## shopping_bags} => {whole_milk} 0.005287239 0.2708333 0.019522115 1.0599466 52
## [9771] {shopping_bags,
## whole_milk} => {rolls/buns} 0.005287239 0.2157676 0.024504321 1.1730651 52
## [9772] {other_vegetables,
## shopping_bags} => {whole_milk} 0.007625826 0.3289474 0.023182511 1.2873845 75
## [9773] {shopping_bags,
## whole_milk} => {other_vegetables} 0.007625826 0.3112033 0.024504321 1.6083472 75
## [9774] {bottled_water,
## sausage} => {tropical_fruit} 0.002745297 0.2288136 0.011997966 2.1806021 27
## [9775] {bottled_water,
## sausage} => {soda} 0.004067107 0.3389831 0.011997966 1.9439640 40
## [9776] {bottled_water,
## sausage} => {yogurt} 0.003965430 0.3305085 0.011997966 2.3692062 39
## [9777] {sausage,
## yogurt} => {bottled_water} 0.003965430 0.2020725 0.019623793 1.8283196 39
## [9778] {bottled_water,
## sausage} => {rolls/buns} 0.003965430 0.3305085 0.011997966 1.7968772 39
## [9779] {bottled_water,
## sausage} => {other_vegetables} 0.005083884 0.4237288 0.011997966 2.1898964 50
## [9780] {bottled_water,
## other_vegetables} => {sausage} 0.005083884 0.2049180 0.024809354 2.1811351 50
## [9781] {bottled_water,
## sausage} => {whole_milk} 0.003762074 0.3135593 0.011997966 1.2271611 37
## [9782] {sausage,
## tropical_fruit} => {root_vegetables} 0.003558719 0.2554745 0.013929842 2.3438351 35
## [9783] {root_vegetables,
## sausage} => {tropical_fruit} 0.003558719 0.2380952 0.014946619 2.2690568 35
## [9784] {sausage,
## tropical_fruit} => {soda} 0.003965430 0.2846715 0.013929842 1.6325041 39
## [9785] {sausage,
## tropical_fruit} => {yogurt} 0.004677173 0.3357664 0.013929842 2.4068971 46
## [9786] {sausage,
## yogurt} => {tropical_fruit} 0.004677173 0.2383420 0.019623793 2.2714082 46
## [9787] {sausage,
## tropical_fruit} => {rolls/buns} 0.003762074 0.2700730 0.013929842 1.4683073 37
## [9788] {sausage,
## tropical_fruit} => {other_vegetables} 0.005998983 0.4306569 0.013929842 2.2257020 59
## [9789] {other_vegetables,
## sausage} => {tropical_fruit} 0.005998983 0.2226415 0.026944586 2.1217822 59
## [9790] {sausage,
## tropical_fruit} => {whole_milk} 0.007219115 0.5182482 0.013929842 2.0282415 71
## [9791] {sausage,
## whole_milk} => {tropical_fruit} 0.007219115 0.2414966 0.029893238 2.3014719 71
## [9792] {root_vegetables,
## sausage} => {soda} 0.003660397 0.2448980 0.014946619 1.4044148 36
## [9793] {root_vegetables,
## sausage} => {yogurt} 0.005185562 0.3469388 0.014946619 2.4869846 51
## [9794] {sausage,
## yogurt} => {root_vegetables} 0.005185562 0.2642487 0.019623793 2.4243340 51
## [9795] {root_vegetables,
## yogurt} => {sausage} 0.005185562 0.2007874 0.025826131 2.1371689 51
## [9796] {root_vegetables,
## sausage} => {rolls/buns} 0.004982206 0.3333333 0.014946619 1.8122351 49
## [9797] {rolls/buns,
## root_vegetables} => {sausage} 0.004982206 0.2050209 0.024300966 2.1822303 49
## [9798] {root_vegetables,
## sausage} => {other_vegetables} 0.006812405 0.4557823 0.014946619 2.3555539 67
## [9799] {other_vegetables,
## sausage} => {root_vegetables} 0.006812405 0.2528302 0.026944586 2.3195755 67
## [9800] {root_vegetables,
## sausage} => {whole_milk} 0.007727504 0.5170068 0.014946619 2.0233832 76
## [9801] {sausage,
## whole_milk} => {root_vegetables} 0.007727504 0.2585034 0.029893238 2.3716240 76
## [9802] {sausage,
## soda} => {yogurt} 0.005592272 0.2301255 0.024300966 1.6496243 55
## [9803] {sausage,
## yogurt} => {soda} 0.005592272 0.2849741 0.019623793 1.6342392 55
## [9804] {soda,
## yogurt} => {sausage} 0.005592272 0.2044610 0.027351296 2.1762701 55
## [9805] {sausage,
## soda} => {rolls/buns} 0.009659380 0.3974895 0.024300966 2.1610335 95
## [9806] {rolls/buns,
## sausage} => {soda} 0.009659380 0.3156146 0.030604982 1.8099532 95
## [9807] {rolls/buns,
## soda} => {sausage} 0.009659380 0.2519894 0.038332486 2.6821598 95
## [9808] {sausage,
## soda} => {other_vegetables} 0.007219115 0.2970711 0.024300966 1.5353098 71
## [9809] {other_vegetables,
## sausage} => {soda} 0.007219115 0.2679245 0.026944586 1.5364652 71
## [9810] {other_vegetables,
## soda} => {sausage} 0.007219115 0.2204969 0.032740214 2.3469556 71
## [9811] {sausage,
## soda} => {whole_milk} 0.006710727 0.2761506 0.024300966 1.0807566 66
## [9812] {sausage,
## whole_milk} => {soda} 0.006710727 0.2244898 0.029893238 1.2873803 66
## [9813] {sausage,
## yogurt} => {rolls/buns} 0.005998983 0.3056995 0.019623793 1.6619980 59
## [9814] {sausage,
## yogurt} => {other_vegetables} 0.008134215 0.4145078 0.019623793 2.1422406 80
## [9815] {other_vegetables,
## sausage} => {yogurt} 0.008134215 0.3018868 0.026944586 2.1640354 80
## [9816] {sausage,
## yogurt} => {whole_milk} 0.008744281 0.4455959 0.019623793 1.7439058 86
## [9817] {sausage,
## whole_milk} => {yogurt} 0.008744281 0.2925170 0.029893238 2.0968694 86
## [9818] {rolls/buns,
## sausage} => {other_vegetables} 0.008845958 0.2890365 0.030604982 1.4937858 87
## [9819] {other_vegetables,
## sausage} => {rolls/buns} 0.008845958 0.3283019 0.026944586 1.7848806 87
## [9820] {other_vegetables,
## rolls/buns} => {sausage} 0.008845958 0.2076372 0.042602949 2.2100781 87
## [9821] {rolls/buns,
## sausage} => {whole_milk} 0.009354347 0.3056478 0.030604982 1.1961984 92
## [9822] {sausage,
## whole_milk} => {rolls/buns} 0.009354347 0.3129252 0.029893238 1.7012820 92
## [9823] {other_vegetables,
## sausage} => {whole_milk} 0.010167768 0.3773585 0.026944586 1.4768487 100
## [9824] {sausage,
## whole_milk} => {other_vegetables} 0.010167768 0.3401361 0.029893238 1.7578760 100
## [9825] {bottled_water,
## tropical_fruit} => {root_vegetables} 0.004575496 0.2472527 0.018505338 2.2684056 45
## [9826] {bottled_water,
## root_vegetables} => {tropical_fruit} 0.004575496 0.2922078 0.015658363 2.7847516 45
## [9827] {root_vegetables,
## tropical_fruit} => {bottled_water} 0.004575496 0.2173913 0.021047280 1.9669213 45
## [9828] {bottled_water,
## tropical_fruit} => {soda} 0.005185562 0.2802198 0.018505338 1.6069747 51
## [9829] {soda,
## tropical_fruit} => {bottled_water} 0.005185562 0.2487805 0.020843925 2.2509256 51
## [9830] {bottled_water,
## tropical_fruit} => {yogurt} 0.007117438 0.3846154 0.018505338 2.7570644 70
## [9831] {bottled_water,
## yogurt} => {tropical_fruit} 0.007117438 0.3097345 0.022979156 2.9517819 70
## [9832] {tropical_fruit,
## yogurt} => {bottled_water} 0.007117438 0.2430556 0.029283172 2.1991273 70
## [9833] {bottled_water,
## tropical_fruit} => {rolls/buns} 0.005388917 0.2912088 0.018505338 1.5832164 53
## [9834] {bottled_water,
## rolls/buns} => {tropical_fruit} 0.005388917 0.2226891 0.024199288 2.1222355 53
## [9835] {rolls/buns,
## tropical_fruit} => {bottled_water} 0.005388917 0.2190083 0.024605999 1.9815513 53
## [9836] {bottled_water,
## tropical_fruit} => {other_vegetables} 0.006202339 0.3351648 0.018505338 1.7321840 61
## [9837] {bottled_water,
## other_vegetables} => {tropical_fruit} 0.006202339 0.2500000 0.024809354 2.3825097 61
## [9838] {bottled_water,
## tropical_fruit} => {whole_milk} 0.008032537 0.4340659 0.018505338 1.6987817 79
## [9839] {bottled_water,
## whole_milk} => {tropical_fruit} 0.008032537 0.2337278 0.034367056 2.2274351 79
## [9840] {bottled_water,
## root_vegetables} => {soda} 0.003863752 0.2467532 0.015658363 1.4150543 38
## [9841] {root_vegetables,
## soda} => {bottled_water} 0.003863752 0.2076503 0.018607016 1.8787861 38
## [9842] {bottled_water,
## root_vegetables} => {yogurt} 0.003863752 0.2467532 0.015658363 1.7688179 38
## [9843] {bottled_water,
## root_vegetables} => {rolls/buns} 0.004168785 0.2662338 0.015658363 1.4474345 41
## [9844] {bottled_water,
## root_vegetables} => {other_vegetables} 0.007015760 0.4480519 0.015658363 2.3156022 69
## [9845] {bottled_water,
## other_vegetables} => {root_vegetables} 0.007015760 0.2827869 0.024809354 2.5944114 69
## [9846] {bottled_water,
## root_vegetables} => {whole_milk} 0.007320793 0.4675325 0.015658363 1.8297580 72
## [9847] {bottled_water,
## whole_milk} => {root_vegetables} 0.007320793 0.2130178 0.034367056 1.9543186 72
## [9848] {bottled_water,
## soda} => {yogurt} 0.007422471 0.2561404 0.028978139 1.8361081 73
## [9849] {bottled_water,
## yogurt} => {soda} 0.007422471 0.3230088 0.022979156 1.8523569 73
## [9850] {soda,
## yogurt} => {bottled_water} 0.007422471 0.2713755 0.027351296 2.4553613 73
## [9851] {bottled_water,
## soda} => {rolls/buns} 0.006812405 0.2350877 0.028978139 1.2781027 67
## [9852] {bottled_water,
## rolls/buns} => {soda} 0.006812405 0.2815126 0.024199288 1.6143886 67
## [9853] {bottled_water,
## other_vegetables} => {soda} 0.005693950 0.2295082 0.024809354 1.3161593 56
## [9854] {bottled_water,
## soda} => {whole_milk} 0.007524148 0.2596491 0.028978139 1.0161755 74
## [9855] {bottled_water,
## whole_milk} => {soda} 0.007524148 0.2189349 0.034367056 1.2555247 74
## [9856] {bottled_water,
## yogurt} => {rolls/buns} 0.007117438 0.3097345 0.022979156 1.6839353 70
## [9857] {bottled_water,
## rolls/buns} => {yogurt} 0.007117438 0.2941176 0.024199288 2.1083433 70
## [9858] {rolls/buns,
## yogurt} => {bottled_water} 0.007117438 0.2071006 0.034367056 1.8738126 70
## [9859] {bottled_water,
## yogurt} => {other_vegetables} 0.008134215 0.3539823 0.022979156 1.8294356 80
## [9860] {bottled_water,
## other_vegetables} => {yogurt} 0.008134215 0.3278689 0.024809354 2.3502844 80
## [9861] {bottled_water,
## yogurt} => {whole_milk} 0.009659380 0.4203540 0.022979156 1.6451180 95
## [9862] {bottled_water,
## whole_milk} => {yogurt} 0.009659380 0.2810651 0.034367056 2.0147778 95
## [9863] {bottled_water,
## rolls/buns} => {other_vegetables} 0.007320793 0.3025210 0.024199288 1.5634756 72
## [9864] {bottled_water,
## other_vegetables} => {rolls/buns} 0.007320793 0.2950820 0.024809354 1.6042737 72
## [9865] {bottled_water,
## rolls/buns} => {whole_milk} 0.008744281 0.3613445 0.024199288 1.4141757 86
## [9866] {bottled_water,
## whole_milk} => {rolls/buns} 0.008744281 0.2544379 0.034367056 1.3833037 86
## [9867] {bottled_water,
## other_vegetables} => {whole_milk} 0.010777834 0.4344262 0.024809354 1.7001918 106
## [9868] {bottled_water,
## whole_milk} => {other_vegetables} 0.010777834 0.3136095 0.034367056 1.6207825 106
## [9869] {root_vegetables,
## soda} => {tropical_fruit} 0.003762074 0.2021858 0.018607016 1.9268384 37
## [9870] {root_vegetables,
## tropical_fruit} => {yogurt} 0.008134215 0.3864734 0.021047280 2.7703835 80
## [9871] {tropical_fruit,
## yogurt} => {root_vegetables} 0.008134215 0.2777778 0.029283172 2.5484556 80
## [9872] {root_vegetables,
## yogurt} => {tropical_fruit} 0.008134215 0.3149606 0.025826131 3.0015870 80
## [9873] {root_vegetables,
## tropical_fruit} => {rolls/buns} 0.005897306 0.2801932 0.021047280 1.5233281 58
## [9874] {rolls/buns,
## tropical_fruit} => {root_vegetables} 0.005897306 0.2396694 0.024605999 2.1988328 58
## [9875] {rolls/buns,
## root_vegetables} => {tropical_fruit} 0.005897306 0.2426778 0.024300966 2.3127291 58
## [9876] {root_vegetables,
## tropical_fruit} => {other_vegetables} 0.012302999 0.5845411 0.021047280 3.0209991 121
## [9877] {other_vegetables,
## tropical_fruit} => {root_vegetables} 0.012302999 0.3427762 0.035892222 3.1447798 121
## [9878] {other_vegetables,
## root_vegetables} => {tropical_fruit} 0.012302999 0.2596567 0.047381800 2.4745380 121
## [9879] {root_vegetables,
## tropical_fruit} => {whole_milk} 0.011997966 0.5700483 0.021047280 2.2309690 118
## [9880] {tropical_fruit,
## whole_milk} => {root_vegetables} 0.011997966 0.2836538 0.042297916 2.6023653 118
## [9881] {root_vegetables,
## whole_milk} => {tropical_fruit} 0.011997966 0.2453222 0.048906965 2.3379305 118
## [9882] {soda,
## tropical_fruit} => {yogurt} 0.006609049 0.3170732 0.020843925 2.2728970 65
## [9883] {tropical_fruit,
## yogurt} => {soda} 0.006609049 0.2256944 0.029283172 1.2942885 65
## [9884] {soda,
## yogurt} => {tropical_fruit} 0.006609049 0.2416357 0.027351296 2.3027975 65
## [9885] {soda,
## tropical_fruit} => {rolls/buns} 0.005388917 0.2585366 0.020843925 1.4055872 53
## [9886] {rolls/buns,
## tropical_fruit} => {soda} 0.005388917 0.2190083 0.024605999 1.2559454 53
## [9887] {soda,
## tropical_fruit} => {other_vegetables} 0.007219115 0.3463415 0.020843925 1.7899466 71
## [9888] {other_vegetables,
## tropical_fruit} => {soda} 0.007219115 0.2011331 0.035892222 1.1534370 71
## [9889] {other_vegetables,
## soda} => {tropical_fruit} 0.007219115 0.2204969 0.032740214 2.1013440 71
## [9890] {soda,
## tropical_fruit} => {whole_milk} 0.007829181 0.3756098 0.020843925 1.4700048 77
## [9891] {tropical_fruit,
## yogurt} => {rolls/buns} 0.008744281 0.2986111 0.029283172 1.6234606 86
## [9892] {rolls/buns,
## tropical_fruit} => {yogurt} 0.008744281 0.3553719 0.024605999 2.5474363 86
## [9893] {rolls/buns,
## yogurt} => {tropical_fruit} 0.008744281 0.2544379 0.034367056 2.4248028 86
## [9894] {tropical_fruit,
## yogurt} => {other_vegetables} 0.012302999 0.4201389 0.029283172 2.1713431 121
## [9895] {other_vegetables,
## tropical_fruit} => {yogurt} 0.012302999 0.3427762 0.035892222 2.4571457 121
## [9896] {other_vegetables,
## yogurt} => {tropical_fruit} 0.012302999 0.2833724 0.043416370 2.7005496 121
## [9897] {tropical_fruit,
## yogurt} => {whole_milk} 0.015149975 0.5173611 0.029283172 2.0247698 149
## [9898] {tropical_fruit,
## whole_milk} => {yogurt} 0.015149975 0.3581731 0.042297916 2.5675162 149
## [9899] {whole_milk,
## yogurt} => {tropical_fruit} 0.015149975 0.2704174 0.056024403 2.5770885 149
## [9900] {rolls/buns,
## tropical_fruit} => {other_vegetables} 0.007829181 0.3181818 0.024605999 1.6444131 77
## [9901] {other_vegetables,
## tropical_fruit} => {rolls/buns} 0.007829181 0.2181303 0.035892222 1.1859102 77
## [9902] {rolls/buns,
## tropical_fruit} => {whole_milk} 0.010981190 0.4462810 0.024605999 1.7465872 108
## [9903] {tropical_fruit,
## whole_milk} => {rolls/buns} 0.010981190 0.2596154 0.042297916 1.4114524 108
## [9904] {other_vegetables,
## tropical_fruit} => {whole_milk} 0.017081851 0.4759207 0.035892222 1.8625865 168
## [9905] {tropical_fruit,
## whole_milk} => {other_vegetables} 0.017081851 0.4038462 0.042297916 2.0871397 168
## [9906] {other_vegetables,
## whole_milk} => {tropical_fruit} 0.017081851 0.2282609 0.074834774 2.1753349 168
## [9907] {root_vegetables,
## soda} => {yogurt} 0.004778851 0.2568306 0.018607016 1.8410561 47
## [9908] {root_vegetables,
## soda} => {rolls/buns} 0.004880529 0.2622951 0.018607016 1.4260211 48
## [9909] {rolls/buns,
## root_vegetables} => {soda} 0.004880529 0.2008368 0.024300966 1.1517377 48
## [9910] {root_vegetables,
## soda} => {other_vegetables} 0.008235892 0.4426230 0.018607016 2.2875443 81
## [9911] {other_vegetables,
## soda} => {root_vegetables} 0.008235892 0.2515528 0.032740214 2.3078561 81
## [9912] {root_vegetables,
## soda} => {whole_milk} 0.008134215 0.4371585 0.018607016 1.7108848 80
## [9913] {soda,
## whole_milk} => {root_vegetables} 0.008134215 0.2030457 0.040061007 1.8628305 80
## [9914] {root_vegetables,
## yogurt} => {rolls/buns} 0.007219115 0.2795276 0.025826131 1.5197090 71
## [9915] {rolls/buns,
## root_vegetables} => {yogurt} 0.007219115 0.2970711 0.024300966 2.1295150 71
## [9916] {rolls/buns,
## yogurt} => {root_vegetables} 0.007219115 0.2100592 0.034367056 1.9271753 71
## [9917] {root_vegetables,
## yogurt} => {other_vegetables} 0.012913066 0.5000000 0.025826131 2.5840778 127
## [9918] {other_vegetables,
## root_vegetables} => {yogurt} 0.012913066 0.2725322 0.047381800 1.9536108 127
## [9919] {other_vegetables,
## yogurt} => {root_vegetables} 0.012913066 0.2974239 0.043416370 2.7286977 127
## [9920] {root_vegetables,
## yogurt} => {whole_milk} 0.014539908 0.5629921 0.025826131 2.2033536 143
## [9921] {root_vegetables,
## whole_milk} => {yogurt} 0.014539908 0.2972973 0.048906965 2.1311362 143
## [9922] {whole_milk,
## yogurt} => {root_vegetables} 0.014539908 0.2595281 0.056024403 2.3810253 143
## [9923] {rolls/buns,
## root_vegetables} => {other_vegetables} 0.012201322 0.5020921 0.024300966 2.5948898 120
## [9924] {other_vegetables,
## root_vegetables} => {rolls/buns} 0.012201322 0.2575107 0.047381800 1.4000100 120
## [9925] {other_vegetables,
## rolls/buns} => {root_vegetables} 0.012201322 0.2863962 0.042602949 2.6275247 120
## [9926] {rolls/buns,
## root_vegetables} => {whole_milk} 0.012709710 0.5230126 0.024300966 2.0468876 125
## [9927] {root_vegetables,
## whole_milk} => {rolls/buns} 0.012709710 0.2598753 0.048906965 1.4128652 125
## [9928] {rolls/buns,
## whole_milk} => {root_vegetables} 0.012709710 0.2244165 0.056634469 2.0588959 125
## [9929] {other_vegetables,
## root_vegetables} => {whole_milk} 0.023182511 0.4892704 0.047381800 1.9148326 228
## [9930] {root_vegetables,
## whole_milk} => {other_vegetables} 0.023182511 0.4740125 0.048906965 2.4497702 228
## [9931] {other_vegetables,
## whole_milk} => {root_vegetables} 0.023182511 0.3097826 0.074834774 2.8420820 228
## [9932] {soda,
## yogurt} => {rolls/buns} 0.008642603 0.3159851 0.027351296 1.7179181 85
## [9933] {rolls/buns,
## soda} => {yogurt} 0.008642603 0.2254642 0.038332486 1.6162101 85
## [9934] {rolls/buns,
## yogurt} => {soda} 0.008642603 0.2514793 0.034367056 1.4421567 85
## [9935] {soda,
## yogurt} => {other_vegetables} 0.008337570 0.3048327 0.027351296 1.5754229 82
## [9936] {other_vegetables,
## soda} => {yogurt} 0.008337570 0.2546584 0.032740214 1.8254849 82
## [9937] {soda,
## yogurt} => {whole_milk} 0.010472801 0.3828996 0.027351296 1.4985348 103
## [9938] {soda,
## whole_milk} => {yogurt} 0.010472801 0.2614213 0.040061007 1.8739641 103
## [9939] {rolls/buns,
## soda} => {other_vegetables} 0.009862735 0.2572944 0.038332486 1.3297376 97
## [9940] {other_vegetables,
## soda} => {rolls/buns} 0.009862735 0.3012422 0.032740214 1.6377653 97
## [9941] {other_vegetables,
## rolls/buns} => {soda} 0.009862735 0.2315036 0.042602949 1.3276022 97
## [9942] {rolls/buns,
## soda} => {whole_milk} 0.008845958 0.2307692 0.038332486 0.9031498 87
## [9943] {soda,
## whole_milk} => {rolls/buns} 0.008845958 0.2208122 0.040061007 1.2004908 87
## [9944] {other_vegetables,
## soda} => {whole_milk} 0.013929842 0.4254658 0.032740214 1.6651240 137
## [9945] {soda,
## whole_milk} => {other_vegetables} 0.013929842 0.3477157 0.040061007 1.7970490 137
## [9946] {rolls/buns,
## yogurt} => {other_vegetables} 0.011489578 0.3343195 0.034367056 1.7278153 113
## [9947] {other_vegetables,
## yogurt} => {rolls/buns} 0.011489578 0.2646370 0.043416370 1.4387534 113
## [9948] {other_vegetables,
## rolls/buns} => {yogurt} 0.011489578 0.2696897 0.042602949 1.9332351 113
## [9949] {rolls/buns,
## yogurt} => {whole_milk} 0.015556685 0.4526627 0.034367056 1.7715630 153
## [9950] {whole_milk,
## yogurt} => {rolls/buns} 0.015556685 0.2776770 0.056024403 1.5096478 153
## [9951] {rolls/buns,
## whole_milk} => {yogurt} 0.015556685 0.2746858 0.056634469 1.9690488 153
## [9952] {other_vegetables,
## yogurt} => {whole_milk} 0.022267412 0.5128806 0.043416370 2.0072345 219
## [9953] {whole_milk,
## yogurt} => {other_vegetables} 0.022267412 0.3974592 0.056024403 2.0541308 219
## [9954] {other_vegetables,
## whole_milk} => {yogurt} 0.022267412 0.2975543 0.074834774 2.1329789 219
## [9955] {other_vegetables,
## rolls/buns} => {whole_milk} 0.017895272 0.4200477 0.042602949 1.6439194 176
## [9956] {rolls/buns,
## whole_milk} => {other_vegetables} 0.017895272 0.3159785 0.056634469 1.6330258 176
## [9957] {other_vegetables,
## whole_milk} => {rolls/buns} 0.017895272 0.2391304 0.074834774 1.3000817 176
## [9958] {other_vegetables,
## root_vegetables,
## specialty_cheese} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [9959] {root_vegetables,
## specialty_cheese,
## whole_milk} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [9960] {other_vegetables,
## specialty_cheese,
## whole_milk} => {root_vegetables} 0.001016777 0.4545455 0.002236909 4.1702001 10
## [9961] {other_vegetables,
## specialty_cheese,
## yogurt} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [9962] {specialty_cheese,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.6500000 0.002033554 3.3593011 13
## [9963] {other_vegetables,
## specialty_cheese,
## whole_milk} => {yogurt} 0.001321810 0.5909091 0.002236909 4.2358534 13
## [9964] {root_vegetables,
## tropical_fruit,
## turkey} => {other_vegetables} 0.001220132 0.8000000 0.001525165 4.1345244 12
## [9965] {other_vegetables,
## tropical_fruit,
## turkey} => {root_vegetables} 0.001220132 0.7500000 0.001626843 6.8808302 12
## [9966] {other_vegetables,
## root_vegetables,
## turkey} => {tropical_fruit} 0.001220132 0.6315789 0.001931876 6.0189718 12
## [9967] {other_vegetables,
## root_vegetables,
## turkey} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [9968] {root_vegetables,
## turkey,
## whole_milk} => {other_vegetables} 0.001220132 0.8000000 0.001525165 4.1345244 12
## [9969] {other_vegetables,
## turkey,
## whole_milk} => {root_vegetables} 0.001220132 0.5714286 0.002135231 5.2425373 12
## [9970] {other_vegetables,
## turkey,
## yogurt} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [9971] {turkey,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [9972] {other_vegetables,
## turkey,
## whole_milk} => {yogurt} 0.001118454 0.5238095 0.002135231 3.7548591 11
## [9973] {butter,
## rice,
## root_vegetables} => {whole_milk} 0.001016777 1.0000000 0.001016777 3.9136490 10
## [9974] {butter,
## rice,
## whole_milk} => {root_vegetables} 0.001016777 0.6666667 0.001525165 6.1162935 10
## [9975] {rice,
## root_vegetables,
## whole_milk} => {butter} 0.001016777 0.4166667 0.002440264 7.5191131 10
## [9976] {other_vegetables,
## rice,
## tropical_fruit} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [9977] {rice,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [9978] {other_vegetables,
## rice,
## whole_milk} => {tropical_fruit} 0.001016777 0.3846154 0.002643620 3.6653995 10
## [9979] {rice,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001423488 0.8750000 0.001626843 4.5221361 14
## [9980] {other_vegetables,
## rice,
## root_vegetables} => {yogurt} 0.001423488 0.6363636 0.002236909 4.5616883 14
## [9981] {other_vegetables,
## rice,
## yogurt} => {root_vegetables} 0.001423488 0.7368421 0.001931876 6.7601139 14
## [9982] {rice,
## root_vegetables,
## yogurt} => {whole_milk} 0.001423488 0.8750000 0.001626843 3.4244429 14
## [9983] {rice,
## root_vegetables,
## whole_milk} => {yogurt} 0.001423488 0.5833333 0.002440264 4.1815476 14
## [9984] {rice,
## whole_milk,
## yogurt} => {root_vegetables} 0.001423488 0.7777778 0.001830198 7.1356758 14
## [9985] {other_vegetables,
## rice,
## root_vegetables} => {whole_milk} 0.001830198 0.8181818 0.002236909 3.2020765 18
## [9986] {rice,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001830198 0.7500000 0.002440264 3.8761167 18
## [9987] {other_vegetables,
## rice,
## whole_milk} => {root_vegetables} 0.001830198 0.6923077 0.002643620 6.3515356 18
## [9988] {other_vegetables,
## rice,
## yogurt} => {whole_milk} 0.001525165 0.7894737 0.001931876 3.0897229 15
## [9989] {rice,
## whole_milk,
## yogurt} => {other_vegetables} 0.001525165 0.8333333 0.001830198 4.3067963 15
## [9990] {other_vegetables,
## rice,
## whole_milk} => {yogurt} 0.001525165 0.5769231 0.002643620 4.1355965 15
## [9991] {mayonnaise,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [9992] {mayonnaise,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [9993] {mayonnaise,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001016777 0.6250000 0.001626843 5.7340252 10
## [9994] {frozen_dessert,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [9995] {frozen_dessert,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [9996] {frozen_dessert,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001016777 0.5000000 0.002033554 4.7650194 10
## [9997] {frozen_dessert,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [9998] {frozen_dessert,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [9999] {frozen_dessert,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001016777 0.5000000 0.002033554 4.5872201 10
## [10000] {canned_vegetables,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [10001] {canned_vegetables,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [10002] {canned_vegetables,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001016777 0.5000000 0.002033554 4.5872201 10
## [10003] {frozen_fish,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [10004] {frozen_fish,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001016777 0.7142857 0.001423488 6.8071705 10
## [10005] {frozen_fish,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001016777 0.6666667 0.001525165 8.8127240 10
## [10006] {frozen_fish,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [10007] {frozen_fish,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001118454 0.8461538 0.001321810 4.3730547 11
## [10008] {frozen_fish,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001118454 0.4074074 0.002745297 5.3855536 11
## [10009] {frozen_fish,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [10010] {frozen_fish,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [10011] {frozen_fish,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001118454 0.4074074 0.002745297 3.8826084 11
## [10012] {frozen_fish,
## root_vegetables,
## yogurt} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [10013] {frozen_fish,
## root_vegetables,
## whole_milk} => {yogurt} 0.001220132 0.6666667 0.001830198 4.7789116 12
## [10014] {frozen_fish,
## whole_milk,
## yogurt} => {root_vegetables} 0.001220132 0.5454545 0.002236909 5.0042402 12
## [10015] {frozen_fish,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10016] {frozen_fish,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [10017] {frozen_fish,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [10018] {frozen_fish,
## other_vegetables,
## yogurt} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [10019] {frozen_fish,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [10020] {frozen_fish,
## other_vegetables,
## whole_milk} => {yogurt} 0.001220132 0.4444444 0.002745297 3.1859410 12
## [10021] {other_vegetables,
## pot_plants,
## tropical_fruit} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [10022] {pot_plants,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [10023] {other_vegetables,
## pot_plants,
## whole_milk} => {tropical_fruit} 0.001016777 0.4166667 0.002440264 3.9708495 10
## [10024] {other_vegetables,
## pasta,
## root_vegetables} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [10025] {pasta,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [10026] {other_vegetables,
## pasta,
## whole_milk} => {root_vegetables} 0.001220132 0.5714286 0.002135231 5.2425373 12
## [10027] {curd,
## herbs,
## root_vegetables} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [10028] {curd,
## herbs,
## whole_milk} => {root_vegetables} 0.001220132 0.6666667 0.001830198 6.1162935 12
## [10029] {herbs,
## root_vegetables,
## whole_milk} => {curd} 0.001220132 0.2926829 0.004168785 5.4933904 12
## [10030] {curd,
## herbs,
## other_vegetables} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [10031] {curd,
## herbs,
## whole_milk} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [10032] {herbs,
## other_vegetables,
## whole_milk} => {curd} 0.001016777 0.2500000 0.004067107 4.6922710 10
## [10033] {butter,
## herbs,
## root_vegetables} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [10034] {butter,
## herbs,
## whole_milk} => {root_vegetables} 0.001016777 0.6250000 0.001626843 5.7340252 10
## [10035] {herbs,
## root_vegetables,
## whole_milk} => {butter} 0.001016777 0.2439024 0.004168785 4.4014321 10
## [10036] {domestic_eggs,
## herbs,
## other_vegetables} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [10037] {domestic_eggs,
## herbs,
## whole_milk} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [10038] {herbs,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.001016777 0.2500000 0.004067107 3.9403045 10
## [10039] {fruit/vegetable_juice,
## herbs,
## other_vegetables} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [10040] {fruit/vegetable_juice,
## herbs,
## whole_milk} => {other_vegetables} 0.001016777 0.9090909 0.001118454 4.6983232 10
## [10041] {herbs,
## other_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.2500000 0.004067107 3.4581575 10
## [10042] {herbs,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [10043] {herbs,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001321810 0.6842105 0.001931876 3.5361064 13
## [10044] {herbs,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001321810 0.3250000 0.004067107 4.5338652 13
## [10045] {herbs,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10046] {herbs,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001016777 0.6666667 0.001525165 6.1162935 10
## [10047] {herbs,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001016777 0.2439024 0.004168785 3.2241673 10
## [10048] {herbs,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [10049] {herbs,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [10050] {herbs,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001118454 0.2750000 0.004067107 3.6352487 11
## [10051] {bottled_water,
## citrus_fruit,
## herbs} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [10052] {citrus_fruit,
## herbs,
## whole_milk} => {bottled_water} 0.001016777 0.5263158 0.001931876 4.7620200 10
## [10053] {bottled_water,
## herbs,
## whole_milk} => {citrus_fruit} 0.001016777 0.5882353 0.001728521 7.1072409 10
## [10054] {citrus_fruit,
## herbs,
## tropical_fruit} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [10055] {citrus_fruit,
## herbs,
## other_vegetables} => {tropical_fruit} 0.001016777 0.4761905 0.002135231 4.5381137 10
## [10056] {herbs,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001016777 0.6250000 0.001626843 7.5514435 10
## [10057] {citrus_fruit,
## herbs,
## tropical_fruit} => {whole_milk} 0.001118454 0.9166667 0.001220132 3.5875116 11
## [10058] {citrus_fruit,
## herbs,
## whole_milk} => {tropical_fruit} 0.001118454 0.5789474 0.001931876 5.5173909 11
## [10059] {herbs,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001118454 0.4782609 0.002338587 5.7784959 11
## [10060] {citrus_fruit,
## herbs,
## root_vegetables} => {other_vegetables} 0.001321810 0.8125000 0.001626843 4.1991264 13
## [10061] {citrus_fruit,
## herbs,
## other_vegetables} => {root_vegetables} 0.001321810 0.6190476 0.002135231 5.6794154 13
## [10062] {herbs,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001321810 0.3421053 0.003863752 4.1334217 13
## [10063] {citrus_fruit,
## herbs,
## root_vegetables} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [10064] {citrus_fruit,
## herbs,
## whole_milk} => {root_vegetables} 0.001321810 0.6842105 0.001931876 6.2772486 13
## [10065] {herbs,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001321810 0.3170732 0.004168785 3.8309762 13
## [10066] {citrus_fruit,
## herbs,
## other_vegetables} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [10067] {citrus_fruit,
## herbs,
## whole_milk} => {other_vegetables} 0.001423488 0.7368421 0.001931876 3.8081146 14
## [10068] {herbs,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001423488 0.3500000 0.004067107 4.2288084 14
## [10069] {herbs,
## root_vegetables,
## shopping_bags} => {other_vegetables} 0.001118454 0.8461538 0.001321810 4.3730547 11
## [10070] {herbs,
## other_vegetables,
## shopping_bags} => {root_vegetables} 0.001118454 0.5789474 0.001931876 5.3115181 11
## [10071] {herbs,
## other_vegetables,
## root_vegetables} => {shopping_bags} 0.001118454 0.2894737 0.003863752 2.9380533 11
## [10072] {bottled_water,
## herbs,
## root_vegetables} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [10073] {bottled_water,
## herbs,
## other_vegetables} => {root_vegetables} 0.001016777 0.7142857 0.001423488 6.5531716 10
## [10074] {herbs,
## other_vegetables,
## root_vegetables} => {bottled_water} 0.001016777 0.2631579 0.003863752 2.3810100 10
## [10075] {bottled_water,
## herbs,
## root_vegetables} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [10076] {bottled_water,
## herbs,
## whole_milk} => {root_vegetables} 0.001016777 0.5882353 0.001728521 5.3967296 10
## [10077] {herbs,
## root_vegetables,
## whole_milk} => {bottled_water} 0.001016777 0.2439024 0.004168785 2.2067898 10
## [10078] {bottled_water,
## herbs,
## other_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10079] {bottled_water,
## herbs,
## whole_milk} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [10080] {herbs,
## other_vegetables,
## whole_milk} => {bottled_water} 0.001016777 0.2500000 0.004067107 2.2619595 10
## [10081] {herbs,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [10082] {herbs,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001118454 0.6875000 0.001626843 6.3074277 11
## [10083] {herbs,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001118454 0.2894737 0.003863752 2.7586954 11
## [10084] {herbs,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001525165 0.8823529 0.001728521 3.4532197 15
## [10085] {herbs,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001525165 0.6521739 0.002338587 5.9833306 15
## [10086] {herbs,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001525165 0.3658537 0.004168785 3.4865995 15
## [10087] {herbs,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [10088] {herbs,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.4347826 0.002338587 3.1166815 10
## [10089] {herbs,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.4761905 0.002135231 4.5381137 10
## [10090] {herbs,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [10091] {herbs,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001321810 0.5652174 0.002338587 2.9211314 13
## [10092] {herbs,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001321810 0.3250000 0.004067107 3.0972626 13
## [10093] {herbs,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001321810 0.6500000 0.002033554 3.3593011 13
## [10094] {herbs,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001321810 0.3421053 0.003863752 2.4523362 13
## [10095] {herbs,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001321810 0.6500000 0.002033554 5.9633862 13
## [10096] {herbs,
## root_vegetables,
## yogurt} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [10097] {herbs,
## root_vegetables,
## whole_milk} => {yogurt} 0.001220132 0.2926829 0.004168785 2.0980587 12
## [10098] {herbs,
## whole_milk,
## yogurt} => {root_vegetables} 0.001220132 0.5714286 0.002135231 5.2425373 12
## [10099] {herbs,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [10100] {herbs,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001220132 0.3157895 0.003863752 1.7168543 12
## [10101] {herbs,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001220132 0.6666667 0.001830198 6.1162935 12
## [10102] {herbs,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001525165 0.8333333 0.001830198 3.2613742 15
## [10103] {herbs,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001525165 0.3658537 0.004168785 1.9890385 15
## [10104] {herbs,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001525165 0.6250000 0.002440264 5.7340252 15
## [10105] {herbs,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.002440264 0.6315789 0.003863752 2.4717783 24
## [10106] {herbs,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.002440264 0.5853659 0.004168785 3.0252618 24
## [10107] {herbs,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.002440264 0.6000000 0.004067107 5.5046642 24
## [10108] {herbs,
## other_vegetables,
## yogurt} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [10109] {herbs,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [10110] {herbs,
## other_vegetables,
## whole_milk} => {yogurt} 0.001321810 0.3250000 0.004067107 2.3297194 13
## [10111] {herbs,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [10112] {herbs,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.001321810 0.5416667 0.002440264 2.7994176 13
## [10113] {herbs,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.001321810 0.3250000 0.004067107 1.7669292 13
## [10114] {processed_cheese,
## soda,
## white_bread} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [10115] {processed_cheese,
## white_bread,
## whole_milk} => {soda} 0.001016777 0.4761905 0.002135231 2.7308066 10
## [10116] {processed_cheese,
## soda,
## whole_milk} => {white_bread} 0.001016777 0.4000000 0.002541942 9.5024155 10
## [10117] {soda,
## white_bread,
## whole_milk} => {processed_cheese} 0.001016777 0.2500000 0.004067107 15.0843558 10
## [10118] {other_vegetables,
## processed_cheese,
## tropical_fruit} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [10119] {processed_cheese,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [10120] {other_vegetables,
## processed_cheese,
## whole_milk} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [10121] {other_vegetables,
## processed_cheese,
## root_vegetables} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [10122] {processed_cheese,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001525165 0.7500000 0.002033554 3.8761167 15
## [10123] {other_vegetables,
## processed_cheese,
## whole_milk} => {root_vegetables} 0.001525165 0.6000000 0.002541942 5.5046642 15
## [10124] {semi_finished_bread,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001321810 0.8125000 0.001626843 4.1991264 13
## [10125] {other_vegetables,
## semi_finished_bread,
## tropical_fruit} => {yogurt} 0.001321810 0.5909091 0.002236909 4.2358534 13
## [10126] {other_vegetables,
## semi_finished_bread,
## yogurt} => {tropical_fruit} 0.001321810 0.5909091 0.002236909 5.6313865 13
## [10127] {semi_finished_bread,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [10128] {semi_finished_bread,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [10129] {semi_finished_bread,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.5000000 0.002033554 4.7650194 10
## [10130] {other_vegetables,
## semi_finished_bread,
## tropical_fruit} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [10131] {semi_finished_bread,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [10132] {other_vegetables,
## semi_finished_bread,
## whole_milk} => {tropical_fruit} 0.001220132 0.4615385 0.002643620 4.3984794 12
## [10133] {other_vegetables,
## semi_finished_bread,
## yogurt} => {whole_milk} 0.001321810 0.5909091 0.002236909 2.3126108 13
## [10134] {semi_finished_bread,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.6500000 0.002033554 3.3593011 13
## [10135] {other_vegetables,
## semi_finished_bread,
## whole_milk} => {yogurt} 0.001321810 0.5000000 0.002643620 3.5841837 13
## [10136] {detergent,
## frozen_vegetables,
## other_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10137] {detergent,
## frozen_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [10138] {detergent,
## other_vegetables,
## whole_milk} => {frozen_vegetables} 0.001016777 0.2857143 0.003558719 5.9408034 10
## [10139] {detergent,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [10140] {detergent,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [10141] {detergent,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2857143 0.003558719 3.9858156 10
## [10142] {detergent,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [10143] {detergent,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [10144] {detergent,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001118454 0.3142857 0.003558719 2.9951550 11
## [10145] {detergent,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [10146] {detergent,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001321810 0.4814815 0.002745297 2.4883712 13
## [10147] {detergent,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001321810 0.3714286 0.003558719 3.4076493 13
## [10148] {detergent,
## other_vegetables,
## yogurt} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [10149] {detergent,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [10150] {detergent,
## other_vegetables,
## whole_milk} => {yogurt} 0.001118454 0.3142857 0.003558719 2.2529155 11
## [10151] {baking_powder,
## other_vegetables,
## sugar} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [10152] {baking_powder,
## sugar,
## whole_milk} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [10153] {baking_powder,
## other_vegetables,
## whole_milk} => {sugar} 0.001016777 0.2325581 0.004372140 6.8684964 10
## [10154] {baking_powder,
## margarine,
## other_vegetables} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [10155] {baking_powder,
## margarine,
## whole_milk} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [10156] {baking_powder,
## other_vegetables,
## whole_milk} => {margarine} 0.001118454 0.2558140 0.004372140 4.3679344 11
## [10157] {baking_powder,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001626843 0.6666667 0.002440264 2.6090994 16
## [10158] {baking_powder,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001626843 0.6153846 0.002643620 3.1804034 16
## [10159] {baking_powder,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001626843 0.3720930 0.004372140 5.1908296 16
## [10160] {baking_powder,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [10161] {baking_powder,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [10162] {baking_powder,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001016777 0.2325581 0.004372140 3.0742061 10
## [10163] {baking_powder,
## citrus_fruit,
## other_vegetables} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [10164] {baking_powder,
## citrus_fruit,
## whole_milk} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [10165] {baking_powder,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001118454 0.2558140 0.004372140 3.0908234 11
## [10166] {baking_powder,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [10167] {baking_powder,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.5500000 0.002033554 3.9426020 11
## [10168] {baking_powder,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.3437500 0.003253686 3.2759508 11
## [10169] {baking_powder,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [10170] {baking_powder,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [10171] {baking_powder,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001220132 0.2790698 0.004372140 2.6595457 12
## [10172] {baking_powder,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001626843 0.6400000 0.002541942 2.5047354 16
## [10173] {baking_powder,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001626843 0.6956522 0.002338587 3.5952386 16
## [10174] {baking_powder,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001626843 0.3720930 0.004372140 3.4137452 16
## [10175] {baking_powder,
## other_vegetables,
## yogurt} => {whole_milk} 0.001728521 0.7391304 0.002338587 2.8926971 17
## [10176] {baking_powder,
## whole_milk,
## yogurt} => {other_vegetables} 0.001728521 0.5312500 0.003253686 2.7455826 17
## [10177] {baking_powder,
## other_vegetables,
## whole_milk} => {yogurt} 0.001728521 0.3953488 0.004372140 2.8340057 17
## [10178] {baking_powder,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [10179] {baking_powder,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [10180] {baking_powder,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.001321810 0.3023256 0.004372140 1.6436551 13
## [10181] {flour,
## root_vegetables,
## sugar} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10182] {flour,
## sugar,
## whole_milk} => {root_vegetables} 0.001016777 0.3571429 0.002846975 3.2765858 10
## [10183] {flour,
## root_vegetables,
## whole_milk} => {sugar} 0.001016777 0.3448276 0.002948653 10.1843223 10
## [10184] {root_vegetables,
## sugar,
## whole_milk} => {flour} 0.001016777 0.2941176 0.003457041 16.9160647 10
## [10185] {flour,
## other_vegetables,
## sugar} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [10186] {flour,
## sugar,
## whole_milk} => {other_vegetables} 0.001220132 0.4285714 0.002846975 2.2149238 12
## [10187] {flour,
## other_vegetables,
## whole_milk} => {sugar} 0.001220132 0.3243243 0.003762074 9.5787680 12
## [10188] {flour,
## margarine,
## yogurt} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [10189] {flour,
## margarine,
## other_vegetables} => {yogurt} 0.001016777 0.7142857 0.001423488 5.1202624 10
## [10190] {flour,
## other_vegetables,
## yogurt} => {margarine} 0.001016777 0.3703704 0.002745297 6.3239455 10
## [10191] {flour,
## margarine,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [10192] {flour,
## margarine,
## whole_milk} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [10193] {flour,
## whole_milk,
## yogurt} => {margarine} 0.001016777 0.4000000 0.002541942 6.8298611 10
## [10194] {flour,
## margarine,
## other_vegetables} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [10195] {flour,
## margarine,
## whole_milk} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [10196] {flour,
## other_vegetables,
## whole_milk} => {margarine} 0.001118454 0.2972973 0.003762074 5.0762481 11
## [10197] {flour,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001728521 1.0000000 0.001728521 3.9136490 17
## [10198] {flour,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001728521 0.6800000 0.002541942 6.2386194 17
## [10199] {flour,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001728521 0.5862069 0.002948653 8.1777941 17
## [10200] {flour,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [10201] {flour,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.4400000 0.002541942 3.1540816 11
## [10202] {flour,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.4400000 0.002541942 6.1381560 11
## [10203] {flour,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [10204] {flour,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001321810 0.5200000 0.002541942 2.6874409 13
## [10205] {flour,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001321810 0.3513514 0.003762074 4.9014759 13
## [10206] {citrus_fruit,
## flour,
## other_vegetables} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [10207] {citrus_fruit,
## flour,
## whole_milk} => {other_vegetables} 0.001220132 0.7500000 0.001626843 3.8761167 12
## [10208] {flour,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001220132 0.3243243 0.003762074 3.9185869 12
## [10209] {flour,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [10210] {flour,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001016777 0.4347826 0.002338587 3.1166815 10
## [10211] {flour,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [10212] {flour,
## root_vegetables,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [10213] {flour,
## root_vegetables,
## whole_milk} => {yogurt} 0.001016777 0.3448276 0.002948653 2.4718508 10
## [10214] {flour,
## whole_milk,
## yogurt} => {root_vegetables} 0.001016777 0.4000000 0.002541942 3.6697761 10
## [10215] {flour,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [10216] {flour,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001016777 0.4347826 0.002338587 2.3637849 10
## [10217] {flour,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001016777 0.5263158 0.001931876 4.8286528 10
## [10218] {flour,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001525165 0.6521739 0.002338587 2.5523798 15
## [10219] {flour,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001525165 0.5172414 0.002948653 2.6731839 15
## [10220] {flour,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001525165 0.4054054 0.003762074 3.7193677 15
## [10221] {flour,
## other_vegetables,
## yogurt} => {whole_milk} 0.001626843 0.5925926 0.002745297 2.3191994 16
## [10222] {flour,
## whole_milk,
## yogurt} => {other_vegetables} 0.001626843 0.6400000 0.002541942 3.3076195 16
## [10223] {flour,
## other_vegetables,
## whole_milk} => {yogurt} 0.001626843 0.4324324 0.003762074 3.0998345 16
## [10224] {flour,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [10225] {flour,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [10226] {flour,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.001118454 0.2972973 0.003762074 1.6163178 11
## [10227] {frozen_vegetables,
## other_vegetables,
## soft_cheese} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [10228] {frozen_vegetables,
## soft_cheese,
## whole_milk} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [10229] {other_vegetables,
## soft_cheese,
## whole_milk} => {frozen_vegetables} 0.001016777 0.2941176 0.003457041 6.1155329 10
## [10230] {curd,
## soft_cheese,
## yogurt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [10231] {curd,
## soft_cheese,
## whole_milk} => {yogurt} 0.001118454 0.7857143 0.001423488 5.6322886 11
## [10232] {soft_cheese,
## whole_milk,
## yogurt} => {curd} 0.001118454 0.3235294 0.003457041 6.0723507 11
## [10233] {margarine,
## other_vegetables,
## soft_cheese} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [10234] {margarine,
## soft_cheese,
## whole_milk} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [10235] {other_vegetables,
## soft_cheese,
## whole_milk} => {margarine} 0.001016777 0.2941176 0.003457041 5.0219567 10
## [10236] {butter,
## domestic_eggs,
## soft_cheese} => {whole_milk} 0.001016777 1.0000000 0.001016777 3.9136490 10
## [10237] {butter,
## soft_cheese,
## whole_milk} => {domestic_eggs} 0.001016777 0.5000000 0.002033554 7.8806090 10
## [10238] {domestic_eggs,
## soft_cheese,
## whole_milk} => {butter} 0.001016777 0.4761905 0.002135231 8.5932722 10
## [10239] {butter,
## soft_cheese,
## yogurt} => {whole_milk} 0.001220132 0.8000000 0.001525165 3.1309192 12
## [10240] {butter,
## soft_cheese,
## whole_milk} => {yogurt} 0.001220132 0.6000000 0.002033554 4.3010204 12
## [10241] {soft_cheese,
## whole_milk,
## yogurt} => {butter} 0.001220132 0.3529412 0.003457041 6.3691311 12
## [10242] {butter,
## other_vegetables,
## soft_cheese} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [10243] {butter,
## soft_cheese,
## whole_milk} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [10244] {other_vegetables,
## soft_cheese,
## whole_milk} => {butter} 0.001220132 0.3529412 0.003457041 6.3691311 12
## [10245] {domestic_eggs,
## root_vegetables,
## soft_cheese} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [10246] {domestic_eggs,
## other_vegetables,
## soft_cheese} => {root_vegetables} 0.001016777 0.5000000 0.002033554 4.5872201 10
## [10247] {other_vegetables,
## root_vegetables,
## soft_cheese} => {domestic_eggs} 0.001016777 0.4166667 0.002440264 6.5671741 10
## [10248] {domestic_eggs,
## root_vegetables,
## soft_cheese} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [10249] {domestic_eggs,
## soft_cheese,
## whole_milk} => {root_vegetables} 0.001016777 0.4761905 0.002135231 4.3687811 10
## [10250] {root_vegetables,
## soft_cheese,
## whole_milk} => {domestic_eggs} 0.001016777 0.4347826 0.002338587 6.8527035 10
## [10251] {domestic_eggs,
## soft_cheese,
## yogurt} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [10252] {domestic_eggs,
## other_vegetables,
## soft_cheese} => {yogurt} 0.001118454 0.5500000 0.002033554 3.9426020 11
## [10253] {other_vegetables,
## soft_cheese,
## yogurt} => {domestic_eggs} 0.001118454 0.3928571 0.002846975 6.1919071 11
## [10254] {domestic_eggs,
## soft_cheese,
## yogurt} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [10255] {domestic_eggs,
## soft_cheese,
## whole_milk} => {yogurt} 0.001220132 0.5714286 0.002135231 4.0962099 12
## [10256] {soft_cheese,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001220132 0.3529412 0.003457041 5.5627828 12
## [10257] {domestic_eggs,
## other_vegetables,
## soft_cheese} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [10258] {domestic_eggs,
## soft_cheese,
## whole_milk} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [10259] {other_vegetables,
## soft_cheese,
## whole_milk} => {domestic_eggs} 0.001321810 0.3823529 0.003457041 6.0263480 13
## [10260] {fruit/vegetable_juice,
## soft_cheese,
## yogurt} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [10261] {fruit/vegetable_juice,
## soft_cheese,
## whole_milk} => {yogurt} 0.001220132 0.7058824 0.001728521 5.0600240 12
## [10262] {soft_cheese,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001220132 0.3529412 0.003457041 4.8821047 12
## [10263] {soft_cheese,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.9230769 0.001321810 4.7706051 12
## [10264] {other_vegetables,
## soft_cheese,
## whipped/sour_cream} => {tropical_fruit} 0.001220132 0.5454545 0.002236909 5.1982030 12
## [10265] {other_vegetables,
## soft_cheese,
## tropical_fruit} => {whipped/sour_cream} 0.001220132 0.5714286 0.002135231 7.9716312 12
## [10266] {root_vegetables,
## soft_cheese,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [10267] {other_vegetables,
## soft_cheese,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.4545455 0.002236909 4.1702001 10
## [10268] {other_vegetables,
## root_vegetables,
## soft_cheese} => {whipped/sour_cream} 0.001016777 0.4166667 0.002440264 5.8126478 10
## [10269] {root_vegetables,
## soft_cheese,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.9230769 0.001321810 3.6125991 12
## [10270] {soft_cheese,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001220132 0.6000000 0.002033554 5.5046642 12
## [10271] {root_vegetables,
## soft_cheese,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.5217391 0.002338587 7.2784459 12
## [10272] {soft_cheese,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [10273] {other_vegetables,
## soft_cheese,
## whipped/sour_cream} => {yogurt} 0.001016777 0.4545455 0.002236909 3.2583488 10
## [10274] {other_vegetables,
## soft_cheese,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3571429 0.002846975 4.9822695 10
## [10275] {soft_cheese,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [10276] {soft_cheese,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.5500000 0.002033554 3.9426020 11
## [10277] {soft_cheese,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3235294 0.003457041 4.5133500 11
## [10278] {other_vegetables,
## soft_cheese,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.5909091 0.002236909 2.3126108 13
## [10279] {soft_cheese,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001321810 0.6500000 0.002033554 3.3593011 13
## [10280] {other_vegetables,
## soft_cheese,
## whole_milk} => {whipped/sour_cream} 0.001321810 0.3823529 0.003457041 5.3339591 13
## [10281] {citrus_fruit,
## root_vegetables,
## soft_cheese} => {other_vegetables} 0.001016777 1.0000000 0.001016777 5.1681555 10
## [10282] {citrus_fruit,
## other_vegetables,
## soft_cheese} => {root_vegetables} 0.001016777 0.6666667 0.001525165 6.1162935 10
## [10283] {other_vegetables,
## root_vegetables,
## soft_cheese} => {citrus_fruit} 0.001016777 0.4166667 0.002440264 5.0342957 10
## [10284] {soft_cheese,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001423488 0.7368421 0.001931876 3.8081146 14
## [10285] {other_vegetables,
## soft_cheese,
## tropical_fruit} => {yogurt} 0.001423488 0.6666667 0.002135231 4.7789116 14
## [10286] {other_vegetables,
## soft_cheese,
## yogurt} => {tropical_fruit} 0.001423488 0.5000000 0.002846975 4.7650194 14
## [10287] {soft_cheese,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001525165 0.7894737 0.001931876 3.0897229 15
## [10288] {soft_cheese,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001525165 0.7142857 0.002135231 5.1202624 15
## [10289] {soft_cheese,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001525165 0.4411765 0.003457041 4.2044289 15
## [10290] {other_vegetables,
## soft_cheese,
## tropical_fruit} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [10291] {soft_cheese,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001423488 0.6666667 0.002135231 3.4454370 14
## [10292] {other_vegetables,
## soft_cheese,
## whole_milk} => {tropical_fruit} 0.001423488 0.4117647 0.003457041 3.9241336 14
## [10293] {root_vegetables,
## soft_cheese,
## yogurt} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [10294] {other_vegetables,
## root_vegetables,
## soft_cheese} => {yogurt} 0.001118454 0.4583333 0.002440264 3.2855017 11
## [10295] {other_vegetables,
## soft_cheese,
## yogurt} => {root_vegetables} 0.001118454 0.3928571 0.002846975 3.6042444 11
## [10296] {root_vegetables,
## soft_cheese,
## yogurt} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [10297] {root_vegetables,
## soft_cheese,
## whole_milk} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [10298] {soft_cheese,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.3235294 0.003457041 2.9682013 11
## [10299] {other_vegetables,
## root_vegetables,
## soft_cheese} => {whole_milk} 0.001830198 0.7500000 0.002440264 2.9352368 18
## [10300] {root_vegetables,
## soft_cheese,
## whole_milk} => {other_vegetables} 0.001830198 0.7826087 0.002338587 4.0446435 18
## [10301] {other_vegetables,
## soft_cheese,
## whole_milk} => {root_vegetables} 0.001830198 0.5294118 0.003457041 4.8570566 18
## [10302] {rolls/buns,
## soft_cheese,
## yogurt} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [10303] {other_vegetables,
## soft_cheese,
## yogurt} => {rolls/buns} 0.001118454 0.3928571 0.002846975 2.1358485 11
## [10304] {other_vegetables,
## rolls/buns,
## soft_cheese} => {yogurt} 0.001118454 0.5238095 0.002135231 3.7548591 11
## [10305] {other_vegetables,
## soft_cheese,
## yogurt} => {whole_milk} 0.001626843 0.5714286 0.002846975 2.2363709 16
## [10306] {soft_cheese,
## whole_milk,
## yogurt} => {other_vegetables} 0.001626843 0.4705882 0.003457041 2.4320732 16
## [10307] {other_vegetables,
## soft_cheese,
## whole_milk} => {yogurt} 0.001626843 0.4705882 0.003457041 3.3733493 16
## [10308] {other_vegetables,
## soda,
## specialty_bar} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [10309] {soda,
## specialty_bar,
## whole_milk} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [10310] {other_vegetables,
## specialty_bar,
## whole_milk} => {soda} 0.001016777 0.4166667 0.002440264 2.3894558 10
## [10311] {fruit/vegetable_juice,
## misc._beverages,
## tropical_fruit} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [10312] {fruit/vegetable_juice,
## misc._beverages,
## other_vegetables} => {tropical_fruit} 0.001016777 0.6666667 0.001525165 6.3533592 10
## [10313] {misc._beverages,
## other_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.001016777 0.5882353 0.001728521 8.1368412 10
## [10314] {misc._beverages,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [10315] {misc._beverages,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [10316] {misc._beverages,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001016777 0.4166667 0.002440264 3.9708495 10
## [10317] {grapes,
## other_vegetables,
## pork} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [10318] {grapes,
## pork,
## whole_milk} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [10319] {grapes,
## other_vegetables,
## whole_milk} => {pork} 0.001016777 0.2631579 0.003863752 4.5646524 10
## [10320] {citrus_fruit,
## fruit/vegetable_juice,
## grapes} => {tropical_fruit} 0.001118454 0.8461538 0.001321810 8.0638790 11
## [10321] {fruit/vegetable_juice,
## grapes,
## tropical_fruit} => {citrus_fruit} 0.001118454 0.6875000 0.001626843 8.3065878 11
## [10322] {citrus_fruit,
## grapes,
## tropical_fruit} => {fruit/vegetable_juice} 0.001118454 0.6111111 0.001830198 8.4532739 11
## [10323] {citrus_fruit,
## fruit/vegetable_juice,
## tropical_fruit} => {grapes} 0.001118454 0.2820513 0.003965430 12.6089744 11
## [10324] {fruit/vegetable_juice,
## grapes,
## tropical_fruit} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [10325] {fruit/vegetable_juice,
## grapes,
## other_vegetables} => {tropical_fruit} 0.001118454 0.7857143 0.001423488 7.4878876 11
## [10326] {grapes,
## other_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.001118454 0.3055556 0.003660397 4.2266370 11
## [10327] {fruit/vegetable_juice,
## grapes,
## other_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10328] {fruit/vegetable_juice,
## grapes,
## whole_milk} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [10329] {grapes,
## other_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.2631579 0.003863752 3.6401658 10
## [10330] {grapes,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [10331] {grapes,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001016777 0.5263158 0.001931876 5.0158099 10
## [10332] {grapes,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001016777 0.2777778 0.003660397 3.6719683 10
## [10333] {grapes,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [10334] {grapes,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [10335] {grapes,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001220132 0.3157895 0.003863752 4.1744482 12
## [10336] {grapes,
## pastry,
## tropical_fruit} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [10337] {grapes,
## other_vegetables,
## pastry} => {tropical_fruit} 0.001016777 0.5000000 0.002033554 4.7650194 10
## [10338] {grapes,
## other_vegetables,
## tropical_fruit} => {pastry} 0.001016777 0.2777778 0.003660397 3.1222222 10
## [10339] {other_vegetables,
## pastry,
## tropical_fruit} => {grapes} 0.001016777 0.2000000 0.005083884 8.9409091 10
## [10340] {citrus_fruit,
## grapes,
## tropical_fruit} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [10341] {citrus_fruit,
## grapes,
## other_vegetables} => {tropical_fruit} 0.001220132 0.7058824 0.001728521 6.7270862 12
## [10342] {grapes,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001220132 0.3333333 0.003660397 4.0274365 12
## [10343] {bottled_water,
## grapes,
## other_vegetables} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [10344] {bottled_water,
## grapes,
## whole_milk} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [10345] {grapes,
## other_vegetables,
## whole_milk} => {bottled_water} 0.001016777 0.2631579 0.003863752 2.3810100 10
## [10346] {grapes,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001220132 0.8000000 0.001525165 4.1345244 12
## [10347] {grapes,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001220132 0.3333333 0.003660397 3.0581468 12
## [10348] {grapes,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001220132 0.4444444 0.002745297 4.2355728 12
## [10349] {grapes,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001423488 0.8235294 0.001728521 4.2561281 14
## [10350] {grapes,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001423488 0.3888889 0.003660397 2.7876984 14
## [10351] {grapes,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001423488 0.5000000 0.002846975 4.7650194 14
## [10352] {grapes,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [10353] {grapes,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [10354] {grapes,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.4347826 0.002338587 4.1434951 10
## [10355] {grapes,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.002033554 0.5555556 0.003660397 2.1742495 20
## [10356] {grapes,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.002033554 0.8000000 0.002541942 4.1345244 20
## [10357] {grapes,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.002033554 0.5263158 0.003863752 5.0158099 20
## [10358] {grapes,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001220132 0.4444444 0.002745297 1.7393996 12
## [10359] {grapes,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [10360] {grapes,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001220132 0.3157895 0.003863752 2.8971917 12
## [10361] {grapes,
## other_vegetables,
## yogurt} => {whole_milk} 0.001728521 0.6071429 0.002846975 2.3761441 17
## [10362] {grapes,
## whole_milk,
## yogurt} => {other_vegetables} 0.001728521 0.7391304 0.002338587 3.8199411 17
## [10363] {grapes,
## other_vegetables,
## whole_milk} => {yogurt} 0.001728521 0.4473684 0.003863752 3.2069012 17
## [10364] {cat_food,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [10365] {cat_food,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [10366] {cat_food,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.3666667 0.003050330 5.1151300 11
## [10367] {cat_food,
## citrus_fruit,
## root_vegetables} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [10368] {cat_food,
## citrus_fruit,
## other_vegetables} => {root_vegetables} 0.001118454 0.6875000 0.001626843 6.3074277 11
## [10369] {cat_food,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001118454 0.3928571 0.002846975 4.7466216 11
## [10370] {cat_food,
## citrus_fruit,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [10371] {cat_food,
## citrus_fruit,
## whole_milk} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [10372] {cat_food,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001016777 0.3703704 0.002745297 4.4749295 10
## [10373] {cat_food,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [10374] {cat_food,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.3846154 0.002643620 2.7570644 10
## [10375] {cat_food,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.3703704 0.002745297 3.5296440 10
## [10376] {cat_food,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [10377] {cat_food,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.3846154 0.002643620 1.9877521 10
## [10378] {cat_food,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001016777 0.3333333 0.003050330 3.1766796 10
## [10379] {cat_food,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001321810 0.4642857 0.002846975 1.8170513 13
## [10380] {cat_food,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [10381] {cat_food,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001321810 0.4333333 0.003050330 3.9755908 13
## [10382] {cat_food,
## other_vegetables,
## yogurt} => {whole_milk} 0.001321810 0.4814815 0.002745297 1.8843495 13
## [10383] {cat_food,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.4814815 0.002745297 2.4883712 13
## [10384] {cat_food,
## other_vegetables,
## whole_milk} => {yogurt} 0.001321810 0.4333333 0.003050330 3.1062925 13
## [10385] {meat,
## sausage,
## soda} => {rolls/buns} 0.001016777 0.5555556 0.001830198 3.0203919 10
## [10386] {meat,
## rolls/buns,
## sausage} => {soda} 0.001016777 0.5000000 0.002033554 2.8673469 10
## [10387] {meat,
## rolls/buns,
## soda} => {sausage} 0.001016777 0.4347826 0.002338587 4.6277997 10
## [10388] {meat,
## rolls/buns,
## sausage} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [10389] {meat,
## other_vegetables,
## sausage} => {rolls/buns} 0.001016777 0.4347826 0.002338587 2.3637849 10
## [10390] {meat,
## other_vegetables,
## rolls/buns} => {sausage} 0.001016777 0.3225806 0.003152008 3.4335288 10
## [10391] {meat,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [10392] {meat,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [10393] {meat,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001016777 0.2439024 0.004168785 2.3243997 10
## [10394] {meat,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001220132 0.8571429 0.001423488 4.4298476 12
## [10395] {meat,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001220132 0.4444444 0.002745297 3.1859410 12
## [10396] {meat,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001220132 0.4285714 0.002846975 3.9319030 12
## [10397] {meat,
## root_vegetables,
## yogurt} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10398] {meat,
## root_vegetables,
## whole_milk} => {yogurt} 0.001016777 0.3225806 0.003152008 2.3123766 10
## [10399] {meat,
## whole_milk,
## yogurt} => {root_vegetables} 0.001016777 0.4166667 0.002440264 3.8226835 10
## [10400] {meat,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001626843 0.5925926 0.002745297 2.3191994 16
## [10401] {meat,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001626843 0.5161290 0.003152008 2.6674351 16
## [10402] {meat,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001626843 0.3902439 0.004168785 3.5802694 16
## [10403] {meat,
## rolls/buns,
## soda} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [10404] {meat,
## other_vegetables,
## soda} => {rolls/buns} 0.001016777 0.5000000 0.002033554 2.7183527 10
## [10405] {meat,
## other_vegetables,
## rolls/buns} => {soda} 0.001016777 0.3225806 0.003152008 1.8499013 10
## [10406] {meat,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [10407] {meat,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001220132 0.4285714 0.002846975 2.3300166 12
## [10408] {meat,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001220132 0.3870968 0.003152008 2.7748519 12
## [10409] {meat,
## other_vegetables,
## yogurt} => {whole_milk} 0.001525165 0.5357143 0.002846975 2.0965977 15
## [10410] {meat,
## whole_milk,
## yogurt} => {other_vegetables} 0.001525165 0.6250000 0.002440264 3.2300972 15
## [10411] {meat,
## other_vegetables,
## whole_milk} => {yogurt} 0.001525165 0.3658537 0.004168785 2.6225734 15
## [10412] {meat,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.001626843 0.5161290 0.003152008 2.0199479 16
## [10413] {meat,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.001626843 0.5000000 0.003253686 2.5840778 16
## [10414] {meat,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.001626843 0.3902439 0.004168785 2.1216411 16
## [10415] {curd,
## frozen_meals,
## yogurt} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [10416] {curd,
## frozen_meals,
## whole_milk} => {yogurt} 0.001118454 0.6875000 0.001626843 4.9282526 11
## [10417] {frozen_meals,
## whole_milk,
## yogurt} => {curd} 0.001118454 0.3333333 0.003355363 6.2563613 11
## [10418] {frankfurter,
## frozen_meals,
## tropical_fruit} => {other_vegetables} 0.001016777 0.9090909 0.001118454 4.6983232 10
## [10419] {frankfurter,
## frozen_meals,
## other_vegetables} => {tropical_fruit} 0.001016777 0.6666667 0.001525165 6.3533592 10
## [10420] {frozen_meals,
## other_vegetables,
## tropical_fruit} => {frankfurter} 0.001016777 0.4347826 0.002338587 7.3725637 10
## [10421] {frankfurter,
## other_vegetables,
## tropical_fruit} => {frozen_meals} 0.001016777 0.2564103 0.003965430 9.0386913 10
## [10422] {frankfurter,
## frozen_meals,
## tropical_fruit} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [10423] {frankfurter,
## frozen_meals,
## whole_milk} => {tropical_fruit} 0.001016777 0.5555556 0.001830198 5.2944660 10
## [10424] {frozen_meals,
## tropical_fruit,
## whole_milk} => {frankfurter} 0.001016777 0.2857143 0.003558719 4.8448276 10
## [10425] {frankfurter,
## frozen_meals,
## other_vegetables} => {whole_milk} 0.001220132 0.8000000 0.001525165 3.1309192 12
## [10426] {frankfurter,
## frozen_meals,
## whole_milk} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [10427] {frozen_meals,
## other_vegetables,
## whole_milk} => {frankfurter} 0.001220132 0.3333333 0.003660397 5.6522989 12
## [10428] {butter,
## frozen_meals,
## tropical_fruit} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [10429] {butter,
## frozen_meals,
## whole_milk} => {tropical_fruit} 0.001016777 0.6250000 0.001626843 5.9562742 10
## [10430] {frozen_meals,
## tropical_fruit,
## whole_milk} => {butter} 0.001016777 0.2857143 0.003558719 5.1559633 10
## [10431] {butter,
## frozen_meals,
## yogurt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [10432] {butter,
## frozen_meals,
## whole_milk} => {yogurt} 0.001118454 0.6875000 0.001626843 4.9282526 11
## [10433] {frozen_meals,
## whole_milk,
## yogurt} => {butter} 0.001118454 0.3333333 0.003355363 6.0152905 11
## [10434] {frozen_meals,
## fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10435] {frozen_meals,
## fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [10436] {frozen_meals,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.3030303 0.003355363 4.1917061 10
## [10437] {frozen_meals,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [10438] {frozen_meals,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.5263158 0.001931876 4.8286528 10
## [10439] {frozen_meals,
## other_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.001016777 0.4000000 0.002541942 5.5801418 10
## [10440] {frozen_meals,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [10441] {frozen_meals,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001220132 0.7500000 0.001626843 3.8761167 12
## [10442] {frozen_meals,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.3333333 0.003660397 4.6501182 12
## [10443] {frozen_meals,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001118454 0.5238095 0.002135231 3.7548591 11
## [10444] {frozen_meals,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001118454 0.5500000 0.002033554 5.2415213 11
## [10445] {frozen_meals,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001118454 0.5500000 0.002033554 7.2704973 11
## [10446] {frozen_meals,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [10447] {frozen_meals,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001118454 0.5789474 0.001931876 5.5173909 11
## [10448] {frozen_meals,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001118454 0.4782609 0.002338587 6.3221716 11
## [10449] {frozen_meals,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [10450] {frozen_meals,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001525165 0.6818182 0.002236909 6.4977537 15
## [10451] {frozen_meals,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001525165 0.4285714 0.003558719 5.6653226 15
## [10452] {frozen_meals,
## pip_fruit,
## yogurt} => {whole_milk} 0.001423488 0.7000000 0.002033554 2.7395543 14
## [10453] {frozen_meals,
## pip_fruit,
## whole_milk} => {yogurt} 0.001423488 0.6363636 0.002236909 4.5616883 14
## [10454] {frozen_meals,
## whole_milk,
## yogurt} => {pip_fruit} 0.001423488 0.4242424 0.003355363 5.6080971 14
## [10455] {frozen_meals,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [10456] {frozen_meals,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [10457] {frozen_meals,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001220132 0.3333333 0.003660397 4.4063620 12
## [10458] {frozen_meals,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [10459] {frozen_meals,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [10460] {frozen_meals,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [10461] {frozen_meals,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [10462] {frozen_meals,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001118454 0.3142857 0.003558719 2.8833955 11
## [10463] {frozen_meals,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001118454 0.4230769 0.002643620 4.0319395 11
## [10464] {frozen_meals,
## soda,
## tropical_fruit} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [10465] {frozen_meals,
## tropical_fruit,
## whole_milk} => {soda} 0.001118454 0.3142857 0.003558719 1.8023324 11
## [10466] {frozen_meals,
## soda,
## whole_milk} => {tropical_fruit} 0.001118454 0.5238095 0.002135231 4.9919251 11
## [10467] {frozen_meals,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001626843 0.8000000 0.002033554 3.1309192 16
## [10468] {frozen_meals,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001626843 0.4571429 0.003558719 3.2769679 16
## [10469] {frozen_meals,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001626843 0.4848485 0.003355363 4.6206249 16
## [10470] {frozen_meals,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001728521 0.7391304 0.002338587 2.8926971 17
## [10471] {frozen_meals,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001728521 0.4857143 0.003558719 2.5102470 17
## [10472] {frozen_meals,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001728521 0.4722222 0.003660397 4.5002961 17
## [10473] {frozen_meals,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001321810 0.7222222 0.001830198 3.7325568 13
## [10474] {frozen_meals,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001321810 0.5200000 0.002541942 3.7275510 13
## [10475] {frozen_meals,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001321810 0.6500000 0.002033554 5.9633862 13
## [10476] {frozen_meals,
## root_vegetables,
## yogurt} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [10477] {frozen_meals,
## root_vegetables,
## whole_milk} => {yogurt} 0.001118454 0.4230769 0.002643620 3.0327708 11
## [10478] {frozen_meals,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.3333333 0.003355363 3.0581468 11
## [10479] {frozen_meals,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001830198 0.7200000 0.002541942 2.8178273 18
## [10480] {frozen_meals,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001830198 0.6923077 0.002643620 3.5779538 18
## [10481] {frozen_meals,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001830198 0.5000000 0.003660397 4.5872201 18
## [10482] {frozen_meals,
## other_vegetables,
## yogurt} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [10483] {frozen_meals,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.3333333 0.003355363 1.7227185 11
## [10484] {frozen_meals,
## other_vegetables,
## whole_milk} => {yogurt} 0.001118454 0.3055556 0.003660397 2.1903345 11
## [10485] {butter,
## domestic_eggs,
## hard_cheese} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [10486] {butter,
## hard_cheese,
## other_vegetables} => {domestic_eggs} 0.001016777 0.5000000 0.002033554 7.8806090 10
## [10487] {domestic_eggs,
## hard_cheese,
## other_vegetables} => {butter} 0.001016777 0.5263158 0.001931876 9.4978271 10
## [10488] {butter,
## domestic_eggs,
## other_vegetables} => {hard_cheese} 0.001016777 0.2222222 0.004575496 9.0686953 10
## [10489] {butter,
## hard_cheese,
## whipped/sour_cream} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [10490] {butter,
## hard_cheese,
## yogurt} => {whipped/sour_cream} 0.001016777 0.6250000 0.001626843 8.7189716 10
## [10491] {hard_cheese,
## whipped/sour_cream,
## yogurt} => {butter} 0.001016777 0.5882353 0.001728521 10.6152186 10
## [10492] {butter,
## whipped/sour_cream,
## yogurt} => {hard_cheese} 0.001016777 0.2631579 0.003863752 10.7392444 10
## [10493] {butter,
## hard_cheese,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [10494] {butter,
## hard_cheese,
## other_vegetables} => {whipped/sour_cream} 0.001220132 0.6000000 0.002033554 8.3702128 12
## [10495] {hard_cheese,
## other_vegetables,
## whipped/sour_cream} => {butter} 0.001220132 0.4444444 0.002745297 8.0203874 12
## [10496] {butter,
## other_vegetables,
## whipped/sour_cream} => {hard_cheese} 0.001220132 0.2105263 0.005795628 8.5913955 12
## [10497] {butter,
## hard_cheese,
## whipped/sour_cream} => {whole_milk} 0.001423488 0.7000000 0.002033554 2.7395543 14
## [10498] {butter,
## hard_cheese,
## whole_milk} => {whipped/sour_cream} 0.001423488 0.6666667 0.002135231 9.3002364 14
## [10499] {hard_cheese,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001423488 0.5384615 0.002643620 9.7170078 14
## [10500] {butter,
## whipped/sour_cream,
## whole_milk} => {hard_cheese} 0.001423488 0.2121212 0.006710727 8.6564818 14
## [10501] {butter,
## hard_cheese,
## tropical_fruit} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [10502] {butter,
## hard_cheese,
## other_vegetables} => {tropical_fruit} 0.001016777 0.5000000 0.002033554 4.7650194 10
## [10503] {hard_cheese,
## other_vegetables,
## tropical_fruit} => {butter} 0.001016777 0.5000000 0.002033554 9.0229358 10
## [10504] {butter,
## hard_cheese,
## tropical_fruit} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [10505] {butter,
## hard_cheese,
## whole_milk} => {tropical_fruit} 0.001016777 0.4761905 0.002135231 4.5381137 10
## [10506] {hard_cheese,
## tropical_fruit,
## whole_milk} => {butter} 0.001016777 0.4347826 0.002338587 7.8460311 10
## [10507] {butter,
## hard_cheese,
## root_vegetables} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [10508] {butter,
## hard_cheese,
## other_vegetables} => {root_vegetables} 0.001016777 0.5000000 0.002033554 4.5872201 10
## [10509] {hard_cheese,
## other_vegetables,
## root_vegetables} => {butter} 0.001016777 0.2941176 0.003457041 5.3076093 10
## [10510] {butter,
## hard_cheese,
## root_vegetables} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [10511] {butter,
## hard_cheese,
## whole_milk} => {root_vegetables} 0.001016777 0.4761905 0.002135231 4.3687811 10
## [10512] {hard_cheese,
## root_vegetables,
## whole_milk} => {butter} 0.001016777 0.3125000 0.003253686 5.6393349 10
## [10513] {butter,
## hard_cheese,
## yogurt} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [10514] {butter,
## hard_cheese,
## whole_milk} => {yogurt} 0.001321810 0.6190476 0.002135231 4.4375607 13
## [10515] {hard_cheese,
## whole_milk,
## yogurt} => {butter} 0.001321810 0.3170732 0.004168785 5.7218617 13
## [10516] {butter,
## hard_cheese,
## other_vegetables} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [10517] {butter,
## hard_cheese,
## whole_milk} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [10518] {hard_cheese,
## other_vegetables,
## whole_milk} => {butter} 0.001118454 0.2558140 0.004372140 4.6163857 11
## [10519] {domestic_eggs,
## hard_cheese,
## root_vegetables} => {other_vegetables} 0.001220132 0.7500000 0.001626843 3.8761167 12
## [10520] {domestic_eggs,
## hard_cheese,
## other_vegetables} => {root_vegetables} 0.001220132 0.6315789 0.001931876 5.7943833 12
## [10521] {hard_cheese,
## other_vegetables,
## root_vegetables} => {domestic_eggs} 0.001220132 0.3529412 0.003457041 5.5627828 12
## [10522] {domestic_eggs,
## hard_cheese,
## root_vegetables} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [10523] {domestic_eggs,
## hard_cheese,
## whole_milk} => {root_vegetables} 0.001220132 0.5714286 0.002135231 5.2425373 12
## [10524] {hard_cheese,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001220132 0.3750000 0.003253686 5.9104567 12
## [10525] {domestic_eggs,
## hard_cheese,
## yogurt} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [10526] {domestic_eggs,
## hard_cheese,
## whole_milk} => {yogurt} 0.001220132 0.5714286 0.002135231 4.0962099 12
## [10527] {hard_cheese,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001220132 0.2926829 0.004168785 4.6130394 12
## [10528] {domestic_eggs,
## hard_cheese,
## other_vegetables} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [10529] {domestic_eggs,
## hard_cheese,
## whole_milk} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [10530] {hard_cheese,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.001016777 0.2325581 0.004372140 3.6653995 10
## [10531] {fruit/vegetable_juice,
## hard_cheese,
## tropical_fruit} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [10532] {fruit/vegetable_juice,
## hard_cheese,
## whole_milk} => {tropical_fruit} 0.001016777 0.4761905 0.002135231 4.5381137 10
## [10533] {hard_cheese,
## tropical_fruit,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.4347826 0.002338587 6.0141870 10
## [10534] {fruit/vegetable_juice,
## hard_cheese,
## yogurt} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [10535] {fruit/vegetable_juice,
## hard_cheese,
## whole_milk} => {yogurt} 0.001118454 0.5238095 0.002135231 3.7548591 11
## [10536] {hard_cheese,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.2682927 0.004168785 3.7111934 11
## [10537] {fruit/vegetable_juice,
## hard_cheese,
## other_vegetables} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [10538] {fruit/vegetable_juice,
## hard_cheese,
## whole_milk} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [10539] {hard_cheese,
## other_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001220132 0.2790698 0.004372140 3.8602689 12
## [10540] {hard_cheese,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.9090909 0.001118454 4.6983232 10
## [10541] {hard_cheese,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001016777 0.3703704 0.002745297 3.5296440 10
## [10542] {hard_cheese,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001016777 0.5000000 0.002033554 6.9751773 10
## [10543] {hard_cheese,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001321810 0.8125000 0.001626843 4.1991264 13
## [10544] {hard_cheese,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001321810 0.4814815 0.002745297 4.4173231 13
## [10545] {hard_cheese,
## other_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.001321810 0.3823529 0.003457041 5.3339591 13
## [10546] {hard_cheese,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [10547] {hard_cheese,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001220132 0.4615385 0.002643620 4.2343571 12
## [10548] {hard_cheese,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.3750000 0.003253686 5.2313830 12
## [10549] {hard_cheese,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [10550] {hard_cheese,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001118454 0.4074074 0.002745297 2.9204460 11
## [10551] {hard_cheese,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3928571 0.002846975 5.4804965 11
## [10552] {hard_cheese,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [10553] {hard_cheese,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001220132 0.4615385 0.002643620 3.3084772 12
## [10554] {hard_cheese,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001220132 0.2926829 0.004168785 4.0830306 12
## [10555] {hard_cheese,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001830198 0.6666667 0.002745297 2.6090994 18
## [10556] {hard_cheese,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001830198 0.6923077 0.002643620 3.5779538 18
## [10557] {hard_cheese,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001830198 0.4186047 0.004372140 5.8396833 18
## [10558] {citrus_fruit,
## hard_cheese,
## sausage} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [10559] {citrus_fruit,
## hard_cheese,
## other_vegetables} => {sausage} 0.001016777 0.5882353 0.001728521 6.2611408 10
## [10560] {hard_cheese,
## other_vegetables,
## sausage} => {citrus_fruit} 0.001016777 0.3448276 0.002948653 4.1663136 10
## [10561] {citrus_fruit,
## other_vegetables,
## sausage} => {hard_cheese} 0.001016777 0.2272727 0.004473818 9.2748020 10
## [10562] {citrus_fruit,
## hard_cheese,
## other_vegetables} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [10563] {citrus_fruit,
## hard_cheese,
## whole_milk} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [10564] {hard_cheese,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001016777 0.2325581 0.004372140 2.8098394 10
## [10565] {hard_cheese,
## rolls/buns,
## sausage} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [10566] {hard_cheese,
## other_vegetables,
## sausage} => {rolls/buns} 0.001220132 0.4137931 0.002948653 2.2496712 12
## [10567] {hard_cheese,
## other_vegetables,
## rolls/buns} => {sausage} 0.001220132 0.4137931 0.002948653 4.4043887 12
## [10568] {hard_cheese,
## other_vegetables,
## sausage} => {whole_milk} 0.001016777 0.3448276 0.002948653 1.3495341 10
## [10569] {hard_cheese,
## sausage,
## whole_milk} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [10570] {hard_cheese,
## other_vegetables,
## whole_milk} => {sausage} 0.001016777 0.2325581 0.004372140 2.4753347 10
## [10571] {hard_cheese,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [10572] {hard_cheese,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001118454 0.4782609 0.002338587 4.3877758 11
## [10573] {hard_cheese,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001118454 0.3437500 0.003253686 3.2759508 11
## [10574] {hard_cheese,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001423488 0.8235294 0.001728521 3.2230051 14
## [10575] {hard_cheese,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001423488 0.6086957 0.002338587 4.3633540 14
## [10576] {hard_cheese,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001423488 0.3414634 0.004168785 3.2541596 14
## [10577] {hard_cheese,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [10578] {hard_cheese,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [10579] {hard_cheese,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001220132 0.2790698 0.004372140 2.6595457 12
## [10580] {hard_cheese,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [10581] {hard_cheese,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001321810 0.3823529 0.003457041 2.7408463 13
## [10582] {hard_cheese,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001321810 0.4642857 0.002846975 4.2595616 13
## [10583] {hard_cheese,
## root_vegetables,
## yogurt} => {whole_milk} 0.001728521 0.7727273 0.002236909 3.0241833 17
## [10584] {hard_cheese,
## root_vegetables,
## whole_milk} => {yogurt} 0.001728521 0.5312500 0.003253686 3.8081952 17
## [10585] {hard_cheese,
## whole_milk,
## yogurt} => {root_vegetables} 0.001728521 0.4146341 0.004168785 3.8040362 17
## [10586] {hard_cheese,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [10587] {hard_cheese,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001016777 0.2941176 0.003457041 1.5990310 10
## [10588] {hard_cheese,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001016777 0.3448276 0.002948653 3.1636001 10
## [10589] {hard_cheese,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.002135231 0.6176471 0.003457041 2.4172538 21
## [10590] {hard_cheese,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.002135231 0.6562500 0.003253686 3.3916021 21
## [10591] {hard_cheese,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.002135231 0.4883721 0.004372140 4.4805406 21
## [10592] {hard_cheese,
## rolls/buns,
## yogurt} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [10593] {hard_cheese,
## whole_milk,
## yogurt} => {rolls/buns} 0.001016777 0.2439024 0.004168785 1.3260257 10
## [10594] {hard_cheese,
## rolls/buns,
## whole_milk} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [10595] {hard_cheese,
## other_vegetables,
## yogurt} => {whole_milk} 0.002033554 0.7142857 0.002846975 2.7954636 20
## [10596] {hard_cheese,
## whole_milk,
## yogurt} => {other_vegetables} 0.002033554 0.4878049 0.004168785 2.5210515 20
## [10597] {hard_cheese,
## other_vegetables,
## whole_milk} => {yogurt} 0.002033554 0.4651163 0.004372140 3.3341243 20
## [10598] {butter_milk,
## dessert,
## yogurt} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [10599] {butter_milk,
## dessert,
## whole_milk} => {yogurt} 0.001321810 0.6500000 0.002033554 4.6594388 13
## [10600] {butter_milk,
## whole_milk,
## yogurt} => {dessert} 0.001321810 0.2888889 0.004575496 7.7841705 13
## [10601] {dessert,
## whole_milk,
## yogurt} => {butter_milk} 0.001321810 0.2765957 0.004778851 9.8920696 13
## [10602] {butter_milk,
## cream_cheese_,
## yogurt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [10603] {butter_milk,
## cream_cheese_,
## whole_milk} => {yogurt} 0.001118454 0.6111111 0.001830198 4.3806689 11
## [10604] {butter_milk,
## whole_milk,
## yogurt} => {cream_cheese_} 0.001118454 0.2444444 0.004575496 6.1643875 11
## [10605] {butter_milk,
## cream_cheese_,
## other_vegetables} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [10606] {butter_milk,
## cream_cheese_,
## whole_milk} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [10607] {butter_milk,
## other_vegetables,
## whole_milk} => {cream_cheese_} 0.001016777 0.2173913 0.004677173 5.4821628 10
## [10608] {butter_milk,
## other_vegetables,
## pork} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [10609] {butter_milk,
## pork,
## whole_milk} => {other_vegetables} 0.001016777 0.9090909 0.001118454 4.6983232 10
## [10610] {butter_milk,
## other_vegetables,
## whole_milk} => {pork} 0.001016777 0.2173913 0.004677173 3.7707998 10
## [10611] {butter_milk,
## fruit/vegetable_juice,
## pip_fruit} => {other_vegetables} 0.001016777 0.9090909 0.001118454 4.6983232 10
## [10612] {butter_milk,
## fruit/vegetable_juice,
## other_vegetables} => {pip_fruit} 0.001016777 0.4347826 0.002338587 5.7474287 10
## [10613] {butter_milk,
## other_vegetables,
## pip_fruit} => {fruit/vegetable_juice} 0.001016777 0.3125000 0.003253686 4.3226969 10
## [10614] {fruit/vegetable_juice,
## other_vegetables,
## pip_fruit} => {butter_milk} 0.001016777 0.2325581 0.004372140 8.3171247 10
## [10615] {butter_milk,
## fruit/vegetable_juice,
## yogurt} => {other_vegetables} 0.001321810 0.7222222 0.001830198 3.7325568 13
## [10616] {butter_milk,
## fruit/vegetable_juice,
## other_vegetables} => {yogurt} 0.001321810 0.5652174 0.002338587 4.0516859 13
## [10617] {butter_milk,
## other_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.001321810 0.3170732 0.004168785 4.3859559 13
## [10618] {butter_milk,
## fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [10619] {butter_milk,
## fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.001321810 0.6190476 0.002135231 4.4375607 13
## [10620] {butter_milk,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001321810 0.2888889 0.004575496 3.9960931 13
## [10621] {butter_milk,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [10622] {butter_milk,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001220132 0.5217391 0.002338587 3.7400177 12
## [10623] {butter_milk,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001220132 0.2926829 0.004168785 4.0830306 12
## [10624] {butter_milk,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [10625] {butter_milk,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001016777 0.3448276 0.002948653 2.4718508 10
## [10626] {butter_milk,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001016777 0.2222222 0.004575496 3.1000788 10
## [10627] {butter_milk,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10628] {butter_milk,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001016777 0.3448276 0.002948653 1.8747260 10
## [10629] {butter_milk,
## rolls/buns,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2941176 0.003457041 4.1030455 10
## [10630] {butter_milk,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001728521 0.7391304 0.002338587 2.8926971 17
## [10631] {butter_milk,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001728521 0.5862069 0.002948653 3.0296084 17
## [10632] {butter_milk,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001728521 0.3695652 0.004677173 5.1555658 17
## [10633] {butter_milk,
## pip_fruit,
## root_vegetables} => {other_vegetables} 0.001220132 0.8571429 0.001423488 4.4298476 12
## [10634] {butter_milk,
## other_vegetables,
## pip_fruit} => {root_vegetables} 0.001220132 0.3750000 0.003253686 3.4404151 12
## [10635] {butter_milk,
## other_vegetables,
## root_vegetables} => {pip_fruit} 0.001220132 0.4285714 0.002846975 5.6653226 12
## [10636] {butter_milk,
## pip_fruit,
## yogurt} => {other_vegetables} 0.001423488 0.7000000 0.002033554 3.6177089 14
## [10637] {butter_milk,
## other_vegetables,
## pip_fruit} => {yogurt} 0.001423488 0.4375000 0.003253686 3.1361607 14
## [10638] {butter_milk,
## other_vegetables,
## yogurt} => {pip_fruit} 0.001423488 0.3414634 0.004168785 4.5138343 14
## [10639] {butter_milk,
## pip_fruit,
## yogurt} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [10640] {butter_milk,
## pip_fruit,
## whole_milk} => {yogurt} 0.001321810 0.5000000 0.002643620 3.5841837 13
## [10641] {butter_milk,
## whole_milk,
## yogurt} => {pip_fruit} 0.001321810 0.2888889 0.004575496 3.8188471 13
## [10642] {butter_milk,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001626843 0.5000000 0.003253686 1.9568245 16
## [10643] {butter_milk,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001626843 0.6153846 0.002643620 3.1804034 16
## [10644] {butter_milk,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001626843 0.3478261 0.004677173 4.5979430 16
## [10645] {butter_milk,
## pastry,
## yogurt} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [10646] {butter_milk,
## other_vegetables,
## pastry} => {yogurt} 0.001220132 0.8000000 0.001525165 5.7346939 12
## [10647] {butter_milk,
## other_vegetables,
## yogurt} => {pastry} 0.001220132 0.2926829 0.004168785 3.2897561 12
## [10648] {butter_milk,
## pastry,
## yogurt} => {whole_milk} 0.001423488 0.7368421 0.001931876 2.8837414 14
## [10649] {butter_milk,
## pastry,
## whole_milk} => {yogurt} 0.001423488 0.7368421 0.001931876 5.2819549 14
## [10650] {butter_milk,
## whole_milk,
## yogurt} => {pastry} 0.001423488 0.3111111 0.004575496 3.4968889 14
## [10651] {butter_milk,
## sausage,
## yogurt} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [10652] {butter_milk,
## sausage,
## whole_milk} => {yogurt} 0.001118454 0.5789474 0.001931876 4.1501074 11
## [10653] {butter_milk,
## whole_milk,
## yogurt} => {sausage} 0.001118454 0.2444444 0.004575496 2.6018519 11
## [10654] {butter_milk,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001423488 0.7000000 0.002033554 3.6177089 14
## [10655] {butter_milk,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001423488 0.5833333 0.002440264 4.1815476 14
## [10656] {butter_milk,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001423488 0.3414634 0.004168785 3.2541596 14
## [10657] {butter_milk,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [10658] {butter_milk,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.3928571 0.002846975 2.8161443 11
## [10659] {butter_milk,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.2444444 0.004575496 2.3295650 11
## [10660] {butter_milk,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [10661] {butter_milk,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001118454 0.3928571 0.002846975 2.0303468 11
## [10662] {butter_milk,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001118454 0.2391304 0.004677173 2.2789223 11
## [10663] {butter_milk,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [10664] {butter_milk,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001220132 0.4285714 0.002846975 3.0721574 12
## [10665] {butter_milk,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001220132 0.2926829 0.004168785 2.6852020 12
## [10666] {butter_milk,
## root_vegetables,
## yogurt} => {whole_milk} 0.001525165 0.8823529 0.001728521 3.4532197 15
## [10667] {butter_milk,
## root_vegetables,
## whole_milk} => {yogurt} 0.001525165 0.4838710 0.003152008 3.4685648 15
## [10668] {butter_milk,
## whole_milk,
## yogurt} => {root_vegetables} 0.001525165 0.3333333 0.004575496 3.0581468 15
## [10669] {butter_milk,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001931876 0.6785714 0.002846975 2.6556904 19
## [10670] {butter_milk,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001931876 0.6129032 0.003152008 3.1675792 19
## [10671] {butter_milk,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001931876 0.4130435 0.004677173 3.7894427 19
## [10672] {butter_milk,
## soda,
## yogurt} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [10673] {butter_milk,
## soda,
## whole_milk} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [10674] {butter_milk,
## whole_milk,
## yogurt} => {soda} 0.001016777 0.2222222 0.004575496 1.2743764 10
## [10675] {butter_milk,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001220132 0.4444444 0.002745297 2.2969580 12
## [10676] {butter_milk,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001220132 0.2926829 0.004168785 1.5912308 12
## [10677] {butter_milk,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001220132 0.4137931 0.002948653 2.9662210 12
## [10678] {butter_milk,
## rolls/buns,
## yogurt} => {whole_milk} 0.001626843 0.5925926 0.002745297 2.3191994 16
## [10679] {butter_milk,
## whole_milk,
## yogurt} => {rolls/buns} 0.001626843 0.3555556 0.004575496 1.9330508 16
## [10680] {butter_milk,
## rolls/buns,
## whole_milk} => {yogurt} 0.001626843 0.4705882 0.003457041 3.3733493 16
## [10681] {butter_milk,
## other_vegetables,
## yogurt} => {whole_milk} 0.002236909 0.5365854 0.004168785 2.1000068 22
## [10682] {butter_milk,
## whole_milk,
## yogurt} => {other_vegetables} 0.002236909 0.4888889 0.004575496 2.5266538 22
## [10683] {butter_milk,
## other_vegetables,
## whole_milk} => {yogurt} 0.002236909 0.4782609 0.004677173 3.4283496 22
## [10684] {butter_milk,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.001525165 0.5172414 0.002948653 2.0243012 15
## [10685] {butter_milk,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.001525165 0.4411765 0.003457041 2.2800686 15
## [10686] {butter_milk,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.001525165 0.3260870 0.004677173 1.7728387 15
## [10687] {candy,
## chocolate,
## soda} => {rolls/buns} 0.001220132 0.6315789 0.001931876 3.4337086 12
## [10688] {candy,
## chocolate,
## rolls/buns} => {soda} 0.001220132 0.6315789 0.001931876 3.6219119 12
## [10689] {candy,
## rolls/buns,
## soda} => {chocolate} 0.001220132 0.4000000 0.003050330 8.0614754 12
## [10690] {chocolate,
## rolls/buns,
## soda} => {candy} 0.001220132 0.3000000 0.004067107 10.0357143 12
## [10691] {candy,
## soda,
## tropical_fruit} => {yogurt} 0.001118454 0.6470588 0.001728521 4.6383553 11
## [10692] {candy,
## tropical_fruit,
## yogurt} => {soda} 0.001118454 0.4782609 0.002338587 2.7426797 11
## [10693] {candy,
## soda,
## yogurt} => {tropical_fruit} 0.001118454 0.5238095 0.002135231 4.9919251 11
## [10694] {candy,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001118454 0.4782609 0.002338587 2.6001634 11
## [10695] {candy,
## rolls/buns,
## tropical_fruit} => {yogurt} 0.001118454 0.5238095 0.002135231 3.7548591 11
## [10696] {candy,
## rolls/buns,
## yogurt} => {tropical_fruit} 0.001118454 0.6470588 0.001728521 6.1664957 11
## [10697] {candy,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [10698] {candy,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [10699] {candy,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001016777 0.4545455 0.002236909 4.3318358 10
## [10700] {candy,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.4347826 0.002338587 1.7015865 10
## [10701] {candy,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.7692308 0.001321810 5.5141287 10
## [10702] {candy,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.3846154 0.002643620 3.6653995 10
## [10703] {candy,
## root_vegetables,
## yogurt} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [10704] {candy,
## root_vegetables,
## whole_milk} => {yogurt} 0.001321810 0.5416667 0.002440264 3.8828656 13
## [10705] {candy,
## whole_milk,
## yogurt} => {root_vegetables} 0.001321810 0.5000000 0.002643620 4.5872201 13
## [10706] {candy,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [10707] {candy,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001016777 0.4545455 0.002236909 2.4712297 10
## [10708] {candy,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001016777 0.3846154 0.002643620 3.5286309 10
## [10709] {candy,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [10710] {candy,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001220132 0.5000000 0.002440264 2.5840778 12
## [10711] {candy,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001220132 0.4137931 0.002948653 3.7963201 12
## [10712] {candy,
## rolls/buns,
## soda} => {other_vegetables} 0.001525165 0.5000000 0.003050330 2.5840778 15
## [10713] {candy,
## other_vegetables,
## soda} => {rolls/buns} 0.001525165 0.6000000 0.002541942 3.2620232 15
## [10714] {candy,
## other_vegetables,
## rolls/buns} => {soda} 0.001525165 0.5769231 0.002643620 3.3084772 15
## [10715] {candy,
## rolls/buns,
## soda} => {whole_milk} 0.001321810 0.4333333 0.003050330 1.6959146 13
## [10716] {candy,
## soda,
## whole_milk} => {rolls/buns} 0.001321810 0.5200000 0.002541942 2.8270868 13
## [10717] {candy,
## rolls/buns,
## whole_milk} => {soda} 0.001321810 0.5000000 0.002643620 2.8673469 13
## [10718] {candy,
## other_vegetables,
## soda} => {whole_milk} 0.001016777 0.4000000 0.002541942 1.5654596 10
## [10719] {candy,
## soda,
## whole_milk} => {other_vegetables} 0.001016777 0.4000000 0.002541942 2.0672622 10
## [10720] {candy,
## other_vegetables,
## whole_milk} => {soda} 0.001016777 0.3448276 0.002948653 1.9774806 10
## [10721] {candy,
## rolls/buns,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [10722] {candy,
## whole_milk,
## yogurt} => {rolls/buns} 0.001016777 0.3846154 0.002643620 2.0910405 10
## [10723] {candy,
## rolls/buns,
## whole_milk} => {yogurt} 0.001016777 0.3846154 0.002643620 2.7570644 10
## [10724] {candy,
## other_vegetables,
## yogurt} => {whole_milk} 0.001423488 0.6363636 0.002236909 2.4905039 14
## [10725] {candy,
## whole_milk,
## yogurt} => {other_vegetables} 0.001423488 0.5384615 0.002643620 2.7828530 14
## [10726] {candy,
## other_vegetables,
## whole_milk} => {yogurt} 0.001423488 0.4827586 0.002948653 3.4605911 14
## [10727] {candy,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.001118454 0.4230769 0.002643620 1.6557746 11
## [10728] {candy,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.001118454 0.4230769 0.002643620 2.1865273 11
## [10729] {candy,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.001118454 0.3793103 0.002948653 2.0621986 11
## [10730] {ham,
## white_bread,
## yogurt} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [10731] {ham,
## white_bread,
## whole_milk} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [10732] {ham,
## whole_milk,
## yogurt} => {white_bread} 0.001016777 0.2564103 0.003965430 6.0912920 10
## [10733] {white_bread,
## whole_milk,
## yogurt} => {ham} 0.001016777 0.2083333 0.004880529 8.0037435 10
## [10734] {frozen_vegetables,
## ham,
## other_vegetables} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [10735] {frozen_vegetables,
## ham,
## whole_milk} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [10736] {ham,
## other_vegetables,
## whole_milk} => {frozen_vegetables} 0.001016777 0.2127660 0.004778851 4.4240025 10
## [10737] {curd,
## ham,
## yogurt} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [10738] {curd,
## ham,
## whole_milk} => {yogurt} 0.001118454 0.6111111 0.001830198 4.3806689 11
## [10739] {ham,
## whole_milk,
## yogurt} => {curd} 0.001118454 0.2820513 0.003965430 5.2938442 11
## [10740] {brown_bread,
## ham,
## other_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10741] {brown_bread,
## ham,
## whole_milk} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [10742] {ham,
## other_vegetables,
## whole_milk} => {brown_bread} 0.001016777 0.2127660 0.004778851 3.2798639 10
## [10743] {butter,
## ham,
## yogurt} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10744] {butter,
## ham,
## whole_milk} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [10745] {ham,
## whole_milk,
## yogurt} => {butter} 0.001016777 0.2564103 0.003965430 4.6271466 10
## [10746] {butter,
## ham,
## other_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10747] {butter,
## ham,
## whole_milk} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [10748] {ham,
## other_vegetables,
## whole_milk} => {butter} 0.001016777 0.2127660 0.004778851 3.8395471 10
## [10749] {domestic_eggs,
## ham,
## other_vegetables} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [10750] {domestic_eggs,
## ham,
## whole_milk} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [10751] {ham,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.001321810 0.2765957 0.004778851 4.3594858 13
## [10752] {fruit/vegetable_juice,
## ham,
## tropical_fruit} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [10753] {fruit/vegetable_juice,
## ham,
## other_vegetables} => {tropical_fruit} 0.001016777 0.7142857 0.001423488 6.8071705 10
## [10754] {ham,
## other_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.001016777 0.3846154 0.002643620 5.3202423 10
## [10755] {fruit/vegetable_juice,
## ham,
## other_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10756] {fruit/vegetable_juice,
## ham,
## whole_milk} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [10757] {ham,
## other_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.2127660 0.004778851 2.9431128 10
## [10758] {ham,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10759] {ham,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001016777 0.3846154 0.002643620 2.7570644 10
## [10760] {ham,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001016777 0.2564103 0.003965430 3.5770140 10
## [10761] {ham,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [10762] {ham,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001525165 0.5769231 0.002643620 2.9816282 15
## [10763] {ham,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001525165 0.3191489 0.004778851 4.4522408 15
## [10764] {ham,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [10765] {ham,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001016777 0.5882353 0.001728521 5.6059052 10
## [10766] {ham,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001016777 0.4166667 0.002440264 5.5079525 10
## [10767] {ham,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001626843 0.8888889 0.001830198 4.5939160 16
## [10768] {ham,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001626843 0.6153846 0.002643620 5.8646392 16
## [10769] {ham,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001626843 0.6153846 0.002643620 8.1348222 16
## [10770] {ham,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [10771] {ham,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001118454 0.5789474 0.001931876 5.5173909 11
## [10772] {ham,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001118454 0.4074074 0.002745297 5.3855536 11
## [10773] {ham,
## pip_fruit,
## yogurt} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [10774] {ham,
## other_vegetables,
## pip_fruit} => {yogurt} 0.001220132 0.4615385 0.002643620 3.3084772 12
## [10775] {ham,
## other_vegetables,
## yogurt} => {pip_fruit} 0.001220132 0.4000000 0.003050330 5.2876344 12
## [10776] {ham,
## pip_fruit,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [10777] {ham,
## pip_fruit,
## whole_milk} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [10778] {ham,
## whole_milk,
## yogurt} => {pip_fruit} 0.001016777 0.2564103 0.003965430 3.3895092 10
## [10779] {ham,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001525165 0.5769231 0.002643620 2.2578744 15
## [10780] {ham,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001525165 0.7894737 0.001931876 4.0801228 15
## [10781] {ham,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001525165 0.3191489 0.004778851 4.2188572 15
## [10782] {ham,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001728521 0.7083333 0.002440264 3.6607768 17
## [10783] {ham,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001728521 0.6538462 0.002643620 4.6870094 17
## [10784] {ham,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001728521 0.5666667 0.003050330 5.4003553 17
## [10785] {ham,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001626843 0.6666667 0.002440264 2.6090994 16
## [10786] {ham,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001626843 0.5925926 0.002745297 4.2479214 16
## [10787] {ham,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001626843 0.4102564 0.003965430 3.9097595 16
## [10788] {ham,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001931876 0.7307692 0.002643620 2.8599743 19
## [10789] {ham,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001931876 0.7037037 0.002745297 3.6368502 19
## [10790] {ham,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001931876 0.4042553 0.004778851 3.8525689 19
## [10791] {ham,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001118454 0.7857143 0.001423488 4.0606936 11
## [10792] {ham,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001118454 0.5238095 0.002135231 3.7548591 11
## [10793] {ham,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001118454 0.3666667 0.003050330 3.3639614 11
## [10794] {ham,
## root_vegetables,
## yogurt} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [10795] {ham,
## root_vegetables,
## whole_milk} => {yogurt} 0.001118454 0.5238095 0.002135231 3.7548591 11
## [10796] {ham,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.2820513 0.003965430 2.5876626 11
## [10797] {ham,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [10798] {ham,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001016777 0.4761905 0.002135231 2.5889073 10
## [10799] {ham,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001016777 0.2941176 0.003457041 2.6983648 10
## [10800] {ham,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [10801] {ham,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001423488 0.6666667 0.002135231 3.4454370 14
## [10802] {ham,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001423488 0.2978723 0.004778851 2.7328120 14
## [10803] {ham,
## rolls/buns,
## yogurt} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [10804] {ham,
## whole_milk,
## yogurt} => {rolls/buns} 0.001525165 0.3846154 0.003965430 2.0910405 15
## [10805] {ham,
## rolls/buns,
## whole_milk} => {yogurt} 0.001525165 0.4411765 0.003457041 3.1625150 15
## [10806] {ham,
## other_vegetables,
## yogurt} => {whole_milk} 0.002033554 0.6666667 0.003050330 2.6090994 20
## [10807] {ham,
## whole_milk,
## yogurt} => {other_vegetables} 0.002033554 0.5128205 0.003965430 2.6503362 20
## [10808] {ham,
## other_vegetables,
## whole_milk} => {yogurt} 0.002033554 0.4255319 0.004778851 3.0503691 20
## [10809] {ham,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [10810] {ham,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.001118454 0.3235294 0.003457041 1.6720503 11
## [10811] {ham,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.001118454 0.2340426 0.004778851 1.2724204 11
## [10812] {curd,
## sliced_cheese,
## yogurt} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [10813] {curd,
## sliced_cheese,
## whole_milk} => {yogurt} 0.001016777 0.7142857 0.001423488 5.1202624 10
## [10814] {sliced_cheese,
## whole_milk,
## yogurt} => {curd} 0.001016777 0.2222222 0.004575496 4.1709075 10
## [10815] {frankfurter,
## root_vegetables,
## sliced_cheese} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [10816] {frankfurter,
## sliced_cheese,
## whole_milk} => {root_vegetables} 0.001016777 0.6250000 0.001626843 5.7340252 10
## [10817] {root_vegetables,
## sliced_cheese,
## whole_milk} => {frankfurter} 0.001016777 0.3225806 0.003152008 5.4699666 10
## [10818] {frankfurter,
## root_vegetables,
## whole_milk} => {sliced_cheese} 0.001016777 0.2000000 0.005083884 8.1618257 10
## [10819] {frankfurter,
## sliced_cheese,
## yogurt} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [10820] {frankfurter,
## sliced_cheese,
## whole_milk} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [10821] {sliced_cheese,
## whole_milk,
## yogurt} => {frankfurter} 0.001016777 0.2222222 0.004575496 3.7681992 10
## [10822] {butter,
## sliced_cheese,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.9230769 0.001321810 3.6125991 12
## [10823] {butter,
## sliced_cheese,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.6000000 0.002033554 8.3702128 12
## [10824] {sliced_cheese,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001220132 0.4444444 0.002745297 8.0203874 12
## [10825] {butter,
## sliced_cheese,
## tropical_fruit} => {yogurt} 0.001118454 0.7857143 0.001423488 5.6322886 11
## [10826] {butter,
## sliced_cheese,
## yogurt} => {tropical_fruit} 0.001118454 0.6111111 0.001830198 5.8239126 11
## [10827] {sliced_cheese,
## tropical_fruit,
## yogurt} => {butter} 0.001118454 0.4074074 0.002745297 7.3520217 11
## [10828] {butter,
## tropical_fruit,
## yogurt} => {sliced_cheese} 0.001118454 0.2444444 0.004575496 9.9755648 11
## [10829] {butter,
## sliced_cheese,
## tropical_fruit} => {other_vegetables} 0.001118454 0.7857143 0.001423488 4.0606936 11
## [10830] {butter,
## other_vegetables,
## sliced_cheese} => {tropical_fruit} 0.001118454 0.6111111 0.001830198 5.8239126 11
## [10831] {other_vegetables,
## sliced_cheese,
## tropical_fruit} => {butter} 0.001118454 0.3666667 0.003050330 6.6168196 11
## [10832] {butter,
## other_vegetables,
## tropical_fruit} => {sliced_cheese} 0.001118454 0.2037037 0.005490595 8.3129706 11
## [10833] {butter,
## sliced_cheese,
## tropical_fruit} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [10834] {butter,
## sliced_cheese,
## whole_milk} => {tropical_fruit} 0.001118454 0.5500000 0.002033554 5.2415213 11
## [10835] {sliced_cheese,
## tropical_fruit,
## whole_milk} => {butter} 0.001118454 0.3928571 0.002846975 7.0894495 11
## [10836] {butter,
## root_vegetables,
## sliced_cheese} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [10837] {butter,
## sliced_cheese,
## whole_milk} => {root_vegetables} 0.001118454 0.5500000 0.002033554 5.0459422 11
## [10838] {root_vegetables,
## sliced_cheese,
## whole_milk} => {butter} 0.001118454 0.3548387 0.003152008 6.4033738 11
## [10839] {butter,
## sliced_cheese,
## yogurt} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [10840] {butter,
## other_vegetables,
## sliced_cheese} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [10841] {other_vegetables,
## sliced_cheese,
## yogurt} => {butter} 0.001016777 0.3333333 0.003050330 6.0152905 10
## [10842] {butter,
## sliced_cheese,
## yogurt} => {whole_milk} 0.001423488 0.7777778 0.001830198 3.0439492 14
## [10843] {butter,
## sliced_cheese,
## whole_milk} => {yogurt} 0.001423488 0.7000000 0.002033554 5.0178571 14
## [10844] {sliced_cheese,
## whole_milk,
## yogurt} => {butter} 0.001423488 0.3111111 0.004575496 5.6142712 14
## [10845] {butter,
## other_vegetables,
## sliced_cheese} => {whole_milk} 0.001423488 0.7777778 0.001830198 3.0439492 14
## [10846] {butter,
## sliced_cheese,
## whole_milk} => {other_vegetables} 0.001423488 0.7000000 0.002033554 3.6177089 14
## [10847] {other_vegetables,
## sliced_cheese,
## whole_milk} => {butter} 0.001423488 0.3111111 0.004575496 5.6142712 14
## [10848] {fruit/vegetable_juice,
## sliced_cheese,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [10849] {fruit/vegetable_juice,
## sliced_cheese,
## whole_milk} => {yogurt} 0.001118454 0.6111111 0.001830198 4.3806689 11
## [10850] {sliced_cheese,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.2444444 0.004575496 3.3813096 11
## [10851] {sliced_cheese,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001016777 0.7142857 0.001423488 5.1202624 10
## [10852] {sliced_cheese,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001016777 0.5263158 0.001931876 5.0158099 10
## [10853] {sliced_cheese,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3703704 0.002745297 5.1667980 10
## [10854] {sliced_cheese,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [10855] {sliced_cheese,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001118454 0.4074074 0.002745297 3.8826084 11
## [10856] {sliced_cheese,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.3928571 0.002846975 5.4804965 11
## [10857] {root_vegetables,
## sliced_cheese,
## whipped/sour_cream} => {yogurt} 0.001220132 0.6666667 0.001830198 4.7789116 12
## [10858] {sliced_cheese,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001220132 0.6315789 0.001931876 5.7943833 12
## [10859] {root_vegetables,
## sliced_cheese,
## yogurt} => {whipped/sour_cream} 0.001220132 0.5454545 0.002236909 7.6092843 12
## [10860] {root_vegetables,
## sliced_cheese,
## whipped/sour_cream} => {other_vegetables} 0.001321810 0.7222222 0.001830198 3.7325568 13
## [10861] {other_vegetables,
## sliced_cheese,
## whipped/sour_cream} => {root_vegetables} 0.001321810 0.6190476 0.002135231 5.6794154 13
## [10862] {other_vegetables,
## root_vegetables,
## sliced_cheese} => {whipped/sour_cream} 0.001321810 0.3513514 0.003762074 4.9014759 13
## [10863] {root_vegetables,
## sliced_cheese,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [10864] {sliced_cheese,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001321810 0.4814815 0.002745297 4.4173231 13
## [10865] {root_vegetables,
## sliced_cheese,
## whole_milk} => {whipped/sour_cream} 0.001321810 0.4193548 0.003152008 5.8501487 13
## [10866] {sliced_cheese,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [10867] {other_vegetables,
## sliced_cheese,
## whipped/sour_cream} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [10868] {other_vegetables,
## sliced_cheese,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3333333 0.003050330 4.6501182 10
## [10869] {sliced_cheese,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [10870] {sliced_cheese,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001220132 0.4444444 0.002745297 3.1859410 12
## [10871] {sliced_cheese,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001220132 0.2666667 0.004575496 3.7200946 12
## [10872] {other_vegetables,
## sliced_cheese,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [10873] {sliced_cheese,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001525165 0.5555556 0.002745297 2.8711975 15
## [10874] {other_vegetables,
## sliced_cheese,
## whole_milk} => {whipped/sour_cream} 0.001525165 0.3333333 0.004575496 4.6501182 15
## [10875] {pip_fruit,
## sausage,
## sliced_cheese} => {yogurt} 0.001220132 0.8571429 0.001423488 6.1443149 12
## [10876] {pip_fruit,
## sliced_cheese,
## yogurt} => {sausage} 0.001220132 0.6000000 0.002033554 6.3863636 12
## [10877] {sausage,
## sliced_cheese,
## yogurt} => {pip_fruit} 0.001220132 0.5000000 0.002440264 6.6095430 12
## [10878] {pip_fruit,
## sausage,
## yogurt} => {sliced_cheese} 0.001220132 0.3076923 0.003965430 12.5566550 12
## [10879] {pip_fruit,
## sausage,
## sliced_cheese} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10880] {pip_fruit,
## sliced_cheese,
## whole_milk} => {sausage} 0.001016777 0.4545455 0.002236909 4.8381543 10
## [10881] {sausage,
## sliced_cheese,
## whole_milk} => {pip_fruit} 0.001016777 0.3225806 0.003152008 4.2642213 10
## [10882] {pip_fruit,
## sliced_cheese,
## tropical_fruit} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [10883] {other_vegetables,
## pip_fruit,
## sliced_cheese} => {tropical_fruit} 0.001118454 0.5238095 0.002135231 4.9919251 11
## [10884] {other_vegetables,
## sliced_cheese,
## tropical_fruit} => {pip_fruit} 0.001118454 0.3666667 0.003050330 4.8469982 11
## [10885] {pip_fruit,
## sliced_cheese,
## yogurt} => {whole_milk} 0.001423488 0.7000000 0.002033554 2.7395543 14
## [10886] {pip_fruit,
## sliced_cheese,
## whole_milk} => {yogurt} 0.001423488 0.6363636 0.002236909 4.5616883 14
## [10887] {sliced_cheese,
## whole_milk,
## yogurt} => {pip_fruit} 0.001423488 0.3111111 0.004575496 4.1126045 14
## [10888] {other_vegetables,
## pip_fruit,
## sliced_cheese} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [10889] {pip_fruit,
## sliced_cheese,
## whole_milk} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [10890] {other_vegetables,
## sliced_cheese,
## whole_milk} => {pip_fruit} 0.001118454 0.2444444 0.004575496 3.2313321 11
## [10891] {other_vegetables,
## pastry,
## sliced_cheese} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [10892] {pastry,
## sliced_cheese,
## whole_milk} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [10893] {other_vegetables,
## sliced_cheese,
## whole_milk} => {pastry} 0.001016777 0.2222222 0.004575496 2.4977778 10
## [10894] {citrus_fruit,
## sliced_cheese,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [10895] {citrus_fruit,
## sliced_cheese,
## whole_milk} => {yogurt} 0.001118454 0.5500000 0.002033554 3.9426020 11
## [10896] {sliced_cheese,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001118454 0.2444444 0.004575496 2.9534535 11
## [10897] {citrus_fruit,
## other_vegetables,
## sliced_cheese} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10898] {citrus_fruit,
## sliced_cheese,
## whole_milk} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [10899] {other_vegetables,
## sliced_cheese,
## whole_milk} => {citrus_fruit} 0.001016777 0.2222222 0.004575496 2.6849577 10
## [10900] {root_vegetables,
## sausage,
## sliced_cheese} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [10901] {other_vegetables,
## sausage,
## sliced_cheese} => {root_vegetables} 0.001118454 0.4583333 0.002440264 4.2049518 11
## [10902] {other_vegetables,
## root_vegetables,
## sliced_cheese} => {sausage} 0.001118454 0.2972973 0.003762074 3.1644144 11
## [10903] {root_vegetables,
## sausage,
## sliced_cheese} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [10904] {sausage,
## sliced_cheese,
## whole_milk} => {root_vegetables} 0.001016777 0.3225806 0.003152008 2.9594969 10
## [10905] {root_vegetables,
## sliced_cheese,
## whole_milk} => {sausage} 0.001016777 0.3225806 0.003152008 3.4335288 10
## [10906] {sausage,
## sliced_cheese,
## soda} => {rolls/buns} 0.001118454 0.6111111 0.001830198 3.3224311 11
## [10907] {rolls/buns,
## sausage,
## sliced_cheese} => {soda} 0.001118454 0.3793103 0.002948653 2.1752287 11
## [10908] {rolls/buns,
## sliced_cheese,
## soda} => {sausage} 0.001118454 0.4782609 0.002338587 5.0905797 11
## [10909] {sausage,
## sliced_cheese,
## yogurt} => {whole_milk} 0.001525165 0.6250000 0.002440264 2.4460306 15
## [10910] {sausage,
## sliced_cheese,
## whole_milk} => {yogurt} 0.001525165 0.4838710 0.003152008 3.4685648 15
## [10911] {sliced_cheese,
## whole_milk,
## yogurt} => {sausage} 0.001525165 0.3333333 0.004575496 3.5479798 15
## [10912] {rolls/buns,
## sausage,
## sliced_cheese} => {whole_milk} 0.001321810 0.4482759 0.002948653 1.7543944 13
## [10913] {sausage,
## sliced_cheese,
## whole_milk} => {rolls/buns} 0.001321810 0.4193548 0.003152008 2.2799087 13
## [10914] {rolls/buns,
## sliced_cheese,
## whole_milk} => {sausage} 0.001321810 0.4333333 0.003050330 4.6123737 13
## [10915] {root_vegetables,
## sliced_cheese,
## tropical_fruit} => {yogurt} 0.001220132 0.6000000 0.002033554 4.3010204 12
## [10916] {sliced_cheese,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001220132 0.4444444 0.002745297 4.0775290 12
## [10917] {root_vegetables,
## sliced_cheese,
## yogurt} => {tropical_fruit} 0.001220132 0.5454545 0.002236909 5.1982030 12
## [10918] {root_vegetables,
## sliced_cheese,
## tropical_fruit} => {other_vegetables} 0.001525165 0.7500000 0.002033554 3.8761167 15
## [10919] {other_vegetables,
## sliced_cheese,
## tropical_fruit} => {root_vegetables} 0.001525165 0.5000000 0.003050330 4.5872201 15
## [10920] {other_vegetables,
## root_vegetables,
## sliced_cheese} => {tropical_fruit} 0.001525165 0.4054054 0.003762074 3.8635292 15
## [10921] {root_vegetables,
## sliced_cheese,
## tropical_fruit} => {whole_milk} 0.001423488 0.7000000 0.002033554 2.7395543 14
## [10922] {sliced_cheese,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001423488 0.5000000 0.002846975 4.5872201 14
## [10923] {root_vegetables,
## sliced_cheese,
## whole_milk} => {tropical_fruit} 0.001423488 0.4516129 0.003152008 4.3038885 14
## [10924] {sliced_cheese,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001728521 0.6296296 0.002745297 3.2540239 17
## [10925] {other_vegetables,
## sliced_cheese,
## tropical_fruit} => {yogurt} 0.001728521 0.5666667 0.003050330 4.0620748 17
## [10926] {other_vegetables,
## sliced_cheese,
## yogurt} => {tropical_fruit} 0.001728521 0.5666667 0.003050330 5.4003553 17
## [10927] {sliced_cheese,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001830198 0.6666667 0.002745297 2.6090994 18
## [10928] {sliced_cheese,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001830198 0.6428571 0.002846975 4.6082362 18
## [10929] {sliced_cheese,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001830198 0.4000000 0.004575496 3.8120155 18
## [10930] {other_vegetables,
## sliced_cheese,
## tropical_fruit} => {whole_milk} 0.001626843 0.5333333 0.003050330 2.0872795 16
## [10931] {sliced_cheese,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001626843 0.5714286 0.002846975 2.9532317 16
## [10932] {other_vegetables,
## sliced_cheese,
## whole_milk} => {tropical_fruit} 0.001626843 0.3555556 0.004575496 3.3884582 16
## [10933] {root_vegetables,
## sliced_cheese,
## yogurt} => {other_vegetables} 0.001525165 0.6818182 0.002236909 3.5237424 15
## [10934] {other_vegetables,
## root_vegetables,
## sliced_cheese} => {yogurt} 0.001525165 0.4054054 0.003762074 2.9060949 15
## [10935] {other_vegetables,
## sliced_cheese,
## yogurt} => {root_vegetables} 0.001525165 0.5000000 0.003050330 4.5872201 15
## [10936] {root_vegetables,
## sliced_cheese,
## yogurt} => {whole_milk} 0.001525165 0.6818182 0.002236909 2.6683971 15
## [10937] {root_vegetables,
## sliced_cheese,
## whole_milk} => {yogurt} 0.001525165 0.4838710 0.003152008 3.4685648 15
## [10938] {sliced_cheese,
## whole_milk,
## yogurt} => {root_vegetables} 0.001525165 0.3333333 0.004575496 3.0581468 15
## [10939] {other_vegetables,
## root_vegetables,
## sliced_cheese} => {whole_milk} 0.002440264 0.6486486 0.003762074 2.5385832 24
## [10940] {root_vegetables,
## sliced_cheese,
## whole_milk} => {other_vegetables} 0.002440264 0.7741935 0.003152008 4.0011527 24
## [10941] {other_vegetables,
## sliced_cheese,
## whole_milk} => {root_vegetables} 0.002440264 0.5333333 0.004575496 4.8930348 24
## [10942] {rolls/buns,
## sliced_cheese,
## yogurt} => {whole_milk} 0.001220132 0.5000000 0.002440264 1.9568245 12
## [10943] {sliced_cheese,
## whole_milk,
## yogurt} => {rolls/buns} 0.001220132 0.2666667 0.004575496 1.4497881 12
## [10944] {rolls/buns,
## sliced_cheese,
## whole_milk} => {yogurt} 0.001220132 0.4000000 0.003050330 2.8673469 12
## [10945] {other_vegetables,
## sliced_cheese,
## yogurt} => {whole_milk} 0.001931876 0.6333333 0.003050330 2.4786444 19
## [10946] {sliced_cheese,
## whole_milk,
## yogurt} => {other_vegetables} 0.001931876 0.4222222 0.004575496 2.1821101 19
## [10947] {other_vegetables,
## sliced_cheese,
## whole_milk} => {yogurt} 0.001931876 0.4222222 0.004575496 3.0266440 19
## [10948] {other_vegetables,
## rolls/buns,
## sliced_cheese} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [10949] {rolls/buns,
## sliced_cheese,
## whole_milk} => {other_vegetables} 0.001118454 0.3666667 0.003050330 1.8949904 11
## [10950] {other_vegetables,
## sliced_cheese,
## whole_milk} => {rolls/buns} 0.001118454 0.2444444 0.004575496 1.3289724 11
## [10951] {bottled_water,
## soda,
## uht_milk} => {other_vegetables} 0.001016777 0.3571429 0.002846975 1.8457698 10
## [10952] {bottled_water,
## other_vegetables,
## uht_milk} => {soda} 0.001016777 0.4545455 0.002236909 2.6066790 10
## [10953] {other_vegetables,
## soda,
## uht_milk} => {bottled_water} 0.001016777 0.5000000 0.002033554 4.5239190 10
## [10954] {coffee,
## oil,
## yogurt} => {other_vegetables} 0.001016777 0.9090909 0.001118454 4.6983232 10
## [10955] {coffee,
## oil,
## other_vegetables} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [10956] {oil,
## other_vegetables,
## yogurt} => {coffee} 0.001016777 0.3125000 0.003253686 5.3825525 10
## [10957] {coffee,
## other_vegetables,
## yogurt} => {oil} 0.001016777 0.2857143 0.003558719 10.1811594 10
## [10958] {coffee,
## oil,
## other_vegetables} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [10959] {coffee,
## oil,
## whole_milk} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [10960] {oil,
## other_vegetables,
## whole_milk} => {coffee} 0.001220132 0.2400000 0.005083884 4.1338004 12
## [10961] {beef,
## oil,
## other_vegetables} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [10962] {beef,
## oil,
## whole_milk} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [10963] {oil,
## other_vegetables,
## whole_milk} => {beef} 0.001118454 0.2200000 0.005083884 4.1932171 11
## [10964] {butter,
## oil,
## root_vegetables} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [10965] {butter,
## oil,
## whole_milk} => {root_vegetables} 0.001220132 0.6666667 0.001830198 6.1162935 12
## [10966] {oil,
## root_vegetables,
## whole_milk} => {butter} 0.001220132 0.2727273 0.004473818 4.9216013 12
## [10967] {butter,
## oil,
## other_vegetables} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [10968] {butter,
## oil,
## whole_milk} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [10969] {oil,
## other_vegetables,
## whole_milk} => {butter} 0.001220132 0.2400000 0.005083884 4.3310092 12
## [10970] {domestic_eggs,
## oil,
## root_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [10971] {domestic_eggs,
## oil,
## whole_milk} => {root_vegetables} 0.001016777 0.5555556 0.001830198 5.0969113 10
## [10972] {oil,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001016777 0.2272727 0.004473818 3.5820950 10
## [10973] {domestic_eggs,
## oil,
## other_vegetables} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [10974] {domestic_eggs,
## oil,
## whole_milk} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [10975] {oil,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.001016777 0.2000000 0.005083884 3.1522436 10
## [10976] {citrus_fruit,
## fruit/vegetable_juice,
## oil} => {root_vegetables} 0.001016777 0.7692308 0.001321810 7.0572618 10
## [10977] {fruit/vegetable_juice,
## oil,
## root_vegetables} => {citrus_fruit} 0.001016777 0.5555556 0.001830198 6.7123942 10
## [10978] {citrus_fruit,
## oil,
## root_vegetables} => {fruit/vegetable_juice} 0.001016777 0.4761905 0.002135231 6.5869667 10
## [10979] {citrus_fruit,
## fruit/vegetable_juice,
## root_vegetables} => {oil} 0.001016777 0.2941176 0.003457041 10.4806053 10
## [10980] {citrus_fruit,
## fruit/vegetable_juice,
## oil} => {other_vegetables} 0.001118454 0.8461538 0.001321810 4.3730547 11
## [10981] {fruit/vegetable_juice,
## oil,
## other_vegetables} => {citrus_fruit} 0.001118454 0.5238095 0.002135231 6.3288288 11
## [10982] {citrus_fruit,
## oil,
## other_vegetables} => {fruit/vegetable_juice} 0.001118454 0.4400000 0.002541942 6.0863572 11
## [10983] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables} => {oil} 0.001118454 0.2340426 0.004778851 8.3398859 11
## [10984] {fruit/vegetable_juice,
## oil,
## tropical_fruit} => {other_vegetables} 0.001220132 0.8571429 0.001423488 4.4298476 12
## [10985] {fruit/vegetable_juice,
## oil,
## other_vegetables} => {tropical_fruit} 0.001220132 0.5714286 0.002135231 5.4457364 12
## [10986] {oil,
## other_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.001220132 0.4800000 0.002541942 6.6396624 12
## [10987] {fruit/vegetable_juice,
## oil,
## root_vegetables} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [10988] {fruit/vegetable_juice,
## oil,
## other_vegetables} => {root_vegetables} 0.001220132 0.5714286 0.002135231 5.2425373 12
## [10989] {oil,
## other_vegetables,
## root_vegetables} => {fruit/vegetable_juice} 0.001220132 0.3157895 0.003863752 4.3681990 12
## [10990] {fruit/vegetable_juice,
## oil,
## root_vegetables} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [10991] {fruit/vegetable_juice,
## oil,
## whole_milk} => {root_vegetables} 0.001220132 0.6315789 0.001931876 5.7943833 12
## [10992] {oil,
## root_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001220132 0.2727273 0.004473818 3.7725355 12
## [10993] {fruit/vegetable_juice,
## oil,
## other_vegetables} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [10994] {fruit/vegetable_juice,
## oil,
## whole_milk} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [10995] {oil,
## other_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001220132 0.2400000 0.005083884 3.3198312 12
## [10996] {citrus_fruit,
## oil,
## tropical_fruit} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [10997] {citrus_fruit,
## oil,
## other_vegetables} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [10998] {oil,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001016777 0.4000000 0.002541942 4.8329238 10
## [10999] {citrus_fruit,
## oil,
## root_vegetables} => {other_vegetables} 0.001626843 0.7619048 0.002135231 3.9376423 16
## [11000] {citrus_fruit,
## oil,
## other_vegetables} => {root_vegetables} 0.001626843 0.6400000 0.002541942 5.8716418 16
## [11001] {oil,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001626843 0.4210526 0.003863752 5.0872882 16
## [11002] {citrus_fruit,
## oil,
## root_vegetables} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [11003] {citrus_fruit,
## oil,
## whole_milk} => {root_vegetables} 0.001321810 0.5200000 0.002541942 4.7707090 13
## [11004] {oil,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001321810 0.2954545 0.004473818 3.5697733 13
## [11005] {citrus_fruit,
## oil,
## other_vegetables} => {whole_milk} 0.001626843 0.6400000 0.002541942 2.5047354 16
## [11006] {citrus_fruit,
## oil,
## whole_milk} => {other_vegetables} 0.001626843 0.6400000 0.002541942 3.3076195 16
## [11007] {oil,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001626843 0.3200000 0.005083884 3.8663391 16
## [11008] {oil,
## root_vegetables,
## shopping_bags} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [11009] {oil,
## shopping_bags,
## whole_milk} => {root_vegetables} 0.001016777 0.6666667 0.001525165 6.1162935 10
## [11010] {oil,
## root_vegetables,
## whole_milk} => {shopping_bags} 0.001016777 0.2272727 0.004473818 2.3067361 10
## [11011] {oil,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001118454 0.5500000 0.002033554 3.9426020 11
## [11012] {oil,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001118454 0.5789474 0.001931876 5.3115181 11
## [11013] {oil,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001118454 0.5789474 0.001931876 5.5173909 11
## [11014] {oil,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001728521 0.8500000 0.002033554 4.3929322 17
## [11015] {oil,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001728521 0.6800000 0.002541942 6.2386194 17
## [11016] {oil,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001728521 0.4473684 0.003863752 4.2634384 17
## [11017] {oil,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001525165 0.7500000 0.002033554 2.9352368 15
## [11018] {oil,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001525165 0.6000000 0.002541942 5.5046642 15
## [11019] {oil,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001525165 0.3409091 0.004473818 3.2488768 15
## [11020] {oil,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001525165 0.7894737 0.001931876 4.0801228 15
## [11021] {oil,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001525165 0.6000000 0.002541942 4.3010204 15
## [11022] {oil,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001525165 0.4687500 0.003253686 4.4672057 15
## [11023] {oil,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001423488 0.7368421 0.001931876 2.8837414 14
## [11024] {oil,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001423488 0.5600000 0.002541942 4.0142857 14
## [11025] {oil,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001423488 0.4516129 0.003152008 4.3038885 14
## [11026] {oil,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [11027] {oil,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001525165 0.6000000 0.002541942 3.1008933 15
## [11028] {oil,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001525165 0.3000000 0.005083884 2.8590116 15
## [11029] {oil,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001423488 0.7368421 0.001931876 3.8081146 14
## [11030] {oil,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001423488 0.3684211 0.003863752 2.6409774 14
## [11031] {oil,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001423488 0.4375000 0.003253686 4.0138176 14
## [11032] {oil,
## root_vegetables,
## yogurt} => {whole_milk} 0.001525165 0.7894737 0.001931876 3.0897229 15
## [11033] {oil,
## root_vegetables,
## whole_milk} => {yogurt} 0.001525165 0.3409091 0.004473818 2.4437616 15
## [11034] {oil,
## whole_milk,
## yogurt} => {root_vegetables} 0.001525165 0.4838710 0.003152008 4.4392453 15
## [11035] {oil,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [11036] {oil,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001016777 0.2631579 0.003863752 1.4307119 10
## [11037] {oil,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001016777 0.5000000 0.002033554 4.5872201 10
## [11038] {oil,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001423488 0.7368421 0.001931876 2.8837414 14
## [11039] {oil,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001423488 0.3181818 0.004473818 1.7298608 14
## [11040] {oil,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001423488 0.4666667 0.003050330 4.2814055 14
## [11041] {oil,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.002643620 0.6842105 0.003863752 2.6777599 26
## [11042] {oil,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.002643620 0.5909091 0.004473818 3.0539101 26
## [11043] {oil,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.002643620 0.5200000 0.005083884 4.7707090 26
## [11044] {oil,
## rolls/buns,
## yogurt} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [11045] {oil,
## whole_milk,
## yogurt} => {rolls/buns} 0.001016777 0.3225806 0.003152008 1.7537759 10
## [11046] {oil,
## rolls/buns,
## whole_milk} => {yogurt} 0.001016777 0.3333333 0.003050330 2.3894558 10
## [11047] {oil,
## other_vegetables,
## yogurt} => {whole_milk} 0.002236909 0.6875000 0.003253686 2.6906337 22
## [11048] {oil,
## whole_milk,
## yogurt} => {other_vegetables} 0.002236909 0.7096774 0.003152008 3.6677233 22
## [11049] {oil,
## other_vegetables,
## whole_milk} => {yogurt} 0.002236909 0.4400000 0.005083884 3.1540816 22
## [11050] {oil,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [11051] {oil,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.001321810 0.4333333 0.003050330 2.2395341 13
## [11052] {oil,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.001321810 0.2600000 0.005083884 1.4135434 13
## [11053] {frozen_vegetables,
## onions,
## root_vegetables} => {other_vegetables} 0.001321810 0.8666667 0.001525165 4.4790681 13
## [11054] {frozen_vegetables,
## onions,
## other_vegetables} => {root_vegetables} 0.001321810 0.6190476 0.002135231 5.6794154 13
## [11055] {onions,
## other_vegetables,
## root_vegetables} => {frozen_vegetables} 0.001321810 0.2321429 0.005693950 4.8269027 13
## [11056] {frozen_vegetables,
## other_vegetables,
## root_vegetables} => {onions} 0.001321810 0.2166667 0.006100661 6.9866120 13
## [11057] {frozen_vegetables,
## onions,
## other_vegetables} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [11058] {frozen_vegetables,
## onions,
## whole_milk} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [11059] {beef,
## onions,
## tropical_fruit} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [11060] {beef,
## onions,
## other_vegetables} => {tropical_fruit} 0.001016777 0.5882353 0.001728521 5.6059052 10
## [11061] {onions,
## other_vegetables,
## tropical_fruit} => {beef} 0.001016777 0.2777778 0.003660397 5.2944660 10
## [11062] {beef,
## other_vegetables,
## tropical_fruit} => {onions} 0.001016777 0.2272727 0.004473818 7.3286140 10
## [11063] {beef,
## onions,
## root_vegetables} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [11064] {beef,
## onions,
## other_vegetables} => {root_vegetables} 0.001016777 0.5882353 0.001728521 5.3967296 10
## [11065] {beef,
## onions,
## other_vegetables} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [11066] {beef,
## onions,
## whole_milk} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [11067] {curd,
## onions,
## yogurt} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [11068] {curd,
## onions,
## whole_milk} => {yogurt} 0.001118454 0.6111111 0.001830198 4.3806689 11
## [11069] {onions,
## whole_milk,
## yogurt} => {curd} 0.001118454 0.2894737 0.003863752 5.4331559 11
## [11070] {curd,
## onions,
## other_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [11071] {curd,
## onions,
## whole_milk} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [11072] {napkins,
## onions,
## root_vegetables} => {other_vegetables} 0.001016777 0.9090909 0.001118454 4.6983232 10
## [11073] {napkins,
## onions,
## other_vegetables} => {root_vegetables} 0.001016777 0.5555556 0.001830198 5.0969113 10
## [11074] {napkins,
## other_vegetables,
## root_vegetables} => {onions} 0.001016777 0.2222222 0.004575496 7.1657559 10
## [11075] {napkins,
## onions,
## other_vegetables} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [11076] {napkins,
## onions,
## whole_milk} => {other_vegetables} 0.001220132 0.8000000 0.001525165 4.1345244 12
## [11077] {onions,
## pork,
## root_vegetables} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [11078] {onions,
## other_vegetables,
## pork} => {root_vegetables} 0.001118454 0.5500000 0.002033554 5.0459422 11
## [11079] {bottled_beer,
## onions,
## other_vegetables} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [11080] {bottled_beer,
## onions,
## whole_milk} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [11081] {brown_bread,
## onions,
## other_vegetables} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [11082] {brown_bread,
## onions,
## whole_milk} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [11083] {butter,
## domestic_eggs,
## onions} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [11084] {butter,
## onions,
## whole_milk} => {domestic_eggs} 0.001118454 0.3666667 0.003050330 5.7791132 11
## [11085] {domestic_eggs,
## onions,
## whole_milk} => {butter} 0.001118454 0.4074074 0.002745297 7.3520217 11
## [11086] {bottled_water,
## butter,
## onions} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [11087] {butter,
## onions,
## whole_milk} => {bottled_water} 0.001016777 0.3333333 0.003050330 3.0159460 10
## [11088] {bottled_water,
## onions,
## whole_milk} => {butter} 0.001016777 0.4347826 0.002338587 7.8460311 10
## [11089] {butter,
## onions,
## tropical_fruit} => {yogurt} 0.001118454 0.7857143 0.001423488 5.6322886 11
## [11090] {butter,
## onions,
## yogurt} => {tropical_fruit} 0.001118454 0.6875000 0.001626843 6.5519016 11
## [11091] {onions,
## tropical_fruit,
## yogurt} => {butter} 0.001118454 0.5238095 0.002135231 9.4525994 11
## [11092] {butter,
## tropical_fruit,
## yogurt} => {onions} 0.001118454 0.2444444 0.004575496 7.8823315 11
## [11093] {butter,
## onions,
## tropical_fruit} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [11094] {butter,
## onions,
## whole_milk} => {tropical_fruit} 0.001220132 0.4000000 0.003050330 3.8120155 12
## [11095] {onions,
## tropical_fruit,
## whole_milk} => {butter} 0.001220132 0.4285714 0.002846975 7.7339450 12
## [11096] {butter,
## onions,
## root_vegetables} => {other_vegetables} 0.001525165 0.7500000 0.002033554 3.8761167 15
## [11097] {butter,
## onions,
## other_vegetables} => {root_vegetables} 0.001525165 0.6521739 0.002338587 5.9833306 15
## [11098] {onions,
## other_vegetables,
## root_vegetables} => {butter} 0.001525165 0.2678571 0.005693950 4.8337156 15
## [11099] {butter,
## other_vegetables,
## root_vegetables} => {onions} 0.001525165 0.2307692 0.006609049 7.4413619 15
## [11100] {butter,
## onions,
## root_vegetables} => {whole_milk} 0.001728521 0.8500000 0.002033554 3.3266017 17
## [11101] {butter,
## onions,
## whole_milk} => {root_vegetables} 0.001728521 0.5666667 0.003050330 5.1988495 17
## [11102] {onions,
## root_vegetables,
## whole_milk} => {butter} 0.001728521 0.3617021 0.004778851 6.5272301 17
## [11103] {butter,
## root_vegetables,
## whole_milk} => {onions} 0.001728521 0.2098765 0.008235892 6.7676584 17
## [11104] {butter,
## onions,
## yogurt} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [11105] {butter,
## onions,
## other_vegetables} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [11106] {onions,
## other_vegetables,
## yogurt} => {butter} 0.001118454 0.2894737 0.003863752 5.2238049 11
## [11107] {butter,
## onions,
## yogurt} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [11108] {butter,
## onions,
## whole_milk} => {yogurt} 0.001321810 0.4333333 0.003050330 3.1062925 13
## [11109] {onions,
## whole_milk,
## yogurt} => {butter} 0.001321810 0.3421053 0.003863752 6.1735876 13
## [11110] {butter,
## onions,
## other_vegetables} => {whole_milk} 0.001830198 0.7826087 0.002338587 3.0628558 18
## [11111] {butter,
## onions,
## whole_milk} => {other_vegetables} 0.001830198 0.6000000 0.003050330 3.1008933 18
## [11112] {onions,
## other_vegetables,
## whole_milk} => {butter} 0.001830198 0.2769231 0.006609049 4.9973183 18
## [11113] {newspapers,
## onions,
## other_vegetables} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [11114] {newspapers,
## onions,
## whole_milk} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [11115] {domestic_eggs,
## onions,
## root_vegetables} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [11116] {domestic_eggs,
## onions,
## other_vegetables} => {root_vegetables} 0.001118454 0.4400000 0.002541942 4.0367537 11
## [11117] {domestic_eggs,
## onions,
## root_vegetables} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [11118] {domestic_eggs,
## onions,
## whole_milk} => {root_vegetables} 0.001118454 0.4074074 0.002745297 3.7377349 11
## [11119] {onions,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001118454 0.2340426 0.004778851 3.6887957 11
## [11120] {domestic_eggs,
## onions,
## other_vegetables} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [11121] {domestic_eggs,
## onions,
## whole_milk} => {other_vegetables} 0.001423488 0.5185185 0.002745297 2.6797844 14
## [11122] {onions,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.001423488 0.2153846 0.006609049 3.3947239 14
## [11123] {fruit/vegetable_juice,
## onions,
## yogurt} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [11124] {fruit/vegetable_juice,
## onions,
## other_vegetables} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [11125] {onions,
## other_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.2631579 0.003863752 3.6401658 10
## [11126] {fruit/vegetable_juice,
## onions,
## other_vegetables} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [11127] {fruit/vegetable_juice,
## onions,
## whole_milk} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [11128] {onions,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [11129] {onions,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001118454 0.3548387 0.003152008 3.3816267 11
## [11130] {onions,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001118454 0.3055556 0.003660397 4.2626084 11
## [11131] {onions,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [11132] {onions,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001118454 0.4074074 0.002745297 3.8826084 11
## [11133] {onions,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.3928571 0.002846975 5.4804965 11
## [11134] {onions,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.6086957 0.002338587 3.1458338 14
## [11135] {onions,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001423488 0.4516129 0.003152008 4.1432956 14
## [11136] {onions,
## other_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.001423488 0.2500000 0.005693950 3.4875887 14
## [11137] {onions,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [11138] {onions,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001423488 0.5185185 0.002745297 4.7571172 14
## [11139] {onions,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001423488 0.2978723 0.004778851 4.1554248 14
## [11140] {onions,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [11141] {onions,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001220132 0.3870968 0.003152008 2.7748519 12
## [11142] {onions,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001220132 0.3157895 0.003863752 4.4053751 12
## [11143] {onions,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [11144] {onions,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001220132 0.4444444 0.002745297 3.1859410 12
## [11145] {onions,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001220132 0.3157895 0.003863752 4.4053751 12
## [11146] {onions,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.002135231 0.6774194 0.003152008 2.6511816 21
## [11147] {onions,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.002135231 0.7777778 0.002745297 4.0196765 21
## [11148] {onions,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.002135231 0.3230769 0.006609049 4.5070376 21
## [11149] {onions,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [11150] {onions,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001016777 0.4545455 0.002236909 4.1702001 10
## [11151] {onions,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001016777 0.2127660 0.004778851 2.8125715 10
## [11152] {onions,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [11153] {onions,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001525165 0.6818182 0.002236909 3.5237424 15
## [11154] {onions,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001525165 0.2307692 0.006609049 3.0505583 15
## [11155] {bottled_water,
## citrus_fruit,
## onions} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [11156] {citrus_fruit,
## onions,
## other_vegetables} => {bottled_water} 0.001016777 0.2857143 0.003558719 2.5850966 10
## [11157] {bottled_water,
## onions,
## other_vegetables} => {citrus_fruit} 0.001016777 0.3448276 0.002948653 4.1663136 10
## [11158] {bottled_water,
## citrus_fruit,
## other_vegetables} => {onions} 0.001016777 0.2000000 0.005083884 6.4491803 10
## [11159] {citrus_fruit,
## onions,
## tropical_fruit} => {other_vegetables} 0.001220132 0.7500000 0.001626843 3.8761167 12
## [11160] {citrus_fruit,
## onions,
## other_vegetables} => {tropical_fruit} 0.001220132 0.3428571 0.003558719 3.2674419 12
## [11161] {onions,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001220132 0.3333333 0.003660397 4.0274365 12
## [11162] {citrus_fruit,
## onions,
## root_vegetables} => {other_vegetables} 0.001423488 0.8235294 0.001728521 4.2561281 14
## [11163] {citrus_fruit,
## onions,
## other_vegetables} => {root_vegetables} 0.001423488 0.4000000 0.003558719 3.6697761 14
## [11164] {onions,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001423488 0.2500000 0.005693950 3.0205774 14
## [11165] {citrus_fruit,
## onions,
## root_vegetables} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [11166] {citrus_fruit,
## onions,
## whole_milk} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [11167] {onions,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001016777 0.2127660 0.004778851 2.5707042 10
## [11168] {citrus_fruit,
## onions,
## other_vegetables} => {whole_milk} 0.001830198 0.5142857 0.003558719 2.0127338 18
## [11169] {citrus_fruit,
## onions,
## whole_milk} => {other_vegetables} 0.001830198 0.7826087 0.002338587 4.0446435 18
## [11170] {onions,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001830198 0.2769231 0.006609049 3.3458703 18
## [11171] {bottled_water,
## onions,
## root_vegetables} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [11172] {bottled_water,
## onions,
## other_vegetables} => {root_vegetables} 0.001220132 0.4137931 0.002948653 3.7963201 12
## [11173] {onions,
## other_vegetables,
## root_vegetables} => {bottled_water} 0.001220132 0.2142857 0.005693950 1.9388224 12
## [11174] {bottled_water,
## onions,
## root_vegetables} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [11175] {bottled_water,
## onions,
## whole_milk} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [11176] {onions,
## root_vegetables,
## whole_milk} => {bottled_water} 0.001016777 0.2127660 0.004778851 1.9250719 10
## [11177] {bottled_water,
## onions,
## other_vegetables} => {whole_milk} 0.001220132 0.4137931 0.002948653 1.6194410 12
## [11178] {bottled_water,
## onions,
## whole_milk} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [11179] {onions,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001626843 0.8888889 0.001830198 4.5939160 16
## [11180] {onions,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001626843 0.4444444 0.003660397 4.0775290 16
## [11181] {onions,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001626843 0.2857143 0.005693950 2.7228682 16
## [11182] {onions,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [11183] {onions,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001220132 0.4285714 0.002846975 3.9319030 12
## [11184] {onions,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001220132 0.2553191 0.004778851 2.4332014 12
## [11185] {onions,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001525165 0.7142857 0.002135231 3.6915397 15
## [11186] {onions,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001525165 0.4166667 0.003660397 2.9868197 15
## [11187] {onions,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001525165 0.3947368 0.003863752 3.7618574 15
## [11188] {onions,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [11189] {onions,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001525165 0.5357143 0.002846975 3.8401968 15
## [11190] {onions,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001525165 0.3947368 0.003863752 3.7618574 15
## [11191] {onions,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001931876 0.5277778 0.003660397 2.0655370 19
## [11192] {onions,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001931876 0.6785714 0.002846975 3.5069627 19
## [11193] {onions,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001931876 0.2923077 0.006609049 2.7857036 19
## [11194] {onions,
## root_vegetables,
## soda} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [11195] {onions,
## other_vegetables,
## root_vegetables} => {soda} 0.001321810 0.2321429 0.005693950 1.3312682 13
## [11196] {onions,
## other_vegetables,
## soda} => {root_vegetables} 0.001321810 0.5200000 0.002541942 4.7707090 13
## [11197] {onions,
## root_vegetables,
## yogurt} => {rolls/buns} 0.001016777 0.4347826 0.002338587 2.3637849 10
## [11198] {onions,
## rolls/buns,
## root_vegetables} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [11199] {onions,
## rolls/buns,
## yogurt} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [11200] {onions,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001423488 0.6086957 0.002338587 3.1458338 14
## [11201] {onions,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001423488 0.2500000 0.005693950 1.7920918 14
## [11202] {onions,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001423488 0.3684211 0.003863752 3.3800570 14
## [11203] {onions,
## root_vegetables,
## yogurt} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [11204] {onions,
## root_vegetables,
## whole_milk} => {yogurt} 0.001423488 0.2978723 0.004778851 2.1352584 14
## [11205] {onions,
## whole_milk,
## yogurt} => {root_vegetables} 0.001423488 0.3684211 0.003863752 3.3800570 14
## [11206] {onions,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001525165 0.6000000 0.002541942 3.1008933 15
## [11207] {onions,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001525165 0.2678571 0.005693950 1.4562604 15
## [11208] {onions,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001525165 0.4545455 0.003355363 4.1702001 15
## [11209] {onions,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [11210] {onions,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001525165 0.3191489 0.004778851 1.7351187 15
## [11211] {onions,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001525165 0.4838710 0.003152008 4.4392453 15
## [11212] {onions,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.003253686 0.5714286 0.005693950 2.2363709 32
## [11213] {onions,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.003253686 0.6808511 0.004778851 3.5187442 32
## [11214] {onions,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.003253686 0.4923077 0.006609049 4.5166475 32
## [11215] {onions,
## other_vegetables,
## soda} => {whole_milk} 0.001118454 0.4400000 0.002541942 1.7220056 11
## [11216] {onions,
## soda,
## whole_milk} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [11217] {onions,
## rolls/buns,
## yogurt} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [11218] {onions,
## whole_milk,
## yogurt} => {rolls/buns} 0.001321810 0.3421053 0.003863752 1.8599255 13
## [11219] {onions,
## rolls/buns,
## whole_milk} => {yogurt} 0.001321810 0.4193548 0.003152008 3.0060895 13
## [11220] {onions,
## other_vegetables,
## yogurt} => {whole_milk} 0.002440264 0.6315789 0.003863752 2.4717783 24
## [11221] {onions,
## whole_milk,
## yogurt} => {other_vegetables} 0.002440264 0.6315789 0.003863752 3.2640982 24
## [11222] {onions,
## other_vegetables,
## whole_milk} => {yogurt} 0.002440264 0.3692308 0.006609049 2.6467818 24
## [11223] {onions,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.001423488 0.4242424 0.003355363 1.6603360 14
## [11224] {onions,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.001423488 0.4516129 0.003152008 2.3340057 14
## [11225] {onions,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.001423488 0.2153846 0.006609049 1.1709827 14
## [11226] {beef,
## berries,
## root_vegetables} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [11227] {beef,
## berries,
## whole_milk} => {root_vegetables} 0.001016777 0.4761905 0.002135231 4.3687811 10
## [11228] {berries,
## root_vegetables,
## whole_milk} => {beef} 0.001016777 0.2777778 0.003660397 5.2944660 10
## [11229] {beef,
## berries,
## other_vegetables} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [11230] {beef,
## berries,
## whole_milk} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [11231] {berries,
## other_vegetables,
## whole_milk} => {beef} 0.001220132 0.2448980 0.004982206 4.6677741 12
## [11232] {berries,
## margarine,
## other_vegetables} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [11233] {berries,
## margarine,
## whole_milk} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [11234] {berries,
## other_vegetables,
## whole_milk} => {margarine} 0.001016777 0.2040816 0.004982206 3.4846230 10
## [11235] {berries,
## butter,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [11236] {berries,
## butter,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.4166667 0.002440264 5.8126478 10
## [11237] {berries,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001016777 0.2380952 0.004270463 4.2966361 10
## [11238] {berries,
## butter,
## sausage} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [11239] {berries,
## butter,
## whole_milk} => {sausage} 0.001016777 0.4166667 0.002440264 4.4349747 10
## [11240] {berries,
## sausage,
## whole_milk} => {butter} 0.001016777 0.4166667 0.002440264 7.5191131 10
## [11241] {butter,
## sausage,
## whole_milk} => {berries} 0.001016777 0.2127660 0.004778851 6.3992452 10
## [11242] {berries,
## butter,
## tropical_fruit} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [11243] {berries,
## butter,
## whole_milk} => {tropical_fruit} 0.001016777 0.4166667 0.002440264 3.9708495 10
## [11244] {berries,
## tropical_fruit,
## whole_milk} => {butter} 0.001016777 0.3030303 0.003355363 5.4684459 10
## [11245] {berries,
## butter,
## root_vegetables} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [11246] {berries,
## butter,
## whole_milk} => {root_vegetables} 0.001016777 0.4166667 0.002440264 3.8226835 10
## [11247] {berries,
## root_vegetables,
## whole_milk} => {butter} 0.001016777 0.2777778 0.003660397 5.0127421 10
## [11248] {berries,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [11249] {berries,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001118454 0.2619048 0.004270463 2.4959625 11
## [11250] {berries,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.3333333 0.003355363 4.6501182 11
## [11251] {berries,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [11252] {berries,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001118454 0.2619048 0.004270463 2.4028296 11
## [11253] {berries,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.3055556 0.003660397 4.2626084 11
## [11254] {berries,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001321810 0.4482759 0.002948653 1.7543944 13
## [11255] {berries,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001321810 0.3095238 0.004270463 2.2187804 13
## [11256] {berries,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001321810 0.3939394 0.003355363 5.4955942 13
## [11257] {berries,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.6818182 0.002236909 2.6683971 15
## [11258] {berries,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001525165 0.3571429 0.004270463 1.8457698 15
## [11259] {berries,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001525165 0.3061224 0.004982206 4.2705167 15
## [11260] {berries,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [11261] {berries,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [11262] {berries,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001220132 0.2448980 0.004982206 3.2373272 12
## [11263] {berries,
## pastry,
## yogurt} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [11264] {berries,
## pastry,
## whole_milk} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [11265] {berries,
## whole_milk,
## yogurt} => {pastry} 0.001118454 0.3333333 0.003355363 3.7466667 11
## [11266] {berries,
## other_vegetables,
## pastry} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [11267] {berries,
## pastry,
## whole_milk} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [11268] {berries,
## other_vegetables,
## whole_milk} => {pastry} 0.001118454 0.2244898 0.004982206 2.5232653 11
## [11269] {berries,
## citrus_fruit,
## other_vegetables} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [11270] {berries,
## citrus_fruit,
## whole_milk} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [11271] {berries,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001118454 0.2244898 0.004982206 2.7123552 11
## [11272] {berries,
## other_vegetables,
## sausage} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [11273] {berries,
## sausage,
## whole_milk} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [11274] {berries,
## other_vegetables,
## whole_milk} => {sausage} 0.001118454 0.2244898 0.004982206 2.3894558 11
## [11275] {berries,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001321810 0.6842105 0.001931876 3.5361064 13
## [11276] {berries,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001321810 0.4642857 0.002846975 4.2595616 13
## [11277] {berries,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001321810 0.4333333 0.003050330 4.1296835 13
## [11278] {berries,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [11279] {berries,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001220132 0.3636364 0.003355363 3.3361601 12
## [11280] {berries,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001220132 0.3333333 0.003660397 3.1766796 12
## [11281] {berries,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [11282] {berries,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [11283] {berries,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001016777 0.2631579 0.003863752 2.5079049 10
## [11284] {berries,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001220132 0.5000000 0.002440264 1.9568245 12
## [11285] {berries,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001220132 0.3636364 0.003355363 2.6066790 12
## [11286] {berries,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001220132 0.3636364 0.003355363 3.4654686 12
## [11287] {berries,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001626843 0.5714286 0.002846975 2.2363709 16
## [11288] {berries,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001626843 0.4848485 0.003355363 2.5057724 16
## [11289] {berries,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001626843 0.3265306 0.004982206 3.1118494 16
## [11290] {berries,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [11291] {berries,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001016777 0.3333333 0.003050330 2.3894558 10
## [11292] {berries,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001016777 0.2631579 0.003863752 2.4143264 10
## [11293] {berries,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [11294] {berries,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001118454 0.3666667 0.003050330 1.9934586 11
## [11295] {berries,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001118454 0.4074074 0.002745297 3.7377349 11
## [11296] {berries,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [11297] {berries,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001118454 0.3055556 0.003660397 1.6612155 11
## [11298] {berries,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001118454 0.3928571 0.002846975 3.6042444 11
## [11299] {berries,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001626843 0.5333333 0.003050330 2.0872795 16
## [11300] {berries,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001626843 0.4444444 0.003660397 2.2969580 16
## [11301] {berries,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001626843 0.3265306 0.004982206 2.9957356 16
## [11302] {berries,
## soda,
## yogurt} => {rolls/buns} 0.001016777 0.3846154 0.002643620 2.0910405 10
## [11303] {berries,
## rolls/buns,
## soda} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [11304] {berries,
## rolls/buns,
## yogurt} => {soda} 0.001016777 0.3846154 0.002643620 2.2056515 10
## [11305] {berries,
## soda,
## yogurt} => {other_vegetables} 0.001016777 0.3846154 0.002643620 1.9877521 10
## [11306] {berries,
## other_vegetables,
## soda} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [11307] {berries,
## other_vegetables,
## yogurt} => {soda} 0.001016777 0.2631579 0.003863752 1.5091300 10
## [11308] {berries,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001016777 0.3846154 0.002643620 1.9877521 10
## [11309] {berries,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001016777 0.2631579 0.003863752 1.4307119 10
## [11310] {berries,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001016777 0.3703704 0.002745297 2.6549509 10
## [11311] {berries,
## rolls/buns,
## yogurt} => {whole_milk} 0.001016777 0.3846154 0.002643620 1.5052496 10
## [11312] {berries,
## whole_milk,
## yogurt} => {rolls/buns} 0.001016777 0.3030303 0.003355363 1.6474865 10
## [11313] {berries,
## rolls/buns,
## whole_milk} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [11314] {berries,
## other_vegetables,
## yogurt} => {whole_milk} 0.001220132 0.3157895 0.003863752 1.2358892 12
## [11315] {berries,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.3636364 0.003355363 1.8793293 12
## [11316] {berries,
## other_vegetables,
## whole_milk} => {yogurt} 0.001220132 0.2448980 0.004982206 1.7555185 12
## [11317] {berries,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.001321810 0.4814815 0.002745297 1.8843495 13
## [11318] {berries,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.001321810 0.4642857 0.002846975 2.3995008 13
## [11319] {berries,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.001321810 0.2653061 0.004982206 1.4423912 13
## [11320] {beef,
## hamburger_meat,
## root_vegetables} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [11321] {beef,
## hamburger_meat,
## whole_milk} => {root_vegetables} 0.001118454 0.5000000 0.002236909 4.5872201 11
## [11322] {hamburger_meat,
## root_vegetables,
## whole_milk} => {beef} 0.001118454 0.2820513 0.003965430 5.3759193 11
## [11323] {beef,
## hamburger_meat,
## rolls/buns} => {other_vegetables} 0.001321810 0.7647059 0.001728521 3.9521189 13
## [11324] {beef,
## hamburger_meat,
## other_vegetables} => {rolls/buns} 0.001321810 0.6190476 0.002135231 3.3655795 13
## [11325] {hamburger_meat,
## other_vegetables,
## rolls/buns} => {beef} 0.001321810 0.2826087 0.004677173 5.3865436 13
## [11326] {beef,
## other_vegetables,
## rolls/buns} => {hamburger_meat} 0.001321810 0.2280702 0.005795628 6.8595418 13
## [11327] {beef,
## hamburger_meat,
## other_vegetables} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [11328] {beef,
## hamburger_meat,
## whole_milk} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [11329] {curd,
## hamburger_meat,
## other_vegetables} => {whole_milk} 0.001626843 0.8000000 0.002033554 3.1309192 16
## [11330] {curd,
## hamburger_meat,
## whole_milk} => {other_vegetables} 0.001626843 0.6400000 0.002541942 3.3076195 16
## [11331] {hamburger_meat,
## other_vegetables,
## whole_milk} => {curd} 0.001626843 0.2580645 0.006304016 4.8436346 16
## [11332] {hamburger_meat,
## other_vegetables,
## pork} => {whole_milk} 0.001525165 0.7500000 0.002033554 2.9352368 15
## [11333] {hamburger_meat,
## pork,
## whole_milk} => {other_vegetables} 0.001525165 0.7142857 0.002135231 3.6915397 15
## [11334] {hamburger_meat,
## other_vegetables,
## whole_milk} => {pork} 0.001525165 0.2419355 0.006304016 4.1965352 15
## [11335] {frankfurter,
## hamburger_meat,
## other_vegetables} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [11336] {frankfurter,
## hamburger_meat,
## whole_milk} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [11337] {hamburger_meat,
## margarine,
## other_vegetables} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [11338] {hamburger_meat,
## margarine,
## whole_milk} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [11339] {butter,
## hamburger_meat,
## whipped/sour_cream} => {yogurt} 0.001016777 0.6666667 0.001525165 4.7789116 10
## [11340] {butter,
## hamburger_meat,
## yogurt} => {whipped/sour_cream} 0.001016777 0.5555556 0.001830198 7.7501970 10
## [11341] {hamburger_meat,
## whipped/sour_cream,
## yogurt} => {butter} 0.001016777 0.6250000 0.001626843 11.2786697 10
## [11342] {butter,
## whipped/sour_cream,
## yogurt} => {hamburger_meat} 0.001016777 0.2631579 0.003863752 7.9148559 10
## [11343] {butter,
## hamburger_meat,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [11344] {butter,
## hamburger_meat,
## other_vegetables} => {whipped/sour_cream} 0.001016777 0.4166667 0.002440264 5.8126478 10
## [11345] {hamburger_meat,
## other_vegetables,
## whipped/sour_cream} => {butter} 0.001016777 0.4166667 0.002440264 7.5191131 10
## [11346] {butter,
## hamburger_meat,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.8000000 0.001525165 3.1309192 12
## [11347] {butter,
## hamburger_meat,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.4000000 0.003050330 5.5801418 12
## [11348] {hamburger_meat,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001220132 0.4615385 0.002643620 8.3288638 12
## [11349] {butter,
## hamburger_meat,
## yogurt} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [11350] {butter,
## hamburger_meat,
## other_vegetables} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [11351] {hamburger_meat,
## other_vegetables,
## yogurt} => {butter} 0.001016777 0.2941176 0.003457041 5.3076093 10
## [11352] {butter,
## hamburger_meat,
## yogurt} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [11353] {butter,
## hamburger_meat,
## whole_milk} => {yogurt} 0.001220132 0.4000000 0.003050330 2.8673469 12
## [11354] {hamburger_meat,
## whole_milk,
## yogurt} => {butter} 0.001220132 0.3076923 0.003965430 5.5525759 12
## [11355] {butter,
## hamburger_meat,
## other_vegetables} => {whole_milk} 0.001626843 0.6666667 0.002440264 2.6090994 16
## [11356] {butter,
## hamburger_meat,
## whole_milk} => {other_vegetables} 0.001626843 0.5333333 0.003050330 2.7563496 16
## [11357] {hamburger_meat,
## other_vegetables,
## whole_milk} => {butter} 0.001626843 0.2580645 0.006304016 4.6569991 16
## [11358] {domestic_eggs,
## hamburger_meat,
## other_vegetables} => {whole_milk} 0.001728521 0.7391304 0.002338587 2.8926971 17
## [11359] {domestic_eggs,
## hamburger_meat,
## whole_milk} => {other_vegetables} 0.001728521 0.6800000 0.002541942 3.5143458 17
## [11360] {hamburger_meat,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.001728521 0.2741935 0.006304016 4.3216243 17
## [11361] {fruit/vegetable_juice,
## hamburger_meat,
## yogurt} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [11362] {fruit/vegetable_juice,
## hamburger_meat,
## other_vegetables} => {yogurt} 0.001016777 0.6666667 0.001525165 4.7789116 10
## [11363] {hamburger_meat,
## other_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.2941176 0.003457041 4.0684206 10
## [11364] {hamburger_meat,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.9090909 0.001118454 4.6983232 10
## [11365] {hamburger_meat,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001016777 0.4166667 0.002440264 3.9708495 10
## [11366] {hamburger_meat,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001016777 0.4347826 0.002338587 6.0653716 10
## [11367] {hamburger_meat,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [11368] {hamburger_meat,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001016777 0.3846154 0.002643620 3.5286309 10
## [11369] {hamburger_meat,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2564103 0.003965430 3.5770140 10
## [11370] {hamburger_meat,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [11371] {hamburger_meat,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [11372] {hamburger_meat,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001016777 0.2941176 0.003457041 4.1030455 10
## [11373] {hamburger_meat,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [11374] {hamburger_meat,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001220132 0.4615385 0.002643620 3.3084772 12
## [11375] {hamburger_meat,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001220132 0.3076923 0.003965430 4.2924168 12
## [11376] {hamburger_meat,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001728521 0.7083333 0.002440264 2.7721681 17
## [11377] {hamburger_meat,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001728521 0.6538462 0.002643620 3.3791786 17
## [11378] {hamburger_meat,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001728521 0.2741935 0.006304016 3.8250972 17
## [11379] {hamburger_meat,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001626843 0.5517241 0.002948653 2.1592546 16
## [11380] {hamburger_meat,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001626843 0.6400000 0.002541942 3.3076195 16
## [11381] {hamburger_meat,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001626843 0.2580645 0.006304016 3.4113770 16
## [11382] {hamburger_meat,
## other_vegetables,
## pastry} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [11383] {hamburger_meat,
## pastry,
## whole_milk} => {other_vegetables} 0.001016777 0.4000000 0.002541942 2.0672622 10
## [11384] {citrus_fruit,
## hamburger_meat,
## yogurt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [11385] {citrus_fruit,
## hamburger_meat,
## whole_milk} => {yogurt} 0.001118454 0.5000000 0.002236909 3.5841837 11
## [11386] {hamburger_meat,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001118454 0.2820513 0.003965430 3.4078309 11
## [11387] {hamburger_meat,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [11388] {hamburger_meat,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [11389] {hamburger_meat,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001118454 0.3235294 0.003457041 3.0832478 11
## [11390] {hamburger_meat,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [11391] {hamburger_meat,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [11392] {hamburger_meat,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.2564103 0.003965430 2.4435997 10
## [11393] {hamburger_meat,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [11394] {hamburger_meat,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001016777 0.2777778 0.003660397 1.9912132 10
## [11395] {hamburger_meat,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001016777 0.2941176 0.003457041 2.6983648 10
## [11396] {hamburger_meat,
## root_vegetables,
## yogurt} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [11397] {hamburger_meat,
## root_vegetables,
## whole_milk} => {yogurt} 0.001220132 0.3076923 0.003965430 2.2056515 12
## [11398] {hamburger_meat,
## whole_milk,
## yogurt} => {root_vegetables} 0.001220132 0.3076923 0.003965430 2.8229047 12
## [11399] {hamburger_meat,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001423488 0.6363636 0.002236909 3.2888263 14
## [11400] {hamburger_meat,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001423488 0.3888889 0.003660397 2.1142743 14
## [11401] {hamburger_meat,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001423488 0.3043478 0.004677173 2.7922210 14
## [11402] {hamburger_meat,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [11403] {hamburger_meat,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001220132 0.3076923 0.003965430 1.6728324 12
## [11404] {hamburger_meat,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001220132 0.2790698 0.004372140 2.5603089 12
## [11405] {hamburger_meat,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.002033554 0.5555556 0.003660397 2.1742495 20
## [11406] {hamburger_meat,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.002033554 0.5128205 0.003965430 2.6503362 20
## [11407] {hamburger_meat,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.002033554 0.3225806 0.006304016 2.9594969 20
## [11408] {hamburger_meat,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001525165 0.6521739 0.002338587 3.3705362 15
## [11409] {hamburger_meat,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001525165 0.4411765 0.003457041 2.3985465 15
## [11410] {hamburger_meat,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001525165 0.3260870 0.004677173 2.3375111 15
## [11411] {hamburger_meat,
## rolls/buns,
## yogurt} => {whole_milk} 0.001220132 0.5217391 0.002338587 2.0419038 12
## [11412] {hamburger_meat,
## whole_milk,
## yogurt} => {rolls/buns} 0.001220132 0.3076923 0.003965430 1.6728324 12
## [11413] {hamburger_meat,
## rolls/buns,
## whole_milk} => {yogurt} 0.001220132 0.2790698 0.004372140 2.0004746 12
## [11414] {hamburger_meat,
## other_vegetables,
## yogurt} => {whole_milk} 0.001830198 0.5294118 0.003457041 2.0719318 18
## [11415] {hamburger_meat,
## whole_milk,
## yogurt} => {other_vegetables} 0.001830198 0.4615385 0.003965430 2.3853026 18
## [11416] {hamburger_meat,
## other_vegetables,
## whole_milk} => {yogurt} 0.001830198 0.2903226 0.006304016 2.0811389 18
## [11417] {hamburger_meat,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.002135231 0.4565217 0.004677173 1.7866659 21
## [11418] {hamburger_meat,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.002135231 0.4883721 0.004372140 2.5239829 21
## [11419] {hamburger_meat,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.002135231 0.3387097 0.006304016 1.8414647 21
## [11420] {beef,
## hygiene_articles,
## other_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [11421] {beef,
## hygiene_articles,
## whole_milk} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [11422] {curd,
## hygiene_articles,
## yogurt} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [11423] {curd,
## hygiene_articles,
## whole_milk} => {yogurt} 0.001220132 0.6315789 0.001931876 4.5273899 12
## [11424] {hygiene_articles,
## whole_milk,
## yogurt} => {curd} 0.001220132 0.3076923 0.003965430 5.7751028 12
## [11425] {curd,
## hygiene_articles,
## other_vegetables} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [11426] {curd,
## hygiene_articles,
## whole_milk} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [11427] {butter,
## hygiene_articles,
## napkins} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [11428] {hygiene_articles,
## napkins,
## whole_milk} => {butter} 0.001016777 0.3571429 0.002846975 6.4449541 10
## [11429] {butter,
## hygiene_articles,
## whole_milk} => {napkins} 0.001016777 0.3333333 0.003050330 6.3656958 10
## [11430] {butter,
## napkins,
## whole_milk} => {hygiene_articles} 0.001016777 0.3225806 0.003152008 9.7919156 10
## [11431] {bottled_water,
## hygiene_articles,
## napkins} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [11432] {hygiene_articles,
## napkins,
## whole_milk} => {bottled_water} 0.001118454 0.3928571 0.002846975 3.5545078 11
## [11433] {bottled_water,
## hygiene_articles,
## whole_milk} => {napkins} 0.001118454 0.3666667 0.003050330 7.0022654 11
## [11434] {bottled_water,
## napkins,
## whole_milk} => {hygiene_articles} 0.001118454 0.2820513 0.003965430 8.5616493 11
## [11435] {hygiene_articles,
## napkins,
## tropical_fruit} => {whole_milk} 0.001220132 0.8000000 0.001525165 3.1309192 12
## [11436] {hygiene_articles,
## napkins,
## whole_milk} => {tropical_fruit} 0.001220132 0.4285714 0.002846975 4.0843023 12
## [11437] {hygiene_articles,
## tropical_fruit,
## whole_milk} => {napkins} 0.001220132 0.3000000 0.004067107 5.7291262 12
## [11438] {napkins,
## tropical_fruit,
## whole_milk} => {hygiene_articles} 0.001220132 0.2448980 0.004982206 7.4338624 12
## [11439] {hygiene_articles,
## napkins,
## other_vegetables} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [11440] {hygiene_articles,
## napkins,
## whole_milk} => {other_vegetables} 0.001220132 0.4285714 0.002846975 2.2149238 12
## [11441] {hygiene_articles,
## other_vegetables,
## whole_milk} => {napkins} 0.001220132 0.2352941 0.005185562 4.4934323 12
## [11442] {hygiene_articles,
## margarine,
## tropical_fruit} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [11443] {hygiene_articles,
## margarine,
## whole_milk} => {tropical_fruit} 0.001016777 0.4545455 0.002236909 4.3318358 10
## [11444] {hygiene_articles,
## tropical_fruit,
## whole_milk} => {margarine} 0.001016777 0.2500000 0.004067107 4.2686632 10
## [11445] {margarine,
## tropical_fruit,
## whole_milk} => {hygiene_articles} 0.001016777 0.2272727 0.004473818 6.8988496 10
## [11446] {hygiene_articles,
## margarine,
## rolls/buns} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [11447] {hygiene_articles,
## margarine,
## whole_milk} => {rolls/buns} 0.001016777 0.4545455 0.002236909 2.4712297 10
## [11448] {hygiene_articles,
## rolls/buns,
## whole_milk} => {margarine} 0.001016777 0.3333333 0.003050330 5.6915509 10
## [11449] {hygiene_articles,
## margarine,
## other_vegetables} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [11450] {hygiene_articles,
## margarine,
## whole_milk} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [11451] {hygiene_articles,
## other_vegetables,
## whole_milk} => {margarine} 0.001220132 0.2352941 0.005185562 4.0175654 12
## [11452] {butter,
## hygiene_articles,
## pip_fruit} => {whole_milk} 0.001016777 1.0000000 0.001016777 3.9136490 10
## [11453] {butter,
## hygiene_articles,
## whole_milk} => {pip_fruit} 0.001016777 0.3333333 0.003050330 4.4063620 10
## [11454] {hygiene_articles,
## pip_fruit,
## whole_milk} => {butter} 0.001016777 0.3333333 0.003050330 6.0152905 10
## [11455] {butter,
## pip_fruit,
## whole_milk} => {hygiene_articles} 0.001016777 0.2272727 0.004473818 6.8988496 10
## [11456] {butter,
## citrus_fruit,
## hygiene_articles} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [11457] {butter,
## hygiene_articles,
## whole_milk} => {citrus_fruit} 0.001016777 0.3333333 0.003050330 4.0274365 10
## [11458] {citrus_fruit,
## hygiene_articles,
## whole_milk} => {butter} 0.001016777 0.4000000 0.002541942 7.2183486 10
## [11459] {butter,
## citrus_fruit,
## whole_milk} => {hygiene_articles} 0.001016777 0.2000000 0.005083884 6.0709877 10
## [11460] {bottled_water,
## butter,
## hygiene_articles} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [11461] {butter,
## hygiene_articles,
## whole_milk} => {bottled_water} 0.001220132 0.4000000 0.003050330 3.6191352 12
## [11462] {bottled_water,
## hygiene_articles,
## whole_milk} => {butter} 0.001220132 0.4000000 0.003050330 7.2183486 12
## [11463] {bottled_water,
## butter,
## whole_milk} => {hygiene_articles} 0.001220132 0.2264151 0.005388917 6.8728162 12
## [11464] {butter,
## hygiene_articles,
## tropical_fruit} => {whole_milk} 0.001220132 0.9230769 0.001321810 3.6125991 12
## [11465] {butter,
## hygiene_articles,
## whole_milk} => {tropical_fruit} 0.001220132 0.4000000 0.003050330 3.8120155 12
## [11466] {hygiene_articles,
## tropical_fruit,
## whole_milk} => {butter} 0.001220132 0.3000000 0.004067107 5.4137615 12
## [11467] {butter,
## hygiene_articles,
## root_vegetables} => {whole_milk} 0.001423488 0.8235294 0.001728521 3.2230051 14
## [11468] {butter,
## hygiene_articles,
## whole_milk} => {root_vegetables} 0.001423488 0.4666667 0.003050330 4.2814055 14
## [11469] {hygiene_articles,
## root_vegetables,
## whole_milk} => {butter} 0.001423488 0.4000000 0.003558719 7.2183486 14
## [11470] {butter,
## hygiene_articles,
## other_vegetables} => {whole_milk} 0.001830198 0.7826087 0.002338587 3.0628558 18
## [11471] {butter,
## hygiene_articles,
## whole_milk} => {other_vegetables} 0.001830198 0.6000000 0.003050330 3.1008933 18
## [11472] {hygiene_articles,
## other_vegetables,
## whole_milk} => {butter} 0.001830198 0.3529412 0.005185562 6.3691311 18
## [11473] {domestic_eggs,
## hygiene_articles,
## tropical_fruit} => {whole_milk} 0.001220132 0.9230769 0.001321810 3.6125991 12
## [11474] {domestic_eggs,
## hygiene_articles,
## whole_milk} => {tropical_fruit} 0.001220132 0.4444444 0.002745297 4.2355728 12
## [11475] {hygiene_articles,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.001220132 0.3000000 0.004067107 4.7283654 12
## [11476] {domestic_eggs,
## hygiene_articles,
## other_vegetables} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [11477] {domestic_eggs,
## hygiene_articles,
## whole_milk} => {other_vegetables} 0.001118454 0.4074074 0.002745297 2.1055449 11
## [11478] {hygiene_articles,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.001118454 0.2156863 0.005185562 3.3994784 11
## [11479] {hygiene_articles,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [11480] {hygiene_articles,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001016777 0.4166667 0.002440264 3.9708495 10
## [11481] {hygiene_articles,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2500000 0.004067107 3.4875887 10
## [11482] {hygiene_articles,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001016777 1.0000000 0.001016777 3.9136490 10
## [11483] {hygiene_articles,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001016777 0.4166667 0.002440264 3.8226835 10
## [11484] {hygiene_articles,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2857143 0.003558719 3.9858156 10
## [11485] {hygiene_articles,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [11486] {hygiene_articles,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001016777 0.4347826 0.002338587 3.1166815 10
## [11487] {hygiene_articles,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3571429 0.002846975 4.9822695 10
## [11488] {hygiene_articles,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [11489] {hygiene_articles,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001220132 0.5000000 0.002440264 3.5841837 12
## [11490] {hygiene_articles,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001220132 0.3076923 0.003965430 4.2924168 12
## [11491] {hygiene_articles,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.6521739 0.002338587 2.5523798 15
## [11492] {hygiene_articles,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001525165 0.6250000 0.002440264 3.2300972 15
## [11493] {hygiene_articles,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001525165 0.2941176 0.005185562 4.1030455 15
## [11494] {citrus_fruit,
## hygiene_articles,
## pip_fruit} => {tropical_fruit} 0.001016777 0.6666667 0.001525165 6.3533592 10
## [11495] {hygiene_articles,
## pip_fruit,
## tropical_fruit} => {citrus_fruit} 0.001016777 0.4545455 0.002236909 5.4919589 10
## [11496] {citrus_fruit,
## hygiene_articles,
## tropical_fruit} => {pip_fruit} 0.001016777 0.5882353 0.001728521 7.7759330 10
## [11497] {hygiene_articles,
## pip_fruit,
## sausage} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [11498] {hygiene_articles,
## pip_fruit,
## whole_milk} => {sausage} 0.001321810 0.4333333 0.003050330 4.6123737 13
## [11499] {hygiene_articles,
## sausage,
## whole_milk} => {pip_fruit} 0.001321810 0.5416667 0.002440264 7.1603383 13
## [11500] {pip_fruit,
## sausage,
## whole_milk} => {hygiene_articles} 0.001321810 0.2363636 0.005592272 7.1748036 13
## [11501] {hygiene_articles,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001016777 0.4545455 0.002236909 3.2583488 10
## [11502] {hygiene_articles,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001016777 0.5263158 0.001931876 5.0158099 10
## [11503] {hygiene_articles,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001016777 0.4000000 0.002541942 5.2876344 10
## [11504] {hygiene_articles,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001626843 0.7272727 0.002236909 2.8462902 16
## [11505] {hygiene_articles,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001626843 0.5333333 0.003050330 5.0826873 16
## [11506] {hygiene_articles,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001626843 0.4000000 0.004067107 5.2876344 16
## [11507] {hygiene_articles,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001016777 1.0000000 0.001016777 3.9136490 10
## [11508] {hygiene_articles,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001016777 0.3333333 0.003050330 3.0581468 10
## [11509] {hygiene_articles,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001016777 0.2857143 0.003558719 3.7768817 10
## [11510] {hygiene_articles,
## pip_fruit,
## yogurt} => {whole_milk} 0.001423488 0.7368421 0.001931876 2.8837414 14
## [11511] {hygiene_articles,
## pip_fruit,
## whole_milk} => {yogurt} 0.001423488 0.4666667 0.003050330 3.3452381 14
## [11512] {hygiene_articles,
## whole_milk,
## yogurt} => {pip_fruit} 0.001423488 0.3589744 0.003965430 4.7453129 14
## [11513] {hygiene_articles,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001423488 0.7368421 0.001931876 2.8837414 14
## [11514] {hygiene_articles,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001423488 0.4666667 0.003050330 2.4118059 14
## [11515] {hygiene_articles,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001423488 0.2745098 0.005185562 3.6287687 14
## [11516] {hygiene_articles,
## pastry,
## tropical_fruit} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [11517] {hygiene_articles,
## pastry,
## whole_milk} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [11518] {hygiene_articles,
## tropical_fruit,
## whole_milk} => {pastry} 0.001016777 0.2500000 0.004067107 2.8100000 10
## [11519] {citrus_fruit,
## hygiene_articles,
## tropical_fruit} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [11520] {citrus_fruit,
## hygiene_articles,
## other_vegetables} => {tropical_fruit} 0.001016777 0.4347826 0.002338587 4.1434951 10
## [11521] {hygiene_articles,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001016777 0.3846154 0.002643620 4.6470421 10
## [11522] {citrus_fruit,
## hygiene_articles,
## root_vegetables} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [11523] {citrus_fruit,
## hygiene_articles,
## whole_milk} => {root_vegetables} 0.001220132 0.4800000 0.002541942 4.4037313 12
## [11524] {hygiene_articles,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001220132 0.3428571 0.003558719 4.1425061 12
## [11525] {citrus_fruit,
## hygiene_articles,
## yogurt} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [11526] {citrus_fruit,
## hygiene_articles,
## whole_milk} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [11527] {hygiene_articles,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001016777 0.2564103 0.003965430 3.0980281 10
## [11528] {citrus_fruit,
## hygiene_articles,
## other_vegetables} => {whole_milk} 0.001220132 0.5217391 0.002338587 2.0419038 12
## [11529] {citrus_fruit,
## hygiene_articles,
## whole_milk} => {other_vegetables} 0.001220132 0.4800000 0.002541942 2.4807147 12
## [11530] {hygiene_articles,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001220132 0.2352941 0.005185562 2.8428964 12
## [11531] {hygiene_articles,
## sausage,
## tropical_fruit} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [11532] {hygiene_articles,
## sausage,
## whole_milk} => {tropical_fruit} 0.001016777 0.4166667 0.002440264 3.9708495 10
## [11533] {hygiene_articles,
## tropical_fruit,
## whole_milk} => {sausage} 0.001016777 0.2500000 0.004067107 2.6609848 10
## [11534] {hygiene_articles,
## sausage,
## yogurt} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [11535] {hygiene_articles,
## sausage,
## whole_milk} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [11536] {hygiene_articles,
## whole_milk,
## yogurt} => {sausage} 0.001016777 0.2564103 0.003965430 2.7292152 10
## [11537] {bottled_water,
## hygiene_articles,
## tropical_fruit} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [11538] {bottled_water,
## hygiene_articles,
## whole_milk} => {tropical_fruit} 0.001525165 0.5000000 0.003050330 4.7650194 15
## [11539] {hygiene_articles,
## tropical_fruit,
## whole_milk} => {bottled_water} 0.001525165 0.3750000 0.004067107 3.3929393 15
## [11540] {bottled_water,
## hygiene_articles,
## root_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [11541] {bottled_water,
## hygiene_articles,
## whole_milk} => {root_vegetables} 0.001016777 0.3333333 0.003050330 3.0581468 10
## [11542] {hygiene_articles,
## root_vegetables,
## whole_milk} => {bottled_water} 0.001016777 0.2857143 0.003558719 2.5850966 10
## [11543] {bottled_water,
## hygiene_articles,
## yogurt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [11544] {bottled_water,
## hygiene_articles,
## whole_milk} => {yogurt} 0.001118454 0.3666667 0.003050330 2.6284014 11
## [11545] {hygiene_articles,
## whole_milk,
## yogurt} => {bottled_water} 0.001118454 0.2820513 0.003965430 2.5519543 11
## [11546] {bottled_water,
## hygiene_articles,
## other_vegetables} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [11547] {bottled_water,
## hygiene_articles,
## whole_milk} => {other_vegetables} 0.001321810 0.4333333 0.003050330 2.2395341 13
## [11548] {hygiene_articles,
## other_vegetables,
## whole_milk} => {bottled_water} 0.001321810 0.2549020 0.005185562 2.3063117 13
## [11549] {hygiene_articles,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [11550] {hygiene_articles,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001016777 0.3846154 0.002643620 3.5286309 10
## [11551] {hygiene_articles,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [11552] {hygiene_articles,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [11553] {hygiene_articles,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001220132 0.3000000 0.004067107 2.7523321 12
## [11554] {hygiene_articles,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001220132 0.3428571 0.003558719 3.2674419 12
## [11555] {hygiene_articles,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001016777 0.4000000 0.002541942 2.0672622 10
## [11556] {hygiene_articles,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001016777 0.3846154 0.002643620 2.7570644 10
## [11557] {hygiene_articles,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001016777 0.3571429 0.002846975 3.4035853 10
## [11558] {hygiene_articles,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001830198 0.7200000 0.002541942 2.8178273 18
## [11559] {hygiene_articles,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001830198 0.4500000 0.004067107 3.2257653 18
## [11560] {hygiene_articles,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001830198 0.4615385 0.003965430 4.3984794 18
## [11561] {hygiene_articles,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [11562] {hygiene_articles,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001220132 0.3000000 0.004067107 1.6310116 12
## [11563] {hygiene_articles,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001220132 0.4000000 0.003050330 3.8120155 12
## [11564] {hygiene_articles,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001626843 0.6153846 0.002643620 2.4083994 16
## [11565] {hygiene_articles,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001626843 0.4000000 0.004067107 2.0672622 16
## [11566] {hygiene_articles,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001626843 0.3137255 0.005185562 2.9898161 16
## [11567] {hygiene_articles,
## root_vegetables,
## yogurt} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [11568] {hygiene_articles,
## root_vegetables,
## whole_milk} => {yogurt} 0.001220132 0.3428571 0.003558719 2.4577259 12
## [11569] {hygiene_articles,
## whole_milk,
## yogurt} => {root_vegetables} 0.001220132 0.3076923 0.003965430 2.8229047 12
## [11570] {hygiene_articles,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001728521 0.6800000 0.002541942 2.6612813 17
## [11571] {hygiene_articles,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001728521 0.4857143 0.003558719 2.5102470 17
## [11572] {hygiene_articles,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001728521 0.3333333 0.005185562 3.0581468 17
## [11573] {hygiene_articles,
## rolls/buns,
## yogurt} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [11574] {hygiene_articles,
## whole_milk,
## yogurt} => {rolls/buns} 0.001220132 0.3076923 0.003965430 1.6728324 12
## [11575] {hygiene_articles,
## rolls/buns,
## whole_milk} => {yogurt} 0.001220132 0.4000000 0.003050330 2.8673469 12
## [11576] {hygiene_articles,
## other_vegetables,
## yogurt} => {whole_milk} 0.002135231 0.7500000 0.002846975 2.9352368 21
## [11577] {hygiene_articles,
## whole_milk,
## yogurt} => {other_vegetables} 0.002135231 0.5384615 0.003965430 2.7828530 21
## [11578] {hygiene_articles,
## other_vegetables,
## whole_milk} => {yogurt} 0.002135231 0.4117647 0.005185562 2.9516807 21
## [11579] {hygiene_articles,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [11580] {hygiene_articles,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.001016777 0.3333333 0.003050330 1.7227185 10
## [11581] {long_life_bakery_product,
## other_vegetables,
## salty_snack} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [11582] {long_life_bakery_product,
## salty_snack,
## whole_milk} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [11583] {other_vegetables,
## salty_snack,
## whole_milk} => {long_life_bakery_product} 0.001016777 0.2083333 0.004880529 5.5678216 10
## [11584] {frozen_vegetables,
## other_vegetables,
## salty_snack} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [11585] {frozen_vegetables,
## salty_snack,
## whole_milk} => {other_vegetables} 0.001118454 0.7857143 0.001423488 4.0606936 11
## [11586] {other_vegetables,
## salty_snack,
## whole_milk} => {frozen_vegetables} 0.001118454 0.2291667 0.004880529 4.7650194 11
## [11587] {curd,
## other_vegetables,
## salty_snack} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [11588] {curd,
## salty_snack,
## whole_milk} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [11589] {other_vegetables,
## salty_snack,
## whole_milk} => {curd} 0.001118454 0.2291667 0.004880529 4.3012484 11
## [11590] {fruit/vegetable_juice,
## salty_snack,
## yogurt} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [11591] {fruit/vegetable_juice,
## other_vegetables,
## salty_snack} => {yogurt} 0.001321810 0.5909091 0.002236909 4.2358534 13
## [11592] {other_vegetables,
## salty_snack,
## yogurt} => {fruit/vegetable_juice} 0.001321810 0.4814815 0.002745297 6.6601552 13
## [11593] {fruit/vegetable_juice,
## salty_snack,
## yogurt} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [11594] {fruit/vegetable_juice,
## salty_snack,
## whole_milk} => {yogurt} 0.001118454 0.4583333 0.002440264 3.2855017 11
## [11595] {salty_snack,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.4400000 0.002541942 6.0863572 11
## [11596] {fruit/vegetable_juice,
## other_vegetables,
## salty_snack} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [11597] {fruit/vegetable_juice,
## salty_snack,
## whole_milk} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [11598] {other_vegetables,
## salty_snack,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.2291667 0.004880529 3.1699777 11
## [11599] {salty_snack,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.8000000 0.001525165 4.1345244 12
## [11600] {other_vegetables,
## salty_snack,
## whipped/sour_cream} => {tropical_fruit} 0.001220132 0.4444444 0.002745297 4.2355728 12
## [11601] {other_vegetables,
## salty_snack,
## tropical_fruit} => {whipped/sour_cream} 0.001220132 0.4285714 0.002846975 5.9787234 12
## [11602] {other_vegetables,
## salty_snack,
## whipped/sour_cream} => {whole_milk} 0.001830198 0.6666667 0.002745297 2.6090994 18
## [11603] {salty_snack,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001830198 0.6666667 0.002745297 3.4454370 18
## [11604] {other_vegetables,
## salty_snack,
## whole_milk} => {whipped/sour_cream} 0.001830198 0.3750000 0.004880529 5.2313830 18
## [11605] {pip_fruit,
## salty_snack,
## yogurt} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [11606] {pip_fruit,
## salty_snack,
## whole_milk} => {yogurt} 0.001118454 0.5238095 0.002135231 3.7548591 11
## [11607] {salty_snack,
## whole_milk,
## yogurt} => {pip_fruit} 0.001118454 0.4400000 0.002541942 5.8163978 11
## [11608] {other_vegetables,
## pip_fruit,
## salty_snack} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [11609] {pip_fruit,
## salty_snack,
## whole_milk} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [11610] {other_vegetables,
## salty_snack,
## whole_milk} => {pip_fruit} 0.001220132 0.2500000 0.004880529 3.3047715 12
## [11611] {other_vegetables,
## salty_snack,
## shopping_bags} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [11612] {salty_snack,
## shopping_bags,
## whole_milk} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [11613] {other_vegetables,
## salty_snack,
## whole_milk} => {shopping_bags} 0.001118454 0.2291667 0.004880529 2.3259589 11
## [11614] {other_vegetables,
## salty_snack,
## sausage} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [11615] {salty_snack,
## sausage,
## whole_milk} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [11616] {other_vegetables,
## salty_snack,
## whole_milk} => {sausage} 0.001016777 0.2083333 0.004880529 2.2174874 10
## [11617] {root_vegetables,
## salty_snack,
## tropical_fruit} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [11618] {other_vegetables,
## salty_snack,
## tropical_fruit} => {root_vegetables} 0.001118454 0.3928571 0.002846975 3.6042444 11
## [11619] {other_vegetables,
## root_vegetables,
## salty_snack} => {tropical_fruit} 0.001118454 0.3928571 0.002846975 3.7439438 11
## [11620] {salty_snack,
## soda,
## tropical_fruit} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [11621] {other_vegetables,
## salty_snack,
## tropical_fruit} => {soda} 0.001016777 0.3571429 0.002846975 2.0481050 10
## [11622] {other_vegetables,
## salty_snack,
## soda} => {tropical_fruit} 0.001016777 0.3846154 0.002643620 3.6653995 10
## [11623] {salty_snack,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001321810 0.8125000 0.001626843 4.1991264 13
## [11624] {other_vegetables,
## salty_snack,
## tropical_fruit} => {yogurt} 0.001321810 0.4642857 0.002846975 3.3281706 13
## [11625] {other_vegetables,
## salty_snack,
## yogurt} => {tropical_fruit} 0.001321810 0.4814815 0.002745297 4.5885372 13
## [11626] {other_vegetables,
## salty_snack,
## tropical_fruit} => {whole_milk} 0.001423488 0.5000000 0.002846975 1.9568245 14
## [11627] {salty_snack,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001423488 0.5600000 0.002541942 2.8941671 14
## [11628] {other_vegetables,
## salty_snack,
## whole_milk} => {tropical_fruit} 0.001423488 0.2916667 0.004880529 2.7795946 14
## [11629] {root_vegetables,
## salty_snack,
## soda} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [11630] {other_vegetables,
## root_vegetables,
## salty_snack} => {soda} 0.001016777 0.3571429 0.002846975 2.0481050 10
## [11631] {other_vegetables,
## salty_snack,
## soda} => {root_vegetables} 0.001016777 0.3846154 0.002643620 3.5286309 10
## [11632] {root_vegetables,
## salty_snack,
## yogurt} => {other_vegetables} 0.001220132 0.8571429 0.001423488 4.4298476 12
## [11633] {other_vegetables,
## root_vegetables,
## salty_snack} => {yogurt} 0.001220132 0.4285714 0.002846975 3.0721574 12
## [11634] {other_vegetables,
## salty_snack,
## yogurt} => {root_vegetables} 0.001220132 0.4444444 0.002745297 4.0775290 12
## [11635] {other_vegetables,
## root_vegetables,
## salty_snack} => {whole_milk} 0.001220132 0.4285714 0.002846975 1.6772782 12
## [11636] {root_vegetables,
## salty_snack,
## whole_milk} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [11637] {other_vegetables,
## salty_snack,
## whole_milk} => {root_vegetables} 0.001220132 0.2500000 0.004880529 2.2936101 12
## [11638] {other_vegetables,
## salty_snack,
## soda} => {whole_milk} 0.001423488 0.5384615 0.002643620 2.1073495 14
## [11639] {salty_snack,
## soda,
## whole_milk} => {other_vegetables} 0.001423488 0.5185185 0.002745297 2.6797844 14
## [11640] {other_vegetables,
## salty_snack,
## whole_milk} => {soda} 0.001423488 0.2916667 0.004880529 1.6726190 14
## [11641] {other_vegetables,
## salty_snack,
## yogurt} => {whole_milk} 0.001321810 0.4814815 0.002745297 1.8843495 13
## [11642] {salty_snack,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.5200000 0.002541942 2.6874409 13
## [11643] {other_vegetables,
## salty_snack,
## whole_milk} => {yogurt} 0.001321810 0.2708333 0.004880529 1.9414328 13
## [11644] {cream_cheese_,
## domestic_eggs,
## sugar} => {whole_milk} 0.001118454 1.0000000 0.001118454 3.9136490 11
## [11645] {cream_cheese_,
## sugar,
## whole_milk} => {domestic_eggs} 0.001118454 0.5500000 0.002033554 8.6686699 11
## [11646] {domestic_eggs,
## sugar,
## whole_milk} => {cream_cheese_} 0.001118454 0.3142857 0.003558719 7.9256410 11
## [11647] {cream_cheese_,
## domestic_eggs,
## whole_milk} => {sugar} 0.001118454 0.3235294 0.003457041 9.5552906 11
## [11648] {cream_cheese_,
## other_vegetables,
## sugar} => {whole_milk} 0.001525165 0.9375000 0.001626843 3.6690460 15
## [11649] {cream_cheese_,
## sugar,
## whole_milk} => {other_vegetables} 0.001525165 0.7500000 0.002033554 3.8761167 15
## [11650] {other_vegetables,
## sugar,
## whole_milk} => {cream_cheese_} 0.001525165 0.2419355 0.006304016 6.1011166 15
## [11651] {cream_cheese_,
## other_vegetables,
## whole_milk} => {sugar} 0.001525165 0.2272727 0.006710727 6.7123942 15
## [11652] {coffee,
## other_vegetables,
## sugar} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [11653] {coffee,
## sugar,
## whole_milk} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [11654] {frozen_vegetables,
## other_vegetables,
## sugar} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [11655] {frozen_vegetables,
## sugar,
## whole_milk} => {other_vegetables} 0.001321810 0.7222222 0.001830198 3.7325568 13
## [11656] {other_vegetables,
## sugar,
## whole_milk} => {frozen_vegetables} 0.001321810 0.2096774 0.006304016 4.3597831 13
## [11657] {beef,
## root_vegetables,
## sugar} => {other_vegetables} 0.001118454 0.8461538 0.001321810 4.3730547 11
## [11658] {beef,
## other_vegetables,
## sugar} => {root_vegetables} 0.001118454 0.6470588 0.001728521 5.9364025 11
## [11659] {other_vegetables,
## root_vegetables,
## sugar} => {beef} 0.001118454 0.3235294 0.003457041 6.1664957 11
## [11660] {curd,
## domestic_eggs,
## sugar} => {whole_milk} 0.001016777 1.0000000 0.001016777 3.9136490 10
## [11661] {curd,
## sugar,
## whole_milk} => {domestic_eggs} 0.001016777 0.4347826 0.002338587 6.8527035 10
## [11662] {domestic_eggs,
## sugar,
## whole_milk} => {curd} 0.001016777 0.2857143 0.003558719 5.3625954 10
## [11663] {curd,
## domestic_eggs,
## whole_milk} => {sugar} 0.001016777 0.2127660 0.004778851 6.2839435 10
## [11664] {curd,
## sugar,
## whipped/sour_cream} => {yogurt} 0.001016777 0.7142857 0.001423488 5.1202624 10
## [11665] {curd,
## sugar,
## yogurt} => {whipped/sour_cream} 0.001016777 0.6250000 0.001626843 8.7189716 10
## [11666] {sugar,
## whipped/sour_cream,
## yogurt} => {curd} 0.001016777 0.4761905 0.002135231 8.9376590 10
## [11667] {curd,
## whipped/sour_cream,
## yogurt} => {sugar} 0.001016777 0.2222222 0.004575496 6.5632299 10
## [11668] {curd,
## sugar,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [11669] {curd,
## sugar,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.4782609 0.002338587 6.6719087 11
## [11670] {sugar,
## whipped/sour_cream,
## whole_milk} => {curd} 0.001118454 0.3548387 0.003152008 6.6599975 11
## [11671] {curd,
## sugar,
## yogurt} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [11672] {curd,
## sugar,
## whole_milk} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [11673] {sugar,
## whole_milk,
## yogurt} => {curd} 0.001118454 0.3055556 0.003660397 5.7349979 11
## [11674] {curd,
## other_vegetables,
## sugar} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [11675] {curd,
## sugar,
## whole_milk} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [11676] {napkins,
## other_vegetables,
## sugar} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [11677] {napkins,
## sugar,
## whole_milk} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [11678] {pork,
## sugar,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [11679] {pork,
## sugar,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.4230769 0.002643620 5.9020731 11
## [11680] {sugar,
## whipped/sour_cream,
## whole_milk} => {pork} 0.001118454 0.3548387 0.003152008 6.1549184 11
## [11681] {pork,
## whipped/sour_cream,
## whole_milk} => {sugar} 0.001118454 0.2444444 0.004575496 7.2195529 11
## [11682] {other_vegetables,
## pork,
## sugar} => {whole_milk} 0.001626843 0.7272727 0.002236909 2.8462902 16
## [11683] {pork,
## sugar,
## whole_milk} => {other_vegetables} 0.001626843 0.6153846 0.002643620 3.1804034 16
## [11684] {other_vegetables,
## sugar,
## whole_milk} => {pork} 0.001626843 0.2580645 0.006304016 4.4763043 16
## [11685] {frankfurter,
## other_vegetables,
## sugar} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [11686] {frankfurter,
## sugar,
## whole_milk} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [11687] {bottled_beer,
## other_vegetables,
## sugar} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [11688] {bottled_beer,
## sugar,
## whole_milk} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [11689] {margarine,
## root_vegetables,
## sugar} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [11690] {margarine,
## other_vegetables,
## sugar} => {root_vegetables} 0.001016777 0.4761905 0.002135231 4.3687811 10
## [11691] {other_vegetables,
## root_vegetables,
## sugar} => {margarine} 0.001016777 0.2941176 0.003457041 5.0219567 10
## [11692] {margarine,
## other_vegetables,
## sugar} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [11693] {margarine,
## sugar,
## whole_milk} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [11694] {butter,
## sugar,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [11695] {butter,
## other_vegetables,
## sugar} => {whipped/sour_cream} 0.001016777 0.7142857 0.001423488 9.9645390 10
## [11696] {other_vegetables,
## sugar,
## whipped/sour_cream} => {butter} 0.001016777 0.3846154 0.002643620 6.9407198 10
## [11697] {butter,
## sugar,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [11698] {butter,
## sugar,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.4761905 0.002135231 6.6430260 10
## [11699] {sugar,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001016777 0.3225806 0.003152008 5.8212489 10
## [11700] {butter,
## other_vegetables,
## sugar} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [11701] {butter,
## sugar,
## whole_milk} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [11702] {domestic_eggs,
## sugar,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [11703] {domestic_eggs,
## sugar,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2857143 0.003558719 3.9858156 10
## [11704] {sugar,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001016777 0.3225806 0.003152008 5.0842639 10
## [11705] {citrus_fruit,
## domestic_eggs,
## sugar} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [11706] {domestic_eggs,
## other_vegetables,
## sugar} => {citrus_fruit} 0.001016777 0.4347826 0.002338587 5.2531781 10
## [11707] {citrus_fruit,
## other_vegetables,
## sugar} => {domestic_eggs} 0.001016777 0.4166667 0.002440264 6.5671741 10
## [11708] {citrus_fruit,
## domestic_eggs,
## other_vegetables} => {sugar} 0.001016777 0.2272727 0.004473818 6.7123942 10
## [11709] {citrus_fruit,
## domestic_eggs,
## sugar} => {whole_milk} 0.001423488 0.9333333 0.001525165 3.6527391 14
## [11710] {domestic_eggs,
## sugar,
## whole_milk} => {citrus_fruit} 0.001423488 0.4000000 0.003558719 4.8329238 14
## [11711] {citrus_fruit,
## sugar,
## whole_milk} => {domestic_eggs} 0.001423488 0.5185185 0.002745297 8.1724834 14
## [11712] {citrus_fruit,
## domestic_eggs,
## whole_milk} => {sugar} 0.001423488 0.2500000 0.005693950 7.3836336 14
## [11713] {domestic_eggs,
## sugar,
## tropical_fruit} => {whole_milk} 0.001118454 0.9166667 0.001220132 3.5875116 11
## [11714] {domestic_eggs,
## sugar,
## whole_milk} => {tropical_fruit} 0.001118454 0.3142857 0.003558719 2.9951550 11
## [11715] {sugar,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.001118454 0.3928571 0.002846975 6.1919071 11
## [11716] {domestic_eggs,
## sugar,
## yogurt} => {whole_milk} 0.001423488 0.9333333 0.001525165 3.6527391 14
## [11717] {domestic_eggs,
## sugar,
## whole_milk} => {yogurt} 0.001423488 0.4000000 0.003558719 2.8673469 14
## [11718] {sugar,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001423488 0.3888889 0.003660397 6.1293625 14
## [11719] {domestic_eggs,
## other_vegetables,
## sugar} => {whole_milk} 0.001830198 0.7826087 0.002338587 3.0628558 18
## [11720] {domestic_eggs,
## sugar,
## whole_milk} => {other_vegetables} 0.001830198 0.5142857 0.003558719 2.6579086 18
## [11721] {other_vegetables,
## sugar,
## whole_milk} => {domestic_eggs} 0.001830198 0.2903226 0.006304016 4.5758375 18
## [11722] {fruit/vegetable_juice,
## root_vegetables,
## sugar} => {other_vegetables} 0.001118454 0.7857143 0.001423488 4.0606936 11
## [11723] {fruit/vegetable_juice,
## other_vegetables,
## sugar} => {root_vegetables} 0.001118454 0.5500000 0.002033554 5.0459422 11
## [11724] {other_vegetables,
## root_vegetables,
## sugar} => {fruit/vegetable_juice} 0.001118454 0.3235294 0.003457041 4.4752627 11
## [11725] {fruit/vegetable_juice,
## root_vegetables,
## sugar} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [11726] {fruit/vegetable_juice,
## sugar,
## whole_milk} => {root_vegetables} 0.001016777 0.4545455 0.002236909 4.1702001 10
## [11727] {root_vegetables,
## sugar,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.2941176 0.003457041 4.0684206 10
## [11728] {fruit/vegetable_juice,
## sugar,
## yogurt} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [11729] {fruit/vegetable_juice,
## other_vegetables,
## sugar} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [11730] {other_vegetables,
## sugar,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.3571429 0.002846975 4.9402250 10
## [11731] {fruit/vegetable_juice,
## sugar,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [11732] {fruit/vegetable_juice,
## sugar,
## whole_milk} => {yogurt} 0.001016777 0.4545455 0.002236909 3.2583488 10
## [11733] {sugar,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.2777778 0.003660397 3.8423972 10
## [11734] {fruit/vegetable_juice,
## other_vegetables,
## sugar} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [11735] {fruit/vegetable_juice,
## sugar,
## whole_milk} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [11736] {other_vegetables,
## sugar,
## whole_milk} => {fruit/vegetable_juice} 0.001321810 0.2096774 0.006304016 2.9003902 13
## [11737] {citrus_fruit,
## sugar,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [11738] {sugar,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.001118454 0.3548387 0.003152008 4.2872711 11
## [11739] {citrus_fruit,
## sugar,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.4074074 0.002745297 5.6834778 11
## [11740] {root_vegetables,
## sugar,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.9230769 0.001321810 3.6125991 12
## [11741] {sugar,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001220132 0.3870968 0.003152008 3.5513962 12
## [11742] {root_vegetables,
## sugar,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.3529412 0.003457041 4.9236546 12
## [11743] {sugar,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [11744] {other_vegetables,
## sugar,
## whipped/sour_cream} => {yogurt} 0.001220132 0.4615385 0.002643620 3.3084772 12
## [11745] {other_vegetables,
## sugar,
## yogurt} => {whipped/sour_cream} 0.001220132 0.4285714 0.002846975 5.9787234 12
## [11746] {sugar,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [11747] {sugar,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001525165 0.4838710 0.003152008 3.4685648 15
## [11748] {sugar,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001525165 0.4166667 0.003660397 5.8126478 15
## [11749] {rolls/buns,
## sugar,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [11750] {sugar,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001016777 0.3225806 0.003152008 1.7537759 10
## [11751] {rolls/buns,
## sugar,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.3030303 0.003355363 4.2273802 10
## [11752] {other_vegetables,
## sugar,
## whipped/sour_cream} => {whole_milk} 0.001728521 0.6538462 0.002643620 2.5589244 17
## [11753] {sugar,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001728521 0.5483871 0.003152008 2.8341498 17
## [11754] {other_vegetables,
## sugar,
## whole_milk} => {whipped/sour_cream} 0.001728521 0.2741935 0.006304016 3.8250972 17
## [11755] {pip_fruit,
## sugar,
## yogurt} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [11756] {other_vegetables,
## pip_fruit,
## sugar} => {yogurt} 0.001118454 0.4583333 0.002440264 3.2855017 11
## [11757] {other_vegetables,
## sugar,
## yogurt} => {pip_fruit} 0.001118454 0.3928571 0.002846975 5.1932124 11
## [11758] {pip_fruit,
## sugar,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [11759] {pip_fruit,
## sugar,
## whole_milk} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [11760] {sugar,
## whole_milk,
## yogurt} => {pip_fruit} 0.001016777 0.2777778 0.003660397 3.6719683 10
## [11761] {other_vegetables,
## pip_fruit,
## sugar} => {whole_milk} 0.001626843 0.6666667 0.002440264 2.6090994 16
## [11762] {pip_fruit,
## sugar,
## whole_milk} => {other_vegetables} 0.001626843 0.6400000 0.002541942 3.3076195 16
## [11763] {other_vegetables,
## sugar,
## whole_milk} => {pip_fruit} 0.001626843 0.2580645 0.006304016 3.4113770 16
## [11764] {pastry,
## soda,
## sugar} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [11765] {pastry,
## sugar,
## whole_milk} => {soda} 0.001118454 0.4230769 0.002643620 2.4262166 11
## [11766] {soda,
## sugar,
## whole_milk} => {pastry} 0.001118454 0.2972973 0.003762074 3.3416216 11
## [11767] {citrus_fruit,
## other_vegetables,
## sugar} => {whole_milk} 0.001626843 0.6666667 0.002440264 2.6090994 16
## [11768] {citrus_fruit,
## sugar,
## whole_milk} => {other_vegetables} 0.001626843 0.5925926 0.002745297 3.0626107 16
## [11769] {other_vegetables,
## sugar,
## whole_milk} => {citrus_fruit} 0.001626843 0.2580645 0.006304016 3.1180154 16
## [11770] {bottled_water,
## other_vegetables,
## sugar} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [11771] {bottled_water,
## sugar,
## whole_milk} => {other_vegetables} 0.001321810 0.5000000 0.002643620 2.5840778 13
## [11772] {other_vegetables,
## sugar,
## whole_milk} => {bottled_water} 0.001321810 0.2096774 0.006304016 1.8971273 13
## [11773] {sugar,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [11774] {sugar,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [11775] {sugar,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.2777778 0.003660397 2.6472330 10
## [11776] {other_vegetables,
## sugar,
## tropical_fruit} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [11777] {sugar,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001321810 0.4642857 0.002846975 2.3995008 13
## [11778] {other_vegetables,
## sugar,
## whole_milk} => {tropical_fruit} 0.001321810 0.2096774 0.006304016 1.9982339 13
## [11779] {root_vegetables,
## soda,
## sugar} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [11780] {other_vegetables,
## root_vegetables,
## sugar} => {soda} 0.001220132 0.3529412 0.003457041 2.0240096 12
## [11781] {other_vegetables,
## soda,
## sugar} => {root_vegetables} 0.001220132 0.4285714 0.002846975 3.9319030 12
## [11782] {root_vegetables,
## soda,
## sugar} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [11783] {root_vegetables,
## sugar,
## whole_milk} => {soda} 0.001118454 0.3235294 0.003457041 1.8553421 11
## [11784] {soda,
## sugar,
## whole_milk} => {root_vegetables} 0.001118454 0.2972973 0.003762074 2.7275363 11
## [11785] {root_vegetables,
## sugar,
## yogurt} => {other_vegetables} 0.001423488 0.6666667 0.002135231 3.4454370 14
## [11786] {other_vegetables,
## root_vegetables,
## sugar} => {yogurt} 0.001423488 0.4117647 0.003457041 2.9516807 14
## [11787] {other_vegetables,
## sugar,
## yogurt} => {root_vegetables} 0.001423488 0.5000000 0.002846975 4.5872201 14
## [11788] {root_vegetables,
## sugar,
## yogurt} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [11789] {root_vegetables,
## sugar,
## whole_milk} => {yogurt} 0.001423488 0.4117647 0.003457041 2.9516807 14
## [11790] {sugar,
## whole_milk,
## yogurt} => {root_vegetables} 0.001423488 0.3888889 0.003660397 3.5678379 14
## [11791] {rolls/buns,
## root_vegetables,
## sugar} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [11792] {other_vegetables,
## root_vegetables,
## sugar} => {rolls/buns} 0.001016777 0.2941176 0.003457041 1.5990310 10
## [11793] {other_vegetables,
## rolls/buns,
## sugar} => {root_vegetables} 0.001016777 0.3571429 0.002846975 3.2765858 10
## [11794] {other_vegetables,
## root_vegetables,
## sugar} => {whole_milk} 0.002033554 0.5882353 0.003457041 2.3021465 20
## [11795] {root_vegetables,
## sugar,
## whole_milk} => {other_vegetables} 0.002033554 0.5882353 0.003457041 3.0400915 20
## [11796] {other_vegetables,
## sugar,
## whole_milk} => {root_vegetables} 0.002033554 0.3225806 0.006304016 2.9594969 20
## [11797] {soda,
## sugar,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [11798] {soda,
## sugar,
## whole_milk} => {yogurt} 0.001016777 0.2702703 0.003762074 1.9373966 10
## [11799] {sugar,
## whole_milk,
## yogurt} => {soda} 0.001016777 0.2777778 0.003660397 1.5929705 10
## [11800] {rolls/buns,
## soda,
## sugar} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [11801] {soda,
## sugar,
## whole_milk} => {rolls/buns} 0.001016777 0.2702703 0.003762074 1.4693798 10
## [11802] {rolls/buns,
## sugar,
## whole_milk} => {soda} 0.001016777 0.3030303 0.003355363 1.7377860 10
## [11803] {other_vegetables,
## soda,
## sugar} => {whole_milk} 0.001830198 0.6428571 0.002846975 2.5159172 18
## [11804] {soda,
## sugar,
## whole_milk} => {other_vegetables} 0.001830198 0.4864865 0.003762074 2.5142378 18
## [11805] {other_vegetables,
## sugar,
## whole_milk} => {soda} 0.001830198 0.2903226 0.006304016 1.6649111 18
## [11806] {other_vegetables,
## sugar,
## yogurt} => {whole_milk} 0.001728521 0.6071429 0.002846975 2.3761441 17
## [11807] {sugar,
## whole_milk,
## yogurt} => {other_vegetables} 0.001728521 0.4722222 0.003660397 2.4405179 17
## [11808] {other_vegetables,
## sugar,
## whole_milk} => {yogurt} 0.001728521 0.2741935 0.006304016 1.9655201 17
## [11809] {other_vegetables,
## rolls/buns,
## sugar} => {whole_milk} 0.001728521 0.6071429 0.002846975 2.3761441 17
## [11810] {rolls/buns,
## sugar,
## whole_milk} => {other_vegetables} 0.001728521 0.5151515 0.003355363 2.6623832 17
## [11811] {other_vegetables,
## sugar,
## whole_milk} => {rolls/buns} 0.001728521 0.2741935 0.006304016 1.4907095 17
## [11812] {beef,
## root_vegetables,
## waffles} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [11813] {beef,
## waffles,
## whole_milk} => {root_vegetables} 0.001016777 0.5263158 0.001931876 4.8286528 10
## [11814] {root_vegetables,
## waffles,
## whole_milk} => {beef} 0.001016777 0.2631579 0.003863752 5.0158099 10
## [11815] {pork,
## rolls/buns,
## waffles} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [11816] {pork,
## waffles,
## whole_milk} => {rolls/buns} 0.001016777 0.5882353 0.001728521 3.1980620 10
## [11817] {rolls/buns,
## waffles,
## whole_milk} => {pork} 0.001016777 0.2173913 0.004677173 3.7707998 10
## [11818] {other_vegetables,
## pork,
## waffles} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [11819] {pork,
## waffles,
## whole_milk} => {other_vegetables} 0.001321810 0.7647059 0.001728521 3.9521189 13
## [11820] {other_vegetables,
## waffles,
## whole_milk} => {pork} 0.001321810 0.2826087 0.004677173 4.9020397 13
## [11821] {margarine,
## other_vegetables,
## waffles} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [11822] {margarine,
## waffles,
## whole_milk} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [11823] {other_vegetables,
## waffles,
## whole_milk} => {margarine} 0.001118454 0.2391304 0.004677173 4.0830691 11
## [11824] {butter,
## other_vegetables,
## waffles} => {whole_milk} 0.001423488 0.7000000 0.002033554 2.7395543 14
## [11825] {butter,
## waffles,
## whole_milk} => {other_vegetables} 0.001423488 0.7777778 0.001830198 4.0196765 14
## [11826] {other_vegetables,
## waffles,
## whole_milk} => {butter} 0.001423488 0.3043478 0.004677173 5.4922218 14
## [11827] {newspapers,
## rolls/buns,
## waffles} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [11828] {newspapers,
## waffles,
## whole_milk} => {rolls/buns} 0.001118454 0.5789474 0.001931876 3.1475663 11
## [11829] {rolls/buns,
## waffles,
## whole_milk} => {newspapers} 0.001118454 0.2391304 0.004677173 2.9959845 11
## [11830] {root_vegetables,
## waffles,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [11831] {waffles,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001016777 0.3225806 0.003152008 2.9594969 10
## [11832] {root_vegetables,
## waffles,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2631579 0.003863752 3.6711459 10
## [11833] {waffles,
## whipped/sour_cream,
## yogurt} => {rolls/buns} 0.001016777 0.5000000 0.002033554 2.7183527 10
## [11834] {rolls/buns,
## waffles,
## whipped/sour_cream} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [11835] {rolls/buns,
## waffles,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3703704 0.002745297 5.1667980 10
## [11836] {rolls/buns,
## whipped/sour_cream,
## yogurt} => {waffles} 0.001016777 0.2127660 0.004778851 5.5358550 10
## [11837] {waffles,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [11838] {other_vegetables,
## waffles,
## whipped/sour_cream} => {yogurt} 0.001016777 0.4347826 0.002338587 3.1166815 10
## [11839] {other_vegetables,
## waffles,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3225806 0.003152008 4.5001144 10
## [11840] {waffles,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [11841] {waffles,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001321810 0.4193548 0.003152008 3.0060895 13
## [11842] {waffles,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001321810 0.3714286 0.003558719 5.1815603 13
## [11843] {rolls/buns,
## waffles,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [11844] {other_vegetables,
## waffles,
## whipped/sour_cream} => {rolls/buns} 0.001016777 0.4347826 0.002338587 2.3637849 10
## [11845] {other_vegetables,
## rolls/buns,
## waffles} => {whipped/sour_cream} 0.001016777 0.3448276 0.002948653 4.8104671 10
## [11846] {rolls/buns,
## waffles,
## whipped/sour_cream} => {whole_milk} 0.001728521 0.8095238 0.002135231 3.1681921 17
## [11847] {waffles,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001728521 0.5483871 0.003152008 2.9814191 17
## [11848] {rolls/buns,
## waffles,
## whole_milk} => {whipped/sour_cream} 0.001728521 0.3695652 0.004677173 5.1555658 17
## [11849] {rolls/buns,
## whipped/sour_cream,
## whole_milk} => {waffles} 0.001728521 0.2207792 0.007829181 5.7443482 17
## [11850] {other_vegetables,
## waffles,
## whipped/sour_cream} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [11851] {waffles,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001423488 0.4516129 0.003152008 2.3340057 14
## [11852] {other_vegetables,
## waffles,
## whole_milk} => {whipped/sour_cream} 0.001423488 0.3043478 0.004677173 4.2457601 14
## [11853] {pip_fruit,
## waffles,
## yogurt} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [11854] {other_vegetables,
## pip_fruit,
## waffles} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [11855] {other_vegetables,
## waffles,
## yogurt} => {pip_fruit} 0.001016777 0.3225806 0.003152008 4.2642213 10
## [11856] {other_vegetables,
## pip_fruit,
## waffles} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [11857] {pip_fruit,
## waffles,
## whole_milk} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [11858] {other_vegetables,
## waffles,
## whole_milk} => {pip_fruit} 0.001118454 0.2391304 0.004677173 3.1610858 11
## [11859] {pastry,
## soda,
## waffles} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [11860] {pastry,
## waffles,
## whole_milk} => {soda} 0.001220132 0.4285714 0.002846975 2.4577259 12
## [11861] {soda,
## waffles,
## whole_milk} => {pastry} 0.001220132 0.4615385 0.002643620 5.1876923 12
## [11862] {root_vegetables,
## tropical_fruit,
## waffles} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [11863] {tropical_fruit,
## waffles,
## yogurt} => {root_vegetables} 0.001016777 0.3846154 0.002643620 3.5286309 10
## [11864] {root_vegetables,
## waffles,
## yogurt} => {tropical_fruit} 0.001016777 0.5000000 0.002033554 4.7650194 10
## [11865] {root_vegetables,
## tropical_fruit,
## waffles} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [11866] {other_vegetables,
## tropical_fruit,
## waffles} => {root_vegetables} 0.001016777 0.4000000 0.002541942 3.6697761 10
## [11867] {other_vegetables,
## root_vegetables,
## waffles} => {tropical_fruit} 0.001016777 0.3125000 0.003253686 2.9781371 10
## [11868] {root_vegetables,
## tropical_fruit,
## waffles} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [11869] {tropical_fruit,
## waffles,
## whole_milk} => {root_vegetables} 0.001220132 0.4615385 0.002643620 4.2343571 12
## [11870] {root_vegetables,
## waffles,
## whole_milk} => {tropical_fruit} 0.001220132 0.3157895 0.003863752 3.0094859 12
## [11871] {tropical_fruit,
## waffles,
## yogurt} => {rolls/buns} 0.001220132 0.4615385 0.002643620 2.5092486 12
## [11872] {rolls/buns,
## tropical_fruit,
## waffles} => {yogurt} 0.001220132 0.5714286 0.002135231 4.0962099 12
## [11873] {rolls/buns,
## waffles,
## yogurt} => {tropical_fruit} 0.001220132 0.4444444 0.002745297 4.2355728 12
## [11874] {tropical_fruit,
## waffles,
## yogurt} => {other_vegetables} 0.001525165 0.5769231 0.002643620 2.9816282 15
## [11875] {other_vegetables,
## tropical_fruit,
## waffles} => {yogurt} 0.001525165 0.6000000 0.002541942 4.3010204 15
## [11876] {other_vegetables,
## waffles,
## yogurt} => {tropical_fruit} 0.001525165 0.4838710 0.003152008 4.6113091 15
## [11877] {tropical_fruit,
## waffles,
## yogurt} => {whole_milk} 0.001321810 0.5000000 0.002643620 1.9568245 13
## [11878] {tropical_fruit,
## waffles,
## whole_milk} => {yogurt} 0.001321810 0.5000000 0.002643620 3.5841837 13
## [11879] {waffles,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001321810 0.3714286 0.003558719 3.5397287 13
## [11880] {rolls/buns,
## tropical_fruit,
## waffles} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [11881] {tropical_fruit,
## waffles,
## whole_milk} => {rolls/buns} 0.001118454 0.4230769 0.002643620 2.3001446 11
## [11882] {rolls/buns,
## waffles,
## whole_milk} => {tropical_fruit} 0.001118454 0.2391304 0.004677173 2.2789223 11
## [11883] {other_vegetables,
## tropical_fruit,
## waffles} => {whole_milk} 0.001016777 0.4000000 0.002541942 1.5654596 10
## [11884] {tropical_fruit,
## waffles,
## whole_milk} => {other_vegetables} 0.001016777 0.3846154 0.002643620 1.9877521 10
## [11885] {other_vegetables,
## waffles,
## whole_milk} => {tropical_fruit} 0.001016777 0.2173913 0.004677173 2.0717476 10
## [11886] {root_vegetables,
## waffles,
## yogurt} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [11887] {other_vegetables,
## root_vegetables,
## waffles} => {yogurt} 0.001118454 0.3437500 0.003253686 2.4641263 11
## [11888] {other_vegetables,
## waffles,
## yogurt} => {root_vegetables} 0.001118454 0.3548387 0.003152008 3.2554466 11
## [11889] {root_vegetables,
## waffles,
## yogurt} => {whole_milk} 0.001525165 0.7500000 0.002033554 2.9352368 15
## [11890] {root_vegetables,
## waffles,
## whole_milk} => {yogurt} 0.001525165 0.3947368 0.003863752 2.8296187 15
## [11891] {waffles,
## whole_milk,
## yogurt} => {root_vegetables} 0.001525165 0.4285714 0.003558719 3.9319030 15
## [11892] {rolls/buns,
## root_vegetables,
## waffles} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [11893] {other_vegetables,
## root_vegetables,
## waffles} => {rolls/buns} 0.001016777 0.3125000 0.003253686 1.6989704 10
## [11894] {other_vegetables,
## rolls/buns,
## waffles} => {root_vegetables} 0.001016777 0.3448276 0.002948653 3.1636001 10
## [11895] {rolls/buns,
## root_vegetables,
## waffles} => {whole_milk} 0.001626843 0.8421053 0.001931876 3.2957044 16
## [11896] {root_vegetables,
## waffles,
## whole_milk} => {rolls/buns} 0.001626843 0.4210526 0.003863752 2.2891391 16
## [11897] {rolls/buns,
## waffles,
## whole_milk} => {root_vegetables} 0.001626843 0.3478261 0.004677173 3.1911097 16
## [11898] {other_vegetables,
## root_vegetables,
## waffles} => {whole_milk} 0.002033554 0.6250000 0.003253686 2.4460306 20
## [11899] {root_vegetables,
## waffles,
## whole_milk} => {other_vegetables} 0.002033554 0.5263158 0.003863752 2.7200819 20
## [11900] {other_vegetables,
## waffles,
## whole_milk} => {root_vegetables} 0.002033554 0.4347826 0.004677173 3.9888871 20
## [11901] {rolls/buns,
## soda,
## waffles} => {other_vegetables} 0.001220132 0.4444444 0.002745297 2.2969580 12
## [11902] {other_vegetables,
## soda,
## waffles} => {rolls/buns} 0.001220132 0.4800000 0.002541942 2.6096186 12
## [11903] {other_vegetables,
## rolls/buns,
## waffles} => {soda} 0.001220132 0.4137931 0.002948653 2.3729768 12
## [11904] {rolls/buns,
## soda,
## waffles} => {whole_milk} 0.001321810 0.4814815 0.002745297 1.8843495 13
## [11905] {soda,
## waffles,
## whole_milk} => {rolls/buns} 0.001321810 0.5000000 0.002643620 2.7183527 13
## [11906] {rolls/buns,
## waffles,
## whole_milk} => {soda} 0.001321810 0.2826087 0.004677173 1.6206744 13
## [11907] {other_vegetables,
## soda,
## waffles} => {whole_milk} 0.001016777 0.4000000 0.002541942 1.5654596 10
## [11908] {soda,
## waffles,
## whole_milk} => {other_vegetables} 0.001016777 0.3846154 0.002643620 1.9877521 10
## [11909] {other_vegetables,
## waffles,
## whole_milk} => {soda} 0.001016777 0.2173913 0.004677173 1.2466726 10
## [11910] {rolls/buns,
## waffles,
## yogurt} => {other_vegetables} 0.001118454 0.4074074 0.002745297 2.1055449 11
## [11911] {other_vegetables,
## waffles,
## yogurt} => {rolls/buns} 0.001118454 0.3548387 0.003152008 1.9291535 11
## [11912] {other_vegetables,
## rolls/buns,
## waffles} => {yogurt} 0.001118454 0.3793103 0.002948653 2.7190359 11
## [11913] {rolls/buns,
## waffles,
## yogurt} => {whole_milk} 0.001525165 0.5555556 0.002745297 2.1742495 15
## [11914] {waffles,
## whole_milk,
## yogurt} => {rolls/buns} 0.001525165 0.4285714 0.003558719 2.3300166 15
## [11915] {rolls/buns,
## waffles,
## whole_milk} => {yogurt} 0.001525165 0.3260870 0.004677173 2.3375111 15
## [11916] {other_vegetables,
## waffles,
## yogurt} => {whole_milk} 0.001626843 0.5161290 0.003152008 2.0199479 16
## [11917] {waffles,
## whole_milk,
## yogurt} => {other_vegetables} 0.001626843 0.4571429 0.003558719 2.3625854 16
## [11918] {other_vegetables,
## waffles,
## whole_milk} => {yogurt} 0.001626843 0.3478261 0.004677173 2.4933452 16
## [11919] {other_vegetables,
## rolls/buns,
## waffles} => {whole_milk} 0.001728521 0.5862069 0.002948653 2.2942080 17
## [11920] {rolls/buns,
## waffles,
## whole_milk} => {other_vegetables} 0.001728521 0.3695652 0.004677173 1.9099705 17
## [11921] {other_vegetables,
## waffles,
## whole_milk} => {rolls/buns} 0.001728521 0.3695652 0.004677173 2.0092172 17
## [11922] {dessert,
## long_life_bakery_product,
## yogurt} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [11923] {dessert,
## long_life_bakery_product,
## whole_milk} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [11924] {long_life_bakery_product,
## whole_milk,
## yogurt} => {dessert} 0.001016777 0.2222222 0.004575496 5.9878234 10
## [11925] {dessert,
## whole_milk,
## yogurt} => {long_life_bakery_product} 0.001016777 0.2127660 0.004778851 5.6862858 10
## [11926] {long_life_bakery_product,
## tropical_fruit,
## white_bread} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [11927] {long_life_bakery_product,
## white_bread,
## whole_milk} => {tropical_fruit} 0.001016777 0.4166667 0.002440264 3.9708495 10
## [11928] {long_life_bakery_product,
## tropical_fruit,
## whole_milk} => {white_bread} 0.001016777 0.3125000 0.003253686 7.4237621 10
## [11929] {tropical_fruit,
## white_bread,
## whole_milk} => {long_life_bakery_product} 0.001016777 0.2222222 0.004575496 5.9390097 10
## [11930] {long_life_bakery_product,
## white_bread,
## yogurt} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [11931] {long_life_bakery_product,
## white_bread,
## whole_milk} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [11932] {long_life_bakery_product,
## whole_milk,
## yogurt} => {white_bread} 0.001016777 0.2222222 0.004575496 5.2791197 10
## [11933] {white_bread,
## whole_milk,
## yogurt} => {long_life_bakery_product} 0.001016777 0.2083333 0.004880529 5.5678216 10
## [11934] {chocolate,
## long_life_bakery_product,
## pip_fruit} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [11935] {chocolate,
## long_life_bakery_product,
## whole_milk} => {pip_fruit} 0.001016777 0.3333333 0.003050330 4.4063620 10
## [11936] {long_life_bakery_product,
## pip_fruit,
## whole_milk} => {chocolate} 0.001016777 0.4166667 0.002440264 8.3973702 10
## [11937] {chocolate,
## pip_fruit,
## whole_milk} => {long_life_bakery_product} 0.001016777 0.3125000 0.003253686 8.3517323 10
## [11938] {chocolate,
## long_life_bakery_product,
## tropical_fruit} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [11939] {chocolate,
## long_life_bakery_product,
## other_vegetables} => {tropical_fruit} 0.001016777 0.4347826 0.002338587 4.1434951 10
## [11940] {long_life_bakery_product,
## other_vegetables,
## tropical_fruit} => {chocolate} 0.001016777 0.3846154 0.002643620 7.7514187 10
## [11941] {chocolate,
## other_vegetables,
## tropical_fruit} => {long_life_bakery_product} 0.001016777 0.2857143 0.003558719 7.6358696 10
## [11942] {chocolate,
## long_life_bakery_product,
## tropical_fruit} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [11943] {chocolate,
## long_life_bakery_product,
## whole_milk} => {tropical_fruit} 0.001220132 0.4000000 0.003050330 3.8120155 12
## [11944] {long_life_bakery_product,
## tropical_fruit,
## whole_milk} => {chocolate} 0.001220132 0.3750000 0.003253686 7.5576332 12
## [11945] {chocolate,
## tropical_fruit,
## whole_milk} => {long_life_bakery_product} 0.001220132 0.3076923 0.003965430 8.2232441 12
## [11946] {chocolate,
## long_life_bakery_product,
## yogurt} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [11947] {chocolate,
## long_life_bakery_product,
## other_vegetables} => {yogurt} 0.001220132 0.5217391 0.002338587 3.7400177 12
## [11948] {long_life_bakery_product,
## other_vegetables,
## yogurt} => {chocolate} 0.001220132 0.3333333 0.003660397 6.7178962 12
## [11949] {chocolate,
## other_vegetables,
## yogurt} => {long_life_bakery_product} 0.001220132 0.3333333 0.003660397 8.9085145 12
## [11950] {chocolate,
## long_life_bakery_product,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [11951] {chocolate,
## long_life_bakery_product,
## whole_milk} => {yogurt} 0.001118454 0.3666667 0.003050330 2.6284014 11
## [11952] {long_life_bakery_product,
## whole_milk,
## yogurt} => {chocolate} 0.001118454 0.2444444 0.004575496 4.9264572 11
## [11953] {chocolate,
## whole_milk,
## yogurt} => {long_life_bakery_product} 0.001118454 0.2444444 0.004575496 6.5329106 11
## [11954] {chocolate,
## long_life_bakery_product,
## other_vegetables} => {whole_milk} 0.001626843 0.6956522 0.002338587 2.7225385 16
## [11955] {chocolate,
## long_life_bakery_product,
## whole_milk} => {other_vegetables} 0.001626843 0.5333333 0.003050330 2.7563496 16
## [11956] {long_life_bakery_product,
## other_vegetables,
## whole_milk} => {chocolate} 0.001626843 0.2857143 0.005693950 5.7581967 16
## [11957] {chocolate,
## other_vegetables,
## whole_milk} => {long_life_bakery_product} 0.001626843 0.2962963 0.005490595 7.9186795 16
## [11958] {frozen_vegetables,
## long_life_bakery_product,
## other_vegetables} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [11959] {frozen_vegetables,
## long_life_bakery_product,
## whole_milk} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [11960] {long_life_bakery_product,
## other_vegetables,
## whole_milk} => {frozen_vegetables} 0.001220132 0.2142857 0.005693950 4.4556025 12
## [11961] {long_life_bakery_product,
## napkins,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [11962] {long_life_bakery_product,
## napkins,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.3846154 0.002643620 5.3655210 10
## [11963] {long_life_bakery_product,
## whipped/sour_cream,
## whole_milk} => {napkins} 0.001016777 0.3125000 0.003253686 5.9678398 10
## [11964] {napkins,
## whipped/sour_cream,
## whole_milk} => {long_life_bakery_product} 0.001016777 0.2564103 0.003965430 6.8527035 10
## [11965] {long_life_bakery_product,
## napkins,
## tropical_fruit} => {whole_milk} 0.001220132 0.9230769 0.001321810 3.6125991 12
## [11966] {long_life_bakery_product,
## napkins,
## whole_milk} => {tropical_fruit} 0.001220132 0.4615385 0.002643620 4.3984794 12
## [11967] {long_life_bakery_product,
## tropical_fruit,
## whole_milk} => {napkins} 0.001220132 0.3750000 0.003253686 7.1614078 12
## [11968] {napkins,
## tropical_fruit,
## whole_milk} => {long_life_bakery_product} 0.001220132 0.2448980 0.004982206 6.5450311 12
## [11969] {long_life_bakery_product,
## napkins,
## yogurt} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [11970] {long_life_bakery_product,
## napkins,
## whole_milk} => {yogurt} 0.001016777 0.3846154 0.002643620 2.7570644 10
## [11971] {long_life_bakery_product,
## whole_milk,
## yogurt} => {napkins} 0.001016777 0.2222222 0.004575496 4.2437972 10
## [11972] {long_life_bakery_product,
## napkins,
## other_vegetables} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [11973] {long_life_bakery_product,
## napkins,
## whole_milk} => {other_vegetables} 0.001220132 0.4615385 0.002643620 2.3853026 12
## [11974] {long_life_bakery_product,
## other_vegetables,
## whole_milk} => {napkins} 0.001220132 0.2142857 0.005693950 4.0922330 12
## [11975] {butter,
## long_life_bakery_product,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.8000000 0.001525165 4.1345244 12
## [11976] {butter,
## long_life_bakery_product,
## other_vegetables} => {whipped/sour_cream} 0.001220132 0.5000000 0.002440264 6.9751773 12
## [11977] {long_life_bakery_product,
## other_vegetables,
## whipped/sour_cream} => {butter} 0.001220132 0.4444444 0.002745297 8.0203874 12
## [11978] {butter,
## other_vegetables,
## whipped/sour_cream} => {long_life_bakery_product} 0.001220132 0.2105263 0.005795628 5.6264302 12
## [11979] {butter,
## long_life_bakery_product,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [11980] {butter,
## long_life_bakery_product,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.4000000 0.002541942 5.5801418 10
## [11981] {long_life_bakery_product,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001016777 0.3125000 0.003253686 5.6393349 10
## [11982] {butter,
## long_life_bakery_product,
## sausage} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [11983] {butter,
## long_life_bakery_product,
## whole_milk} => {sausage} 0.001016777 0.4000000 0.002541942 4.2575758 10
## [11984] {long_life_bakery_product,
## sausage,
## whole_milk} => {butter} 0.001016777 0.3703704 0.002745297 6.6836561 10
## [11985] {butter,
## sausage,
## whole_milk} => {long_life_bakery_product} 0.001016777 0.2127660 0.004778851 5.6862858 10
## [11986] {butter,
## long_life_bakery_product,
## root_vegetables} => {other_vegetables} 0.001321810 0.7222222 0.001830198 3.7325568 13
## [11987] {butter,
## long_life_bakery_product,
## other_vegetables} => {root_vegetables} 0.001321810 0.5416667 0.002440264 4.9694885 13
## [11988] {long_life_bakery_product,
## other_vegetables,
## root_vegetables} => {butter} 0.001321810 0.3939394 0.003355363 7.1089797 13
## [11989] {butter,
## other_vegetables,
## root_vegetables} => {long_life_bakery_product} 0.001321810 0.2000000 0.006609049 5.3451087 13
## [11990] {butter,
## long_life_bakery_product,
## root_vegetables} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [11991] {butter,
## long_life_bakery_product,
## whole_milk} => {root_vegetables} 0.001220132 0.4800000 0.002541942 4.4037313 12
## [11992] {long_life_bakery_product,
## root_vegetables,
## whole_milk} => {butter} 0.001220132 0.4137931 0.002948653 7.4672572 12
## [11993] {butter,
## long_life_bakery_product,
## other_vegetables} => {whole_milk} 0.001626843 0.6666667 0.002440264 2.6090994 16
## [11994] {butter,
## long_life_bakery_product,
## whole_milk} => {other_vegetables} 0.001626843 0.6400000 0.002541942 3.3076195 16
## [11995] {long_life_bakery_product,
## other_vegetables,
## whole_milk} => {butter} 0.001626843 0.2857143 0.005693950 5.1559633 16
## [11996] {long_life_bakery_product,
## newspapers,
## tropical_fruit} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [11997] {long_life_bakery_product,
## newspapers,
## whole_milk} => {tropical_fruit} 0.001016777 0.5882353 0.001728521 5.6059052 10
## [11998] {long_life_bakery_product,
## tropical_fruit,
## whole_milk} => {newspapers} 0.001016777 0.3125000 0.003253686 3.9152070 10
## [11999] {newspapers,
## tropical_fruit,
## whole_milk} => {long_life_bakery_product} 0.001016777 0.2000000 0.005083884 5.3451087 10
## [12000] {fruit/vegetable_juice,
## long_life_bakery_product,
## sausage} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [12001] {fruit/vegetable_juice,
## long_life_bakery_product,
## whole_milk} => {sausage} 0.001016777 0.3030303 0.003355363 3.2254362 10
## [12002] {long_life_bakery_product,
## sausage,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.3703704 0.002745297 5.1231963 10
## [12003] {fruit/vegetable_juice,
## sausage,
## whole_milk} => {long_life_bakery_product} 0.001016777 0.2083333 0.004880529 5.5678216 10
## [12004] {bottled_water,
## fruit/vegetable_juice,
## long_life_bakery_product} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [12005] {fruit/vegetable_juice,
## long_life_bakery_product,
## whole_milk} => {bottled_water} 0.001016777 0.3030303 0.003355363 2.7417691 10
## [12006] {bottled_water,
## long_life_bakery_product,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.4761905 0.002135231 6.5869667 10
## [12007] {fruit/vegetable_juice,
## long_life_bakery_product,
## tropical_fruit} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [12008] {fruit/vegetable_juice,
## long_life_bakery_product,
## whole_milk} => {tropical_fruit} 0.001016777 0.3030303 0.003355363 2.8878905 10
## [12009] {long_life_bakery_product,
## tropical_fruit,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.3125000 0.003253686 4.3226969 10
## [12010] {fruit/vegetable_juice,
## long_life_bakery_product,
## root_vegetables} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [12011] {fruit/vegetable_juice,
## long_life_bakery_product,
## other_vegetables} => {root_vegetables} 0.001016777 0.4000000 0.002541942 3.6697761 10
## [12012] {long_life_bakery_product,
## other_vegetables,
## root_vegetables} => {fruit/vegetable_juice} 0.001016777 0.3030303 0.003355363 4.1917061 10
## [12013] {fruit/vegetable_juice,
## long_life_bakery_product,
## yogurt} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [12014] {fruit/vegetable_juice,
## long_life_bakery_product,
## other_vegetables} => {yogurt} 0.001118454 0.4400000 0.002541942 3.1540816 11
## [12015] {long_life_bakery_product,
## other_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.3055556 0.003660397 4.2266370 11
## [12016] {fruit/vegetable_juice,
## long_life_bakery_product,
## yogurt} => {whole_milk} 0.001423488 0.7777778 0.001830198 3.0439492 14
## [12017] {fruit/vegetable_juice,
## long_life_bakery_product,
## whole_milk} => {yogurt} 0.001423488 0.4242424 0.003355363 3.0411255 14
## [12018] {long_life_bakery_product,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001423488 0.3111111 0.004575496 4.3034849 14
## [12019] {fruit/vegetable_juice,
## long_life_bakery_product,
## other_vegetables} => {whole_milk} 0.001626843 0.6400000 0.002541942 2.5047354 16
## [12020] {fruit/vegetable_juice,
## long_life_bakery_product,
## whole_milk} => {other_vegetables} 0.001626843 0.4848485 0.003355363 2.5057724 16
## [12021] {long_life_bakery_product,
## other_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001626843 0.2857143 0.005693950 3.9521800 16
## [12022] {long_life_bakery_product,
## sausage,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [12023] {long_life_bakery_product,
## whipped/sour_cream,
## whole_milk} => {sausage} 0.001016777 0.3125000 0.003253686 3.3262311 10
## [12024] {long_life_bakery_product,
## sausage,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.3703704 0.002745297 5.1667980 10
## [12025] {sausage,
## whipped/sour_cream,
## whole_milk} => {long_life_bakery_product} 0.001016777 0.2000000 0.005083884 5.3451087 10
## [12026] {long_life_bakery_product,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [12027] {long_life_bakery_product,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001016777 0.3703704 0.002745297 3.5296440 10
## [12028] {long_life_bakery_product,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001016777 0.3846154 0.002643620 5.3655210 10
## [12029] {long_life_bakery_product,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [12030] {long_life_bakery_product,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001016777 0.3125000 0.003253686 2.9781371 10
## [12031] {long_life_bakery_product,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.3125000 0.003253686 4.3594858 10
## [12032] {long_life_bakery_product,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [12033] {long_life_bakery_product,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [12034] {long_life_bakery_product,
## other_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.001016777 0.3030303 0.003355363 4.2273802 10
## [12035] {long_life_bakery_product,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001423488 0.6666667 0.002135231 3.4454370 14
## [12036] {long_life_bakery_product,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001423488 0.5185185 0.002745297 3.7169312 14
## [12037] {long_life_bakery_product,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001423488 0.3888889 0.003660397 5.4251379 14
## [12038] {long_life_bakery_product,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001728521 0.8095238 0.002135231 3.1681921 17
## [12039] {long_life_bakery_product,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001728521 0.5312500 0.003253686 3.8081952 17
## [12040] {long_life_bakery_product,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001728521 0.3777778 0.004575496 5.2701340 17
## [12041] {long_life_bakery_product,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [12042] {long_life_bakery_product,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001016777 0.3125000 0.003253686 1.6989704 10
## [12043] {long_life_bakery_product,
## rolls/buns,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2941176 0.003457041 4.1030455 10
## [12044] {long_life_bakery_product,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001728521 0.6296296 0.002745297 2.4641494 17
## [12045] {long_life_bakery_product,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001728521 0.5312500 0.003253686 2.7455826 17
## [12046] {long_life_bakery_product,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001728521 0.3035714 0.005693950 4.2349291 17
## [12047] {long_life_bakery_product,
## pip_fruit,
## yogurt} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [12048] {long_life_bakery_product,
## pip_fruit,
## whole_milk} => {yogurt} 0.001321810 0.5416667 0.002440264 3.8828656 13
## [12049] {long_life_bakery_product,
## whole_milk,
## yogurt} => {pip_fruit} 0.001321810 0.2888889 0.004575496 3.8188471 13
## [12050] {long_life_bakery_product,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [12051] {long_life_bakery_product,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001220132 0.5000000 0.002440264 2.5840778 12
## [12052] {long_life_bakery_product,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001220132 0.2142857 0.005693950 2.8326613 12
## [12053] {long_life_bakery_product,
## pastry,
## soda} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [12054] {long_life_bakery_product,
## pastry,
## whole_milk} => {soda} 0.001016777 0.4761905 0.002135231 2.7308066 10
## [12055] {long_life_bakery_product,
## soda,
## whole_milk} => {pastry} 0.001016777 0.3333333 0.003050330 3.7466667 10
## [12056] {long_life_bakery_product,
## other_vegetables,
## pastry} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [12057] {long_life_bakery_product,
## pastry,
## whole_milk} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [12058] {long_life_bakery_product,
## sausage,
## tropical_fruit} => {yogurt} 0.001016777 0.6666667 0.001525165 4.7789116 10
## [12059] {long_life_bakery_product,
## sausage,
## yogurt} => {tropical_fruit} 0.001016777 0.5555556 0.001830198 5.2944660 10
## [12060] {long_life_bakery_product,
## tropical_fruit,
## yogurt} => {sausage} 0.001016777 0.4166667 0.002440264 4.4349747 10
## [12061] {sausage,
## tropical_fruit,
## yogurt} => {long_life_bakery_product} 0.001016777 0.2173913 0.004677173 5.8099008 10
## [12062] {long_life_bakery_product,
## sausage,
## tropical_fruit} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [12063] {long_life_bakery_product,
## sausage,
## whole_milk} => {tropical_fruit} 0.001118454 0.4074074 0.002745297 3.8826084 11
## [12064] {long_life_bakery_product,
## tropical_fruit,
## whole_milk} => {sausage} 0.001118454 0.3437500 0.003253686 3.6588542 11
## [12065] {long_life_bakery_product,
## sausage,
## yogurt} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [12066] {long_life_bakery_product,
## sausage,
## whole_milk} => {yogurt} 0.001118454 0.4074074 0.002745297 2.9204460 11
## [12067] {long_life_bakery_product,
## whole_milk,
## yogurt} => {sausage} 0.001118454 0.2444444 0.004575496 2.6018519 11
## [12068] {bottled_water,
## long_life_bakery_product,
## yogurt} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [12069] {bottled_water,
## long_life_bakery_product,
## whole_milk} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [12070] {long_life_bakery_product,
## whole_milk,
## yogurt} => {bottled_water} 0.001016777 0.2222222 0.004575496 2.0106307 10
## [12071] {bottled_water,
## long_life_bakery_product,
## other_vegetables} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [12072] {bottled_water,
## long_life_bakery_product,
## whole_milk} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [12073] {long_life_bakery_product,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001118454 0.8461538 0.001321810 4.3730547 11
## [12074] {long_life_bakery_product,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001118454 0.4230769 0.002643620 3.8814940 11
## [12075] {long_life_bakery_product,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001118454 0.3333333 0.003355363 3.1766796 11
## [12076] {long_life_bakery_product,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [12077] {long_life_bakery_product,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001118454 0.4230769 0.002643620 3.0327708 11
## [12078] {long_life_bakery_product,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001118454 0.3055556 0.003660397 2.9119563 11
## [12079] {long_life_bakery_product,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001728521 0.7083333 0.002440264 2.7721681 17
## [12080] {long_life_bakery_product,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001728521 0.5312500 0.003253686 3.8081952 17
## [12081] {long_life_bakery_product,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001728521 0.3777778 0.004575496 3.6002369 17
## [12082] {long_life_bakery_product,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001423488 0.5384615 0.002643620 2.1073495 14
## [12083] {long_life_bakery_product,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001423488 0.4375000 0.003253686 2.2610681 14
## [12084] {long_life_bakery_product,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001423488 0.2500000 0.005693950 2.3825097 14
## [12085] {long_life_bakery_product,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001321810 0.6842105 0.001931876 3.5361064 13
## [12086] {long_life_bakery_product,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001321810 0.3939394 0.003355363 2.8239023 13
## [12087] {long_life_bakery_product,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001321810 0.3611111 0.003660397 3.3129923 13
## [12088] {long_life_bakery_product,
## root_vegetables,
## yogurt} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [12089] {long_life_bakery_product,
## root_vegetables,
## whole_milk} => {yogurt} 0.001220132 0.4137931 0.002948653 2.9662210 12
## [12090] {long_life_bakery_product,
## whole_milk,
## yogurt} => {root_vegetables} 0.001220132 0.2666667 0.004575496 2.4465174 12
## [12091] {long_life_bakery_product,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001728521 0.5151515 0.003355363 2.0161222 17
## [12092] {long_life_bakery_product,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001728521 0.5862069 0.002948653 3.0296084 17
## [12093] {long_life_bakery_product,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001728521 0.3035714 0.005693950 2.7850979 17
## [12094] {long_life_bakery_product,
## soda,
## yogurt} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [12095] {long_life_bakery_product,
## soda,
## whole_milk} => {yogurt} 0.001016777 0.3333333 0.003050330 2.3894558 10
## [12096] {long_life_bakery_product,
## whole_milk,
## yogurt} => {soda} 0.001016777 0.2222222 0.004575496 1.2743764 10
## [12097] {long_life_bakery_product,
## other_vegetables,
## soda} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [12098] {long_life_bakery_product,
## soda,
## whole_milk} => {other_vegetables} 0.001118454 0.3666667 0.003050330 1.8949904 11
## [12099] {long_life_bakery_product,
## rolls/buns,
## yogurt} => {whole_milk} 0.001525165 0.7500000 0.002033554 2.9352368 15
## [12100] {long_life_bakery_product,
## whole_milk,
## yogurt} => {rolls/buns} 0.001525165 0.3333333 0.004575496 1.8122351 15
## [12101] {long_life_bakery_product,
## rolls/buns,
## whole_milk} => {yogurt} 0.001525165 0.4411765 0.003457041 3.1625150 15
## [12102] {long_life_bakery_product,
## other_vegetables,
## yogurt} => {whole_milk} 0.002643620 0.7222222 0.003660397 2.8265243 26
## [12103] {long_life_bakery_product,
## whole_milk,
## yogurt} => {other_vegetables} 0.002643620 0.5777778 0.004575496 2.9860454 26
## [12104] {long_life_bakery_product,
## other_vegetables,
## whole_milk} => {yogurt} 0.002643620 0.4642857 0.005693950 3.3281706 26
## [12105] {long_life_bakery_product,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [12106] {long_life_bakery_product,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.001118454 0.3235294 0.003457041 1.6720503 11
## [12107] {curd,
## dessert,
## tropical_fruit} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [12108] {curd,
## dessert,
## other_vegetables} => {tropical_fruit} 0.001016777 0.5000000 0.002033554 4.7650194 10
## [12109] {dessert,
## other_vegetables,
## tropical_fruit} => {curd} 0.001016777 0.3571429 0.002846975 6.7032443 10
## [12110] {curd,
## dessert,
## tropical_fruit} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [12111] {curd,
## dessert,
## whole_milk} => {tropical_fruit} 0.001016777 0.3703704 0.002745297 3.5296440 10
## [12112] {dessert,
## tropical_fruit,
## whole_milk} => {curd} 0.001016777 0.3571429 0.002846975 6.7032443 10
## [12113] {curd,
## dessert,
## yogurt} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [12114] {curd,
## dessert,
## other_vegetables} => {yogurt} 0.001220132 0.6000000 0.002033554 4.3010204 12
## [12115] {dessert,
## other_vegetables,
## yogurt} => {curd} 0.001220132 0.2666667 0.004575496 5.0050891 12
## [12116] {curd,
## other_vegetables,
## yogurt} => {dessert} 0.001220132 0.2000000 0.006100661 5.3890411 12
## [12117] {curd,
## dessert,
## yogurt} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [12118] {curd,
## dessert,
## whole_milk} => {yogurt} 0.001220132 0.4444444 0.002745297 3.1859410 12
## [12119] {dessert,
## whole_milk,
## yogurt} => {curd} 0.001220132 0.2553191 0.004778851 4.7921065 12
## [12120] {curd,
## dessert,
## other_vegetables} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [12121] {curd,
## dessert,
## whole_milk} => {other_vegetables} 0.001118454 0.4074074 0.002745297 2.1055449 11
## [12122] {dessert,
## other_vegetables,
## whole_milk} => {curd} 0.001118454 0.2244898 0.004982206 4.2134678 11
## [12123] {dessert,
## fruit/vegetable_juice,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [12124] {dessert,
## fruit/vegetable_juice,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.3846154 0.002643620 5.3655210 10
## [12125] {dessert,
## whipped/sour_cream,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.3846154 0.002643620 5.3202423 10
## [12126] {fruit/vegetable_juice,
## whipped/sour_cream,
## whole_milk} => {dessert} 0.001016777 0.2272727 0.004473818 6.1239103 10
## [12127] {dessert,
## fruit/vegetable_juice,
## root_vegetables} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [12128] {dessert,
## fruit/vegetable_juice,
## other_vegetables} => {root_vegetables} 0.001220132 0.4615385 0.002643620 4.2343571 12
## [12129] {dessert,
## other_vegetables,
## root_vegetables} => {fruit/vegetable_juice} 0.001220132 0.3529412 0.003457041 4.8821047 12
## [12130] {dessert,
## fruit/vegetable_juice,
## yogurt} => {other_vegetables} 0.001321810 0.5652174 0.002338587 2.9211314 13
## [12131] {dessert,
## fruit/vegetable_juice,
## other_vegetables} => {yogurt} 0.001321810 0.5000000 0.002643620 3.5841837 13
## [12132] {dessert,
## other_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.001321810 0.2888889 0.004575496 3.9960931 13
## [12133] {dessert,
## fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.001220132 0.5217391 0.002338587 2.0419038 12
## [12134] {dessert,
## fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.001220132 0.4615385 0.002643620 3.3084772 12
## [12135] {dessert,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001220132 0.2553191 0.004778851 3.5317353 12
## [12136] {dessert,
## fruit/vegetable_juice,
## other_vegetables} => {whole_milk} 0.001220132 0.4615385 0.002643620 1.8062996 12
## [12137] {dessert,
## fruit/vegetable_juice,
## whole_milk} => {other_vegetables} 0.001220132 0.4615385 0.002643620 2.3853026 12
## [12138] {dessert,
## other_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001220132 0.2448980 0.004982206 3.3875829 12
## [12139] {dessert,
## pip_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [12140] {dessert,
## other_vegetables,
## whipped/sour_cream} => {pip_fruit} 0.001118454 0.3928571 0.002846975 5.1932124 11
## [12141] {dessert,
## other_vegetables,
## pip_fruit} => {whipped/sour_cream} 0.001118454 0.4074074 0.002745297 5.6834778 11
## [12142] {other_vegetables,
## pip_fruit,
## whipped/sour_cream} => {dessert} 0.001118454 0.2000000 0.005592272 5.3890411 11
## [12143] {dessert,
## pip_fruit,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [12144] {dessert,
## whipped/sour_cream,
## whole_milk} => {pip_fruit} 0.001220132 0.4615385 0.002643620 6.1011166 12
## [12145] {dessert,
## pip_fruit,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.4285714 0.002846975 5.9787234 12
## [12146] {pip_fruit,
## whipped/sour_cream,
## whole_milk} => {dessert} 0.001220132 0.2033898 0.005998983 5.4803808 12
## [12147] {dessert,
## sausage,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [12148] {dessert,
## other_vegetables,
## whipped/sour_cream} => {sausage} 0.001016777 0.3571429 0.002846975 3.8014069 10
## [12149] {dessert,
## other_vegetables,
## sausage} => {whipped/sour_cream} 0.001016777 0.3125000 0.003253686 4.3594858 10
## [12150] {other_vegetables,
## sausage,
## whipped/sour_cream} => {dessert} 0.001016777 0.2083333 0.004880529 5.6135845 10
## [12151] {dessert,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.9166667 0.001220132 4.7374759 11
## [12152] {dessert,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001118454 0.3928571 0.002846975 3.7439438 11
## [12153] {dessert,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001118454 0.3928571 0.002846975 5.4804965 11
## [12154] {dessert,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [12155] {dessert,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.3571429 0.002846975 3.2765858 10
## [12156] {dessert,
## other_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.001016777 0.2941176 0.003457041 4.1030455 10
## [12157] {dessert,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001423488 0.6666667 0.002135231 3.4454370 14
## [12158] {dessert,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001423488 0.5000000 0.002846975 3.5841837 14
## [12159] {dessert,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001423488 0.3111111 0.004575496 4.3401103 14
## [12160] {dessert,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [12161] {dessert,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001525165 0.5769231 0.002643620 4.1355965 15
## [12162] {dessert,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001525165 0.3191489 0.004778851 4.4522408 15
## [12163] {dessert,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.5357143 0.002846975 2.0965977 15
## [12164] {dessert,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001525165 0.5769231 0.002643620 2.9816282 15
## [12165] {dessert,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001525165 0.3061224 0.004982206 4.2705167 15
## [12166] {dessert,
## pip_fruit,
## sausage} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [12167] {dessert,
## pip_fruit,
## whole_milk} => {sausage} 0.001016777 0.3571429 0.002846975 3.8014069 10
## [12168] {dessert,
## sausage,
## whole_milk} => {pip_fruit} 0.001016777 0.3571429 0.002846975 4.7211022 10
## [12169] {dessert,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001321810 0.7647059 0.001728521 3.9521189 13
## [12170] {dessert,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001321810 0.4814815 0.002745297 4.5885372 13
## [12171] {dessert,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001321810 0.4642857 0.002846975 6.1374328 13
## [12172] {dessert,
## pip_fruit,
## root_vegetables} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [12173] {dessert,
## other_vegetables,
## pip_fruit} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [12174] {dessert,
## other_vegetables,
## root_vegetables} => {pip_fruit} 0.001016777 0.2941176 0.003457041 3.8879665 10
## [12175] {dessert,
## pip_fruit,
## yogurt} => {other_vegetables} 0.001525165 0.7142857 0.002135231 3.6915397 15
## [12176] {dessert,
## other_vegetables,
## pip_fruit} => {yogurt} 0.001525165 0.5555556 0.002745297 3.9824263 15
## [12177] {dessert,
## other_vegetables,
## yogurt} => {pip_fruit} 0.001525165 0.3333333 0.004575496 4.4063620 15
## [12178] {dessert,
## pip_fruit,
## yogurt} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [12179] {dessert,
## pip_fruit,
## whole_milk} => {yogurt} 0.001118454 0.3928571 0.002846975 2.8161443 11
## [12180] {dessert,
## whole_milk,
## yogurt} => {pip_fruit} 0.001118454 0.2340426 0.004778851 3.0938286 11
## [12181] {dessert,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001728521 0.6296296 0.002745297 2.4641494 17
## [12182] {dessert,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001728521 0.6071429 0.002846975 3.1378087 17
## [12183] {dessert,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001728521 0.3469388 0.004982206 4.5862135 17
## [12184] {dessert,
## pastry,
## soda} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [12185] {dessert,
## pastry,
## whole_milk} => {soda} 0.001016777 0.4545455 0.002236909 2.6066790 10
## [12186] {dessert,
## soda,
## whole_milk} => {pastry} 0.001016777 0.2777778 0.003660397 3.1222222 10
## [12187] {dessert,
## pastry,
## yogurt} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [12188] {dessert,
## other_vegetables,
## pastry} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [12189] {dessert,
## other_vegetables,
## yogurt} => {pastry} 0.001016777 0.2222222 0.004575496 2.4977778 10
## [12190] {dessert,
## pastry,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [12191] {dessert,
## pastry,
## whole_milk} => {yogurt} 0.001016777 0.4545455 0.002236909 3.2583488 10
## [12192] {dessert,
## whole_milk,
## yogurt} => {pastry} 0.001016777 0.2127660 0.004778851 2.3914894 10
## [12193] {dessert,
## shopping_bags,
## soda} => {whole_milk} 0.001016777 0.4166667 0.002440264 1.6306871 10
## [12194] {dessert,
## shopping_bags,
## whole_milk} => {soda} 0.001016777 0.5263158 0.001931876 3.0182599 10
## [12195] {dessert,
## soda,
## whole_milk} => {shopping_bags} 0.001016777 0.2777778 0.003660397 2.8193441 10
## [12196] {dessert,
## sausage,
## soda} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [12197] {dessert,
## other_vegetables,
## sausage} => {soda} 0.001016777 0.3125000 0.003253686 1.7920918 10
## [12198] {dessert,
## other_vegetables,
## soda} => {sausage} 0.001016777 0.3125000 0.003253686 3.3262311 10
## [12199] {dessert,
## sausage,
## soda} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [12200] {dessert,
## sausage,
## whole_milk} => {soda} 0.001118454 0.3928571 0.002846975 2.2529155 11
## [12201] {dessert,
## soda,
## whole_milk} => {sausage} 0.001118454 0.3055556 0.003660397 3.2523148 11
## [12202] {dessert,
## sausage,
## yogurt} => {other_vegetables} 0.001423488 0.7777778 0.001830198 4.0196765 14
## [12203] {dessert,
## other_vegetables,
## sausage} => {yogurt} 0.001423488 0.4375000 0.003253686 3.1361607 14
## [12204] {dessert,
## other_vegetables,
## yogurt} => {sausage} 0.001423488 0.3111111 0.004575496 3.3114478 14
## [12205] {dessert,
## other_vegetables,
## sausage} => {whole_milk} 0.001220132 0.3750000 0.003253686 1.4676184 12
## [12206] {dessert,
## sausage,
## whole_milk} => {other_vegetables} 0.001220132 0.4285714 0.002846975 2.2149238 12
## [12207] {dessert,
## other_vegetables,
## whole_milk} => {sausage} 0.001220132 0.2448980 0.004982206 2.6066790 12
## [12208] {bottled_water,
## dessert,
## other_vegetables} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [12209] {bottled_water,
## dessert,
## whole_milk} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [12210] {dessert,
## other_vegetables,
## whole_milk} => {bottled_water} 0.001016777 0.2040816 0.004982206 1.8464976 10
## [12211] {dessert,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [12212] {dessert,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001016777 0.3571429 0.002846975 3.2765858 10
## [12213] {dessert,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001016777 0.2941176 0.003457041 2.8029526 10
## [12214] {dessert,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001321810 0.5416667 0.002440264 2.7994176 13
## [12215] {dessert,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001321810 0.4642857 0.002846975 3.3281706 13
## [12216] {dessert,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001321810 0.2888889 0.004575496 2.7531223 13
## [12217] {dessert,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001321810 0.5416667 0.002440264 2.1198932 13
## [12218] {dessert,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001321810 0.4642857 0.002846975 3.3281706 13
## [12219] {dessert,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001321810 0.2765957 0.004778851 2.6359682 13
## [12220] {dessert,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001626843 0.5714286 0.002846975 2.2363709 16
## [12221] {dessert,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001626843 0.5714286 0.002846975 2.9532317 16
## [12222] {dessert,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001626843 0.3265306 0.004982206 3.1118494 16
## [12223] {dessert,
## root_vegetables,
## soda} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [12224] {dessert,
## other_vegetables,
## root_vegetables} => {soda} 0.001016777 0.2941176 0.003457041 1.6866747 10
## [12225] {dessert,
## other_vegetables,
## soda} => {root_vegetables} 0.001016777 0.3125000 0.003253686 2.8670126 10
## [12226] {dessert,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001220132 0.5000000 0.002440264 2.5840778 12
## [12227] {dessert,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001220132 0.3529412 0.003457041 2.5300120 12
## [12228] {dessert,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001220132 0.2666667 0.004575496 2.4465174 12
## [12229] {dessert,
## root_vegetables,
## yogurt} => {whole_milk} 0.001321810 0.5416667 0.002440264 2.1198932 13
## [12230] {dessert,
## root_vegetables,
## whole_milk} => {yogurt} 0.001321810 0.5416667 0.002440264 3.8828656 13
## [12231] {dessert,
## whole_milk,
## yogurt} => {root_vegetables} 0.001321810 0.2765957 0.004778851 2.5376111 13
## [12232] {dessert,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001321810 0.3823529 0.003457041 1.4963952 13
## [12233] {dessert,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001321810 0.5416667 0.002440264 2.7994176 13
## [12234] {dessert,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001321810 0.2653061 0.004982206 2.4340352 13
## [12235] {dessert,
## soda,
## yogurt} => {other_vegetables} 0.001321810 0.4333333 0.003050330 2.2395341 13
## [12236] {dessert,
## other_vegetables,
## soda} => {yogurt} 0.001321810 0.4062500 0.003253686 2.9121492 13
## [12237] {dessert,
## other_vegetables,
## yogurt} => {soda} 0.001321810 0.2888889 0.004575496 1.6566893 13
## [12238] {dessert,
## soda,
## yogurt} => {whole_milk} 0.001423488 0.4666667 0.003050330 1.8263695 14
## [12239] {dessert,
## soda,
## whole_milk} => {yogurt} 0.001423488 0.3888889 0.003660397 2.7876984 14
## [12240] {dessert,
## whole_milk,
## yogurt} => {soda} 0.001423488 0.2978723 0.004778851 1.7082067 14
## [12241] {dessert,
## rolls/buns,
## soda} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [12242] {dessert,
## soda,
## whole_milk} => {rolls/buns} 0.001016777 0.2777778 0.003660397 1.5101959 10
## [12243] {dessert,
## rolls/buns,
## whole_milk} => {soda} 0.001016777 0.4166667 0.002440264 2.3894558 10
## [12244] {dessert,
## other_vegetables,
## soda} => {whole_milk} 0.001626843 0.5000000 0.003253686 1.9568245 16
## [12245] {dessert,
## soda,
## whole_milk} => {other_vegetables} 0.001626843 0.4444444 0.003660397 2.2969580 16
## [12246] {dessert,
## other_vegetables,
## whole_milk} => {soda} 0.001626843 0.3265306 0.004982206 1.8725531 16
## [12247] {dessert,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [12248] {dessert,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001118454 0.2444444 0.004575496 1.3289724 11
## [12249] {dessert,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001118454 0.5000000 0.002236909 3.5841837 11
## [12250] {dessert,
## other_vegetables,
## yogurt} => {whole_milk} 0.002541942 0.5555556 0.004575496 2.1742495 25
## [12251] {dessert,
## whole_milk,
## yogurt} => {other_vegetables} 0.002541942 0.5319149 0.004778851 2.7490189 25
## [12252] {dessert,
## other_vegetables,
## whole_milk} => {yogurt} 0.002541942 0.5102041 0.004982206 3.6573303 25
## [12253] {canned_beer,
## sausage,
## shopping_bags} => {soda} 0.001016777 0.3846154 0.002643620 2.2056515 10
## [12254] {canned_beer,
## shopping_bags,
## soda} => {sausage} 0.001016777 0.2857143 0.003558719 3.0411255 10
## [12255] {canned_beer,
## sausage,
## soda} => {shopping_bags} 0.001016777 0.4166667 0.002440264 4.2290162 10
## [12256] {canned_beer,
## sausage,
## shopping_bags} => {rolls/buns} 0.001423488 0.5384615 0.002643620 2.9274567 14
## [12257] {canned_beer,
## rolls/buns,
## shopping_bags} => {sausage} 0.001423488 0.4375000 0.003253686 4.6567235 14
## [12258] {canned_beer,
## rolls/buns,
## sausage} => {shopping_bags} 0.001423488 0.5185185 0.002745297 5.2627757 14
## [12259] {rolls/buns,
## sausage,
## shopping_bags} => {canned_beer} 0.001423488 0.2372881 0.005998983 3.0546189 14
## [12260] {canned_beer,
## shopping_bags,
## soda} => {rolls/buns} 0.001525165 0.4285714 0.003558719 2.3300166 15
## [12261] {canned_beer,
## rolls/buns,
## shopping_bags} => {soda} 0.001525165 0.4687500 0.003253686 2.6881378 15
## [12262] {canned_beer,
## rolls/buns,
## soda} => {shopping_bags} 0.001525165 0.5000000 0.003050330 5.0748194 15
## [12263] {rolls/buns,
## shopping_bags,
## soda} => {canned_beer} 0.001525165 0.2419355 0.006304016 3.1144444 15
## [12264] {canned_beer,
## sausage,
## soda} => {rolls/buns} 0.001118454 0.4583333 0.002440264 2.4918233 11
## [12265] {canned_beer,
## rolls/buns,
## sausage} => {soda} 0.001118454 0.4074074 0.002745297 2.3363568 11
## [12266] {canned_beer,
## rolls/buns,
## soda} => {sausage} 0.001118454 0.3666667 0.003050330 3.9027778 11
## [12267] {bottled_water,
## canned_beer,
## soda} => {whole_milk} 0.001220132 0.4137931 0.002948653 1.6194410 12
## [12268] {bottled_water,
## canned_beer,
## whole_milk} => {soda} 0.001220132 0.5714286 0.002135231 3.2769679 12
## [12269] {canned_beer,
## soda,
## whole_milk} => {bottled_water} 0.001220132 0.4000000 0.003050330 3.6191352 12
## [12270] {canned_beer,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [12271] {canned_beer,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001016777 0.5000000 0.002033554 2.7183527 10
## [12272] {canned_beer,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001016777 0.4166667 0.002440264 3.8226835 10
## [12273] {canned_beer,
## soda,
## yogurt} => {rolls/buns} 0.001016777 0.4761905 0.002135231 2.5889073 10
## [12274] {canned_beer,
## rolls/buns,
## soda} => {yogurt} 0.001016777 0.3333333 0.003050330 2.3894558 10
## [12275] {canned_beer,
## rolls/buns,
## yogurt} => {soda} 0.001016777 0.5882353 0.001728521 3.3733493 10
## [12276] {canned_beer,
## soda,
## yogurt} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [12277] {canned_beer,
## other_vegetables,
## soda} => {yogurt} 0.001118454 0.4400000 0.002541942 3.1540816 11
## [12278] {canned_beer,
## other_vegetables,
## yogurt} => {soda} 0.001118454 0.5789474 0.001931876 3.3200859 11
## [12279] {beef,
## cream_cheese_,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [12280] {beef,
## cream_cheese_,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.4761905 0.002135231 6.6430260 10
## [12281] {cream_cheese_,
## whipped/sour_cream,
## whole_milk} => {beef} 0.001016777 0.2564103 0.003965430 4.8871994 10
## [12282] {beef,
## whipped/sour_cream,
## whole_milk} => {cream_cheese_} 0.001016777 0.2941176 0.003457041 7.4170437 10
## [12283] {beef,
## cream_cheese_,
## root_vegetables} => {yogurt} 0.001118454 0.6875000 0.001626843 4.9282526 11
## [12284] {beef,
## cream_cheese_,
## yogurt} => {root_vegetables} 0.001118454 0.6111111 0.001830198 5.6066024 11
## [12285] {cream_cheese_,
## root_vegetables,
## yogurt} => {beef} 0.001118454 0.2972973 0.003762074 5.6665095 11
## [12286] {beef,
## root_vegetables,
## yogurt} => {cream_cheese_} 0.001118454 0.2444444 0.004575496 6.1643875 11
## [12287] {beef,
## cream_cheese_,
## root_vegetables} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [12288] {beef,
## cream_cheese_,
## whole_milk} => {root_vegetables} 0.001220132 0.5714286 0.002135231 5.2425373 12
## [12289] {cream_cheese_,
## root_vegetables,
## whole_milk} => {beef} 0.001220132 0.3076923 0.003965430 5.8646392 12
## [12290] {beef,
## cream_cheese_,
## yogurt} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [12291] {beef,
## cream_cheese_,
## whole_milk} => {yogurt} 0.001220132 0.5714286 0.002135231 4.0962099 12
## [12292] {beef,
## whole_milk,
## yogurt} => {cream_cheese_} 0.001220132 0.2000000 0.006100661 5.0435897 12
## [12293] {cream_cheese_,
## curd,
## whipped/sour_cream} => {yogurt} 0.001321810 0.7647059 0.001728521 5.4816927 13
## [12294] {cream_cheese_,
## curd,
## yogurt} => {whipped/sour_cream} 0.001321810 0.5416667 0.002440264 7.5564421 13
## [12295] {cream_cheese_,
## whipped/sour_cream,
## yogurt} => {curd} 0.001321810 0.3939394 0.003355363 7.3938816 13
## [12296] {curd,
## whipped/sour_cream,
## yogurt} => {cream_cheese_} 0.001321810 0.2888889 0.004575496 7.2851852 13
## [12297] {cream_cheese_,
## curd,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [12298] {cream_cheese_,
## curd,
## other_vegetables} => {whipped/sour_cream} 0.001118454 0.4074074 0.002745297 5.6834778 11
## [12299] {cream_cheese_,
## other_vegetables,
## whipped/sour_cream} => {curd} 0.001118454 0.3333333 0.003355363 6.2563613 11
## [12300] {curd,
## other_vegetables,
## whipped/sour_cream} => {cream_cheese_} 0.001118454 0.2558140 0.004372140 6.4511032 11
## [12301] {cream_cheese_,
## curd,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [12302] {cream_cheese_,
## curd,
## whole_milk} => {whipped/sour_cream} 0.001321810 0.4642857 0.002846975 6.4769504 13
## [12303] {cream_cheese_,
## whipped/sour_cream,
## whole_milk} => {curd} 0.001321810 0.3333333 0.003965430 6.2563613 13
## [12304] {curd,
## whipped/sour_cream,
## whole_milk} => {cream_cheese_} 0.001321810 0.2241379 0.005897306 5.6522989 13
## [12305] {cream_cheese_,
## curd,
## root_vegetables} => {yogurt} 0.001321810 0.6500000 0.002033554 4.6594388 13
## [12306] {cream_cheese_,
## curd,
## yogurt} => {root_vegetables} 0.001321810 0.5416667 0.002440264 4.9694885 13
## [12307] {cream_cheese_,
## root_vegetables,
## yogurt} => {curd} 0.001321810 0.3513514 0.003762074 6.5945430 13
## [12308] {curd,
## root_vegetables,
## yogurt} => {cream_cheese_} 0.001321810 0.2826087 0.004677173 7.1268116 13
## [12309] {cream_cheese_,
## curd,
## root_vegetables} => {other_vegetables} 0.001728521 0.8500000 0.002033554 4.3929322 17
## [12310] {cream_cheese_,
## curd,
## other_vegetables} => {root_vegetables} 0.001728521 0.6296296 0.002745297 5.7764994 17
## [12311] {cream_cheese_,
## other_vegetables,
## root_vegetables} => {curd} 0.001728521 0.3863636 0.004473818 7.2516915 17
## [12312] {curd,
## other_vegetables,
## root_vegetables} => {cream_cheese_} 0.001728521 0.3148148 0.005490595 7.9389839 17
## [12313] {cream_cheese_,
## curd,
## root_vegetables} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [12314] {cream_cheese_,
## curd,
## whole_milk} => {root_vegetables} 0.001220132 0.4285714 0.002846975 3.9319030 12
## [12315] {cream_cheese_,
## root_vegetables,
## whole_milk} => {curd} 0.001220132 0.3076923 0.003965430 5.7751028 12
## [12316] {cream_cheese_,
## curd,
## yogurt} => {other_vegetables} 0.001728521 0.7083333 0.002440264 3.6607768 17
## [12317] {cream_cheese_,
## curd,
## other_vegetables} => {yogurt} 0.001728521 0.6296296 0.002745297 4.5134165 17
## [12318] {cream_cheese_,
## other_vegetables,
## yogurt} => {curd} 0.001728521 0.3269231 0.005287239 6.1360467 17
## [12319] {curd,
## other_vegetables,
## yogurt} => {cream_cheese_} 0.001728521 0.2833333 0.006100661 7.1450855 17
## [12320] {cream_cheese_,
## curd,
## yogurt} => {whole_milk} 0.001728521 0.7083333 0.002440264 2.7721681 17
## [12321] {cream_cheese_,
## curd,
## whole_milk} => {yogurt} 0.001728521 0.6071429 0.002846975 4.3522230 17
## [12322] {cream_cheese_,
## whole_milk,
## yogurt} => {curd} 0.001728521 0.2615385 0.006609049 4.9088373 17
## [12323] {cream_cheese_,
## curd,
## other_vegetables} => {whole_milk} 0.001728521 0.6296296 0.002745297 2.4641494 17
## [12324] {cream_cheese_,
## curd,
## whole_milk} => {other_vegetables} 0.001728521 0.6071429 0.002846975 3.1378087 17
## [12325] {cream_cheese_,
## other_vegetables,
## whole_milk} => {curd} 0.001728521 0.2575758 0.006710727 4.8344610 17
## [12326] {cream_cheese_,
## domestic_eggs,
## napkins} => {whole_milk} 0.001118454 1.0000000 0.001118454 3.9136490 11
## [12327] {cream_cheese_,
## napkins,
## whole_milk} => {domestic_eggs} 0.001118454 0.4782609 0.002338587 7.5379738 11
## [12328] {cream_cheese_,
## domestic_eggs,
## whole_milk} => {napkins} 0.001118454 0.3235294 0.003457041 6.1784694 11
## [12329] {domestic_eggs,
## napkins,
## whole_milk} => {cream_cheese_} 0.001118454 0.3333333 0.003355363 8.4059829 11
## [12330] {cream_cheese_,
## napkins,
## other_vegetables} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [12331] {cream_cheese_,
## napkins,
## whole_milk} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [12332] {cream_cheese_,
## pork,
## yogurt} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [12333] {cream_cheese_,
## pork,
## whole_milk} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [12334] {pork,
## whole_milk,
## yogurt} => {cream_cheese_} 0.001016777 0.2083333 0.004880529 5.2537393 10
## [12335] {cream_cheese_,
## other_vegetables,
## pork} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [12336] {cream_cheese_,
## pork,
## whole_milk} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [12337] {cream_cheese_,
## frankfurter,
## yogurt} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [12338] {cream_cheese_,
## frankfurter,
## whole_milk} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [12339] {cream_cheese_,
## frankfurter,
## rolls/buns} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [12340] {cream_cheese_,
## frankfurter,
## whole_milk} => {rolls/buns} 0.001016777 0.4761905 0.002135231 2.5889073 10
## [12341] {cream_cheese_,
## rolls/buns,
## whole_milk} => {frankfurter} 0.001016777 0.2777778 0.003660397 4.7102490 10
## [12342] {cream_cheese_,
## frankfurter,
## other_vegetables} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [12343] {cream_cheese_,
## frankfurter,
## whole_milk} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [12344] {brown_bread,
## cream_cheese_,
## yogurt} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [12345] {brown_bread,
## cream_cheese_,
## whole_milk} => {yogurt} 0.001118454 0.4583333 0.002440264 3.2855017 11
## [12346] {brown_bread,
## cream_cheese_,
## other_vegetables} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [12347] {brown_bread,
## cream_cheese_,
## whole_milk} => {other_vegetables} 0.001321810 0.5416667 0.002440264 2.7994176 13
## [12348] {cream_cheese_,
## margarine,
## whipped/sour_cream} => {yogurt} 0.001016777 0.8333333 0.001220132 5.9736395 10
## [12349] {cream_cheese_,
## margarine,
## yogurt} => {whipped/sour_cream} 0.001016777 0.5263158 0.001931876 7.3422919 10
## [12350] {cream_cheese_,
## whipped/sour_cream,
## yogurt} => {margarine} 0.001016777 0.3030303 0.003355363 5.1741372 10
## [12351] {margarine,
## whipped/sour_cream,
## yogurt} => {cream_cheese_} 0.001016777 0.3225806 0.003152008 8.1348222 10
## [12352] {cream_cheese_,
## margarine,
## yogurt} => {whole_milk} 0.001423488 0.7368421 0.001931876 2.8837414 14
## [12353] {cream_cheese_,
## margarine,
## whole_milk} => {yogurt} 0.001423488 0.7777778 0.001830198 5.5753968 14
## [12354] {cream_cheese_,
## whole_milk,
## yogurt} => {margarine} 0.001423488 0.2153846 0.006609049 3.6776175 14
## [12355] {margarine,
## whole_milk,
## yogurt} => {cream_cheese_} 0.001423488 0.2028986 0.007015760 5.1166852 14
## [12356] {butter,
## cream_cheese_,
## domestic_eggs} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [12357] {butter,
## cream_cheese_,
## whole_milk} => {domestic_eggs} 0.001118454 0.4074074 0.002745297 6.4212369 11
## [12358] {cream_cheese_,
## domestic_eggs,
## whole_milk} => {butter} 0.001118454 0.3235294 0.003457041 5.8383702 11
## [12359] {butter,
## cream_cheese_,
## whipped/sour_cream} => {yogurt} 0.001016777 0.7692308 0.001321810 5.5141287 10
## [12360] {butter,
## cream_cheese_,
## yogurt} => {whipped/sour_cream} 0.001016777 0.4761905 0.002135231 6.6430260 10
## [12361] {cream_cheese_,
## whipped/sour_cream,
## yogurt} => {butter} 0.001016777 0.3030303 0.003355363 5.4684459 10
## [12362] {butter,
## whipped/sour_cream,
## yogurt} => {cream_cheese_} 0.001016777 0.2631579 0.003863752 6.6363023 10
## [12363] {butter,
## cream_cheese_,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [12364] {butter,
## cream_cheese_,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.4074074 0.002745297 5.6834778 11
## [12365] {cream_cheese_,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001118454 0.2820513 0.003965430 5.0898612 11
## [12366] {butter,
## cream_cheese_,
## root_vegetables} => {yogurt} 0.001016777 0.9090909 0.001118454 6.5166976 10
## [12367] {butter,
## cream_cheese_,
## yogurt} => {root_vegetables} 0.001016777 0.4761905 0.002135231 4.3687811 10
## [12368] {cream_cheese_,
## root_vegetables,
## yogurt} => {butter} 0.001016777 0.2702703 0.003762074 4.8772626 10
## [12369] {butter,
## root_vegetables,
## yogurt} => {cream_cheese_} 0.001016777 0.2631579 0.003863752 6.6363023 10
## [12370] {butter,
## cream_cheese_,
## root_vegetables} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [12371] {butter,
## cream_cheese_,
## whole_milk} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [12372] {cream_cheese_,
## root_vegetables,
## whole_milk} => {butter} 0.001016777 0.2564103 0.003965430 4.6271466 10
## [12373] {butter,
## cream_cheese_,
## yogurt} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [12374] {butter,
## cream_cheese_,
## other_vegetables} => {yogurt} 0.001016777 0.5882353 0.001728521 4.2166867 10
## [12375] {butter,
## cream_cheese_,
## yogurt} => {whole_milk} 0.001626843 0.7619048 0.002135231 2.9818278 16
## [12376] {butter,
## cream_cheese_,
## whole_milk} => {yogurt} 0.001626843 0.5925926 0.002745297 4.2479214 16
## [12377] {cream_cheese_,
## whole_milk,
## yogurt} => {butter} 0.001626843 0.2461538 0.006609049 4.4420607 16
## [12378] {butter,
## cream_cheese_,
## other_vegetables} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [12379] {butter,
## cream_cheese_,
## whole_milk} => {other_vegetables} 0.001220132 0.4444444 0.002745297 2.2969580 12
## [12380] {cream_cheese_,
## domestic_eggs,
## fruit/vegetable_juice} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [12381] {cream_cheese_,
## domestic_eggs,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.2941176 0.003457041 4.0684206 10
## [12382] {cream_cheese_,
## fruit/vegetable_juice,
## whole_milk} => {domestic_eggs} 0.001016777 0.3448276 0.002948653 5.4349027 10
## [12383] {domestic_eggs,
## fruit/vegetable_juice,
## whole_milk} => {cream_cheese_} 0.001016777 0.2127660 0.004778851 5.3655210 10
## [12384] {cream_cheese_,
## domestic_eggs,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [12385] {cream_cheese_,
## domestic_eggs,
## other_vegetables} => {whipped/sour_cream} 0.001016777 0.3571429 0.002846975 4.9822695 10
## [12386] {cream_cheese_,
## other_vegetables,
## whipped/sour_cream} => {domestic_eggs} 0.001016777 0.3030303 0.003355363 4.7761267 10
## [12387] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {cream_cheese_} 0.001016777 0.2000000 0.005083884 5.0435897 10
## [12388] {cream_cheese_,
## domestic_eggs,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [12389] {cream_cheese_,
## domestic_eggs,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.3529412 0.003457041 4.9236546 12
## [12390] {cream_cheese_,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001220132 0.3076923 0.003965430 4.8496055 12
## [12391] {domestic_eggs,
## whipped/sour_cream,
## whole_milk} => {cream_cheese_} 0.001220132 0.2142857 0.005693950 5.4038462 12
## [12392] {cream_cheese_,
## domestic_eggs,
## pip_fruit} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [12393] {cream_cheese_,
## domestic_eggs,
## whole_milk} => {pip_fruit} 0.001118454 0.3235294 0.003457041 4.2767631 11
## [12394] {cream_cheese_,
## pip_fruit,
## whole_milk} => {domestic_eggs} 0.001118454 0.2820513 0.003965430 4.4454717 11
## [12395] {domestic_eggs,
## pip_fruit,
## whole_milk} => {cream_cheese_} 0.001118454 0.2075472 0.005388917 5.2339139 11
## [12396] {citrus_fruit,
## cream_cheese_,
## domestic_eggs} => {other_vegetables} 0.001321810 0.7222222 0.001830198 3.7325568 13
## [12397] {cream_cheese_,
## domestic_eggs,
## other_vegetables} => {citrus_fruit} 0.001321810 0.4642857 0.002846975 5.6096437 13
## [12398] {citrus_fruit,
## cream_cheese_,
## other_vegetables} => {domestic_eggs} 0.001321810 0.4482759 0.002948653 7.0653736 13
## [12399] {citrus_fruit,
## domestic_eggs,
## other_vegetables} => {cream_cheese_} 0.001321810 0.2954545 0.004473818 7.4507576 13
## [12400] {citrus_fruit,
## cream_cheese_,
## domestic_eggs} => {whole_milk} 0.001626843 0.8888889 0.001830198 3.4787991 16
## [12401] {cream_cheese_,
## domestic_eggs,
## whole_milk} => {citrus_fruit} 0.001626843 0.4705882 0.003457041 5.6857927 16
## [12402] {citrus_fruit,
## cream_cheese_,
## whole_milk} => {domestic_eggs} 0.001626843 0.5714286 0.002846975 9.0064103 16
## [12403] {citrus_fruit,
## domestic_eggs,
## whole_milk} => {cream_cheese_} 0.001626843 0.2857143 0.005693950 7.2051282 16
## [12404] {cream_cheese_,
## domestic_eggs,
## tropical_fruit} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [12405] {cream_cheese_,
## domestic_eggs,
## whole_milk} => {tropical_fruit} 0.001016777 0.2941176 0.003457041 2.8029526 10
## [12406] {cream_cheese_,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.001016777 0.3030303 0.003355363 4.7761267 10
## [12407] {cream_cheese_,
## domestic_eggs,
## root_vegetables} => {other_vegetables} 0.001220132 0.7500000 0.001626843 3.8761167 12
## [12408] {cream_cheese_,
## domestic_eggs,
## other_vegetables} => {root_vegetables} 0.001220132 0.4285714 0.002846975 3.9319030 12
## [12409] {cream_cheese_,
## other_vegetables,
## root_vegetables} => {domestic_eggs} 0.001220132 0.2727273 0.004473818 4.2985140 12
## [12410] {cream_cheese_,
## domestic_eggs,
## root_vegetables} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [12411] {cream_cheese_,
## domestic_eggs,
## whole_milk} => {root_vegetables} 0.001220132 0.3529412 0.003457041 3.2380378 12
## [12412] {cream_cheese_,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001220132 0.3076923 0.003965430 4.8496055 12
## [12413] {cream_cheese_,
## domestic_eggs,
## yogurt} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [12414] {cream_cheese_,
## domestic_eggs,
## other_vegetables} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [12415] {cream_cheese_,
## domestic_eggs,
## yogurt} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [12416] {cream_cheese_,
## domestic_eggs,
## whole_milk} => {yogurt} 0.001321810 0.3823529 0.003457041 2.7408463 13
## [12417] {cream_cheese_,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001321810 0.2000000 0.006609049 3.1522436 13
## [12418] {cream_cheese_,
## domestic_eggs,
## rolls/buns} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [12419] {cream_cheese_,
## domestic_eggs,
## whole_milk} => {rolls/buns} 0.001016777 0.2941176 0.003457041 1.5990310 10
## [12420] {cream_cheese_,
## rolls/buns,
## whole_milk} => {domestic_eggs} 0.001016777 0.2777778 0.003660397 4.3781161 10
## [12421] {cream_cheese_,
## domestic_eggs,
## other_vegetables} => {whole_milk} 0.001830198 0.6428571 0.002846975 2.5159172 18
## [12422] {cream_cheese_,
## domestic_eggs,
## whole_milk} => {other_vegetables} 0.001830198 0.5294118 0.003457041 2.7360823 18
## [12423] {cream_cheese_,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.001830198 0.2727273 0.006710727 4.2985140 18
## [12424] {cream_cheese_,
## fruit/vegetable_juice,
## pip_fruit} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [12425] {cream_cheese_,
## fruit/vegetable_juice,
## yogurt} => {pip_fruit} 0.001016777 0.4166667 0.002440264 5.5079525 10
## [12426] {cream_cheese_,
## pip_fruit,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.4000000 0.002541942 5.5330520 10
## [12427] {fruit/vegetable_juice,
## pip_fruit,
## yogurt} => {cream_cheese_} 0.001016777 0.2857143 0.003558719 7.2051282 10
## [12428] {cream_cheese_,
## fruit/vegetable_juice,
## pip_fruit} => {whole_milk} 0.001423488 0.7777778 0.001830198 3.0439492 14
## [12429] {cream_cheese_,
## fruit/vegetable_juice,
## whole_milk} => {pip_fruit} 0.001423488 0.4827586 0.002948653 6.3816277 14
## [12430] {cream_cheese_,
## pip_fruit,
## whole_milk} => {fruit/vegetable_juice} 0.001423488 0.3589744 0.003965430 4.9655595 14
## [12431] {fruit/vegetable_juice,
## pip_fruit,
## whole_milk} => {cream_cheese_} 0.001423488 0.2978723 0.004778851 7.5117294 14
## [12432] {cream_cheese_,
## fruit/vegetable_juice,
## yogurt} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [12433] {cream_cheese_,
## fruit/vegetable_juice,
## other_vegetables} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [12434] {cream_cheese_,
## fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.001626843 0.6666667 0.002440264 2.6090994 16
## [12435] {cream_cheese_,
## fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.001626843 0.5517241 0.002948653 3.9549613 16
## [12436] {cream_cheese_,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001626843 0.2461538 0.006609049 3.4049551 16
## [12437] {cream_cheese_,
## fruit/vegetable_juice,
## other_vegetables} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [12438] {cream_cheese_,
## fruit/vegetable_juice,
## whole_milk} => {other_vegetables} 0.001118454 0.3793103 0.002948653 1.9603349 11
## [12439] {cream_cheese_,
## pip_fruit,
## whipped/sour_cream} => {yogurt} 0.001016777 0.7142857 0.001423488 5.1202624 10
## [12440] {cream_cheese_,
## whipped/sour_cream,
## yogurt} => {pip_fruit} 0.001016777 0.3030303 0.003355363 4.0057836 10
## [12441] {cream_cheese_,
## pip_fruit,
## yogurt} => {whipped/sour_cream} 0.001016777 0.4000000 0.002541942 5.5801418 10
## [12442] {pip_fruit,
## whipped/sour_cream,
## yogurt} => {cream_cheese_} 0.001016777 0.2777778 0.003660397 7.0049858 10
## [12443] {cream_cheese_,
## pip_fruit,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.9285714 0.001423488 3.6341027 13
## [12444] {cream_cheese_,
## whipped/sour_cream,
## whole_milk} => {pip_fruit} 0.001321810 0.3333333 0.003965430 4.4063620 13
## [12445] {cream_cheese_,
## pip_fruit,
## whole_milk} => {whipped/sour_cream} 0.001321810 0.3333333 0.003965430 4.6501182 13
## [12446] {pip_fruit,
## whipped/sour_cream,
## whole_milk} => {cream_cheese_} 0.001321810 0.2203390 0.005998983 5.5564972 13
## [12447] {citrus_fruit,
## cream_cheese_,
## whipped/sour_cream} => {other_vegetables} 0.001321810 0.8125000 0.001626843 4.1991264 13
## [12448] {cream_cheese_,
## other_vegetables,
## whipped/sour_cream} => {citrus_fruit} 0.001321810 0.3939394 0.003355363 4.7596977 13
## [12449] {citrus_fruit,
## cream_cheese_,
## other_vegetables} => {whipped/sour_cream} 0.001321810 0.4482759 0.002948653 6.2536072 13
## [12450] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream} => {cream_cheese_} 0.001321810 0.2321429 0.005693950 5.8541667 13
## [12451] {citrus_fruit,
## cream_cheese_,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [12452] {cream_cheese_,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.001220132 0.3076923 0.003965430 3.7176337 12
## [12453] {citrus_fruit,
## cream_cheese_,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.4285714 0.002846975 5.9787234 12
## [12454] {cream_cheese_,
## sausage,
## whipped/sour_cream} => {yogurt} 0.001016777 0.7692308 0.001321810 5.5141287 10
## [12455] {cream_cheese_,
## whipped/sour_cream,
## yogurt} => {sausage} 0.001016777 0.3030303 0.003355363 3.2254362 10
## [12456] {cream_cheese_,
## sausage,
## yogurt} => {whipped/sour_cream} 0.001016777 0.4761905 0.002135231 6.6430260 10
## [12457] {sausage,
## whipped/sour_cream,
## yogurt} => {cream_cheese_} 0.001016777 0.2857143 0.003558719 7.2051282 10
## [12458] {cream_cheese_,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [12459] {cream_cheese_,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001016777 0.3030303 0.003355363 2.8878905 10
## [12460] {cream_cheese_,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3571429 0.002846975 4.9822695 10
## [12461] {cream_cheese_,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.8750000 0.001626843 4.5221361 14
## [12462] {cream_cheese_,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001423488 0.4242424 0.003355363 4.0430467 14
## [12463] {cream_cheese_,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001423488 0.4516129 0.003152008 6.3001601 14
## [12464] {cream_cheese_,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [12465] {cream_cheese_,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001016777 0.2564103 0.003965430 2.4435997 10
## [12466] {cream_cheese_,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.3030303 0.003355363 4.2273802 10
## [12467] {cream_cheese_,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001525165 0.7142857 0.002135231 5.1202624 15
## [12468] {cream_cheese_,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001525165 0.4545455 0.003355363 4.1702001 15
## [12469] {cream_cheese_,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001525165 0.4054054 0.003762074 5.6555492 15
## [12470] {root_vegetables,
## whipped/sour_cream,
## yogurt} => {cream_cheese_} 0.001525165 0.2380952 0.006405694 6.0042735 15
## [12471] {cream_cheese_,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [12472] {cream_cheese_,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001220132 0.3636364 0.003355363 3.3361601 12
## [12473] {cream_cheese_,
## other_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.001220132 0.2727273 0.004473818 3.8046422 12
## [12474] {cream_cheese_,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [12475] {cream_cheese_,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001423488 0.3589744 0.003965430 3.2933888 14
## [12476] {cream_cheese_,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001423488 0.3589744 0.003965430 5.0078196 14
## [12477] {cream_cheese_,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001728521 0.5151515 0.003355363 2.6623832 17
## [12478] {cream_cheese_,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001728521 0.5151515 0.003355363 3.6927953 17
## [12479] {cream_cheese_,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001728521 0.3269231 0.005287239 4.5606929 17
## [12480] {cream_cheese_,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.002338587 0.6969697 0.003355363 2.7276948 23
## [12481] {cream_cheese_,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.002338587 0.5897436 0.003965430 4.2274987 23
## [12482] {cream_cheese_,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.002338587 0.3538462 0.006609049 4.9362793 23
## [12483] {whipped/sour_cream,
## whole_milk,
## yogurt} => {cream_cheese_} 0.002338587 0.2149533 0.010879512 5.4206806 23
## [12484] {cream_cheese_,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.002338587 0.6969697 0.003355363 2.7276948 23
## [12485] {cream_cheese_,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.002338587 0.5897436 0.003965430 3.0478866 23
## [12486] {cream_cheese_,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.002338587 0.3484848 0.006710727 4.8614872 23
## [12487] {cream_cheese_,
## pip_fruit,
## sausage} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [12488] {cream_cheese_,
## pip_fruit,
## whole_milk} => {sausage} 0.001016777 0.2564103 0.003965430 2.7292152 10
## [12489] {cream_cheese_,
## sausage,
## whole_milk} => {pip_fruit} 0.001016777 0.3703704 0.002745297 4.8959578 10
## [12490] {cream_cheese_,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [12491] {cream_cheese_,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001016777 0.2564103 0.003965430 2.4435997 10
## [12492] {cream_cheese_,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001016777 0.3030303 0.003355363 4.0057836 10
## [12493] {cream_cheese_,
## pip_fruit,
## root_vegetables} => {yogurt} 0.001118454 0.6111111 0.001830198 4.3806689 11
## [12494] {cream_cheese_,
## pip_fruit,
## yogurt} => {root_vegetables} 0.001118454 0.4400000 0.002541942 4.0367537 11
## [12495] {cream_cheese_,
## root_vegetables,
## yogurt} => {pip_fruit} 0.001118454 0.2972973 0.003762074 3.9299985 11
## [12496] {pip_fruit,
## root_vegetables,
## yogurt} => {cream_cheese_} 0.001118454 0.2115385 0.005287239 5.3345661 11
## [12497] {cream_cheese_,
## pip_fruit,
## root_vegetables} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [12498] {cream_cheese_,
## other_vegetables,
## pip_fruit} => {root_vegetables} 0.001118454 0.4583333 0.002440264 4.2049518 11
## [12499] {cream_cheese_,
## other_vegetables,
## root_vegetables} => {pip_fruit} 0.001118454 0.2500000 0.004473818 3.3047715 11
## [12500] {cream_cheese_,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001423488 0.7777778 0.001830198 3.0439492 14
## [12501] {cream_cheese_,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001423488 0.3589744 0.003965430 3.2933888 14
## [12502] {cream_cheese_,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001423488 0.3589744 0.003965430 4.7453129 14
## [12503] {cream_cheese_,
## pip_fruit,
## yogurt} => {other_vegetables} 0.001220132 0.4800000 0.002541942 2.4807147 12
## [12504] {cream_cheese_,
## other_vegetables,
## pip_fruit} => {yogurt} 0.001220132 0.5000000 0.002440264 3.5841837 12
## [12505] {cream_cheese_,
## other_vegetables,
## yogurt} => {pip_fruit} 0.001220132 0.2307692 0.005287239 3.0505583 12
## [12506] {cream_cheese_,
## pip_fruit,
## yogurt} => {whole_milk} 0.001931876 0.7600000 0.002541942 2.9743733 19
## [12507] {cream_cheese_,
## pip_fruit,
## whole_milk} => {yogurt} 0.001931876 0.4871795 0.003965430 3.4922815 19
## [12508] {cream_cheese_,
## whole_milk,
## yogurt} => {pip_fruit} 0.001931876 0.2923077 0.006609049 3.8640405 19
## [12509] {pip_fruit,
## whole_milk,
## yogurt} => {cream_cheese_} 0.001931876 0.2021277 0.009557702 5.0972450 19
## [12510] {cream_cheese_,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001728521 0.7083333 0.002440264 2.7721681 17
## [12511] {cream_cheese_,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001728521 0.4358974 0.003965430 2.2527857 17
## [12512] {cream_cheese_,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001728521 0.2575758 0.006710727 3.4049161 17
## [12513] {cream_cheese_,
## pastry,
## yogurt} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [12514] {cream_cheese_,
## other_vegetables,
## pastry} => {yogurt} 0.001016777 0.4347826 0.002338587 3.1166815 10
## [12515] {cream_cheese_,
## pastry,
## yogurt} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [12516] {cream_cheese_,
## pastry,
## whole_milk} => {yogurt} 0.001423488 0.5833333 0.002440264 4.1815476 14
## [12517] {cream_cheese_,
## whole_milk,
## yogurt} => {pastry} 0.001423488 0.2153846 0.006609049 2.4209231 14
## [12518] {cream_cheese_,
## other_vegetables,
## pastry} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [12519] {cream_cheese_,
## pastry,
## whole_milk} => {other_vegetables} 0.001423488 0.5833333 0.002440264 3.0147574 14
## [12520] {cream_cheese_,
## other_vegetables,
## whole_milk} => {pastry} 0.001423488 0.2121212 0.006710727 2.3842424 14
## [12521] {citrus_fruit,
## cream_cheese_,
## root_vegetables} => {other_vegetables} 0.001220132 0.9230769 0.001321810 4.7706051 12
## [12522] {citrus_fruit,
## cream_cheese_,
## other_vegetables} => {root_vegetables} 0.001220132 0.4137931 0.002948653 3.7963201 12
## [12523] {cream_cheese_,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001220132 0.2727273 0.004473818 3.2951753 12
## [12524] {citrus_fruit,
## cream_cheese_,
## yogurt} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [12525] {citrus_fruit,
## cream_cheese_,
## other_vegetables} => {yogurt} 0.001118454 0.3793103 0.002948653 2.7190359 11
## [12526] {cream_cheese_,
## other_vegetables,
## yogurt} => {citrus_fruit} 0.001118454 0.2115385 0.005287239 2.5558732 11
## [12527] {citrus_fruit,
## cream_cheese_,
## yogurt} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [12528] {citrus_fruit,
## cream_cheese_,
## whole_milk} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [12529] {citrus_fruit,
## cream_cheese_,
## other_vegetables} => {whole_milk} 0.001931876 0.6551724 0.002948653 2.5641149 19
## [12530] {citrus_fruit,
## cream_cheese_,
## whole_milk} => {other_vegetables} 0.001931876 0.6785714 0.002846975 3.5069627 19
## [12531] {cream_cheese_,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001931876 0.2878788 0.006710727 3.4782406 19
## [12532] {cream_cheese_,
## sausage,
## yogurt} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [12533] {cream_cheese_,
## other_vegetables,
## sausage} => {yogurt} 0.001321810 0.5000000 0.002643620 3.5841837 13
## [12534] {cream_cheese_,
## other_vegetables,
## yogurt} => {sausage} 0.001321810 0.2500000 0.005287239 2.6609848 13
## [12535] {cream_cheese_,
## sausage,
## yogurt} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [12536] {cream_cheese_,
## sausage,
## whole_milk} => {yogurt} 0.001220132 0.4444444 0.002745297 3.1859410 12
## [12537] {cream_cheese_,
## other_vegetables,
## sausage} => {whole_milk} 0.001220132 0.4615385 0.002643620 1.8062996 12
## [12538] {cream_cheese_,
## sausage,
## whole_milk} => {other_vegetables} 0.001220132 0.4444444 0.002745297 2.2969580 12
## [12539] {bottled_water,
## cream_cheese_,
## tropical_fruit} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [12540] {bottled_water,
## cream_cheese_,
## whole_milk} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [12541] {cream_cheese_,
## tropical_fruit,
## whole_milk} => {bottled_water} 0.001016777 0.3030303 0.003355363 2.7417691 10
## [12542] {bottled_water,
## cream_cheese_,
## soda} => {yogurt} 0.001118454 0.5500000 0.002033554 3.9426020 11
## [12543] {bottled_water,
## cream_cheese_,
## yogurt} => {soda} 0.001118454 0.5500000 0.002033554 3.1540816 11
## [12544] {cream_cheese_,
## soda,
## yogurt} => {bottled_water} 0.001118454 0.4074074 0.002745297 3.6861563 11
## [12545] {cream_cheese_,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001321810 0.6500000 0.002033554 4.6594388 13
## [12546] {cream_cheese_,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001321810 0.4642857 0.002846975 4.2595616 13
## [12547] {cream_cheese_,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001321810 0.3513514 0.003762074 3.3483920 13
## [12548] {cream_cheese_,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001423488 0.7000000 0.002033554 3.6177089 14
## [12549] {cream_cheese_,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001423488 0.4516129 0.003152008 4.1432956 14
## [12550] {cream_cheese_,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001423488 0.3181818 0.004473818 3.0322851 14
## [12551] {cream_cheese_,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [12552] {cream_cheese_,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001118454 0.3333333 0.003355363 3.0581468 11
## [12553] {cream_cheese_,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001118454 0.2820513 0.003965430 2.6879597 11
## [12554] {cream_cheese_,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001728521 0.6071429 0.002846975 3.1378087 17
## [12555] {cream_cheese_,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001728521 0.5483871 0.003152008 3.9310402 17
## [12556] {cream_cheese_,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001728521 0.3269231 0.005287239 3.1155896 17
## [12557] {cream_cheese_,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001525165 0.5357143 0.002846975 2.0965977 15
## [12558] {cream_cheese_,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001525165 0.4545455 0.003355363 3.2583488 15
## [12559] {cream_cheese_,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001525165 0.2307692 0.006609049 2.1992397 15
## [12560] {cream_cheese_,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [12561] {cream_cheese_,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001321810 0.3939394 0.003355363 2.1417324 13
## [12562] {cream_cheese_,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001321810 0.3611111 0.003660397 3.4414029 13
## [12563] {cream_cheese_,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001830198 0.5806452 0.003152008 2.2724414 18
## [12564] {cream_cheese_,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001830198 0.5454545 0.003355363 2.8189939 18
## [12565] {cream_cheese_,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001830198 0.2727273 0.006710727 2.5991015 18
## [12566] {cream_cheese_,
## root_vegetables,
## yogurt} => {rolls/buns} 0.001016777 0.2702703 0.003762074 1.4693798 10
## [12567] {cream_cheese_,
## rolls/buns,
## root_vegetables} => {yogurt} 0.001016777 0.7142857 0.001423488 5.1202624 10
## [12568] {cream_cheese_,
## rolls/buns,
## yogurt} => {root_vegetables} 0.001016777 0.2564103 0.003965430 2.3524206 10
## [12569] {cream_cheese_,
## root_vegetables,
## yogurt} => {other_vegetables} 0.002135231 0.5675676 0.003762074 2.9332775 21
## [12570] {cream_cheese_,
## other_vegetables,
## root_vegetables} => {yogurt} 0.002135231 0.4772727 0.004473818 3.4212662 21
## [12571] {cream_cheese_,
## other_vegetables,
## yogurt} => {root_vegetables} 0.002135231 0.4038462 0.005287239 3.7050624 21
## [12572] {cream_cheese_,
## root_vegetables,
## yogurt} => {whole_milk} 0.002338587 0.6216216 0.003762074 2.4328089 23
## [12573] {cream_cheese_,
## root_vegetables,
## whole_milk} => {yogurt} 0.002338587 0.5897436 0.003965430 4.2274987 23
## [12574] {cream_cheese_,
## whole_milk,
## yogurt} => {root_vegetables} 0.002338587 0.3538462 0.006609049 3.2463404 23
## [12575] {cream_cheese_,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.002440264 0.5454545 0.004473818 2.1347177 24
## [12576] {cream_cheese_,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.002440264 0.6153846 0.003965430 3.1804034 24
## [12577] {cream_cheese_,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.002440264 0.3636364 0.006710727 3.3361601 24
## [12578] {cream_cheese_,
## soda,
## yogurt} => {rolls/buns} 0.001220132 0.4444444 0.002745297 2.4163135 12
## [12579] {cream_cheese_,
## rolls/buns,
## soda} => {yogurt} 0.001220132 0.6000000 0.002033554 4.3010204 12
## [12580] {cream_cheese_,
## rolls/buns,
## yogurt} => {soda} 0.001220132 0.3076923 0.003965430 1.7645212 12
## [12581] {cream_cheese_,
## soda,
## yogurt} => {other_vegetables} 0.001016777 0.3703704 0.002745297 1.9141317 10
## [12582] {cream_cheese_,
## other_vegetables,
## soda} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [12583] {cream_cheese_,
## soda,
## yogurt} => {whole_milk} 0.001321810 0.4814815 0.002745297 1.8843495 13
## [12584] {cream_cheese_,
## soda,
## whole_milk} => {yogurt} 0.001321810 0.5652174 0.002338587 4.0516859 13
## [12585] {cream_cheese_,
## whole_milk,
## yogurt} => {soda} 0.001321810 0.2000000 0.006609049 1.1469388 13
## [12586] {cream_cheese_,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001423488 0.3589744 0.003965430 1.8552353 14
## [12587] {cream_cheese_,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001423488 0.2692308 0.005287239 1.4637284 14
## [12588] {cream_cheese_,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001423488 0.4117647 0.003457041 2.9516807 14
## [12589] {cream_cheese_,
## rolls/buns,
## yogurt} => {whole_milk} 0.001931876 0.4871795 0.003965430 1.9066495 19
## [12590] {cream_cheese_,
## whole_milk,
## yogurt} => {rolls/buns} 0.001931876 0.2923077 0.006609049 1.5891908 19
## [12591] {cream_cheese_,
## rolls/buns,
## whole_milk} => {yogurt} 0.001931876 0.5277778 0.003660397 3.7833050 19
## [12592] {cream_cheese_,
## other_vegetables,
## yogurt} => {whole_milk} 0.003457041 0.6538462 0.005287239 2.5589244 34
## [12593] {cream_cheese_,
## whole_milk,
## yogurt} => {other_vegetables} 0.003457041 0.5230769 0.006609049 2.7033429 34
## [12594] {cream_cheese_,
## other_vegetables,
## whole_milk} => {yogurt} 0.003457041 0.5151515 0.006710727 3.6927953 34
## [12595] {cream_cheese_,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.001525165 0.4411765 0.003457041 1.7266099 15
## [12596] {cream_cheese_,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.001525165 0.4166667 0.003660397 2.1533981 15
## [12597] {cream_cheese_,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.001525165 0.2272727 0.006710727 1.2356149 15
## [12598] {chicken,
## frozen_vegetables,
## root_vegetables} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [12599] {chicken,
## frozen_vegetables,
## other_vegetables} => {root_vegetables} 0.001118454 0.3142857 0.003558719 2.8833955 11
## [12600] {chicken,
## frozen_vegetables,
## yogurt} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [12601] {chicken,
## frozen_vegetables,
## other_vegetables} => {yogurt} 0.001220132 0.3428571 0.003558719 2.4577259 12
## [12602] {chicken,
## other_vegetables,
## yogurt} => {frozen_vegetables} 0.001220132 0.2500000 0.004880529 5.1982030 12
## [12603] {frozen_vegetables,
## other_vegetables,
## yogurt} => {chicken} 0.001220132 0.2307692 0.005287239 5.3782355 12
## [12604] {chicken,
## frozen_vegetables,
## rolls/buns} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [12605] {chicken,
## frozen_vegetables,
## whole_milk} => {rolls/buns} 0.001016777 0.3703704 0.002745297 2.0135946 10
## [12606] {frozen_vegetables,
## rolls/buns,
## whole_milk} => {chicken} 0.001016777 0.2000000 0.005083884 4.6611374 10
## [12607] {chicken,
## frozen_vegetables,
## other_vegetables} => {whole_milk} 0.001728521 0.4857143 0.003558719 1.9009152 17
## [12608] {chicken,
## frozen_vegetables,
## whole_milk} => {other_vegetables} 0.001728521 0.6296296 0.002745297 3.2540239 17
## [12609] {chicken,
## other_vegetables,
## whole_milk} => {frozen_vegetables} 0.001728521 0.2048193 0.008439248 4.2587687 17
## [12610] {beef,
## chicken,
## root_vegetables} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [12611] {beef,
## chicken,
## whole_milk} => {root_vegetables} 0.001118454 0.4074074 0.002745297 3.7377349 11
## [12612] {beef,
## chicken,
## other_vegetables} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [12613] {beef,
## chicken,
## whole_milk} => {other_vegetables} 0.001118454 0.4074074 0.002745297 2.1055449 11
## [12614] {chicken,
## curd,
## other_vegetables} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [12615] {chicken,
## curd,
## whole_milk} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [12616] {chicken,
## napkins,
## root_vegetables} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [12617] {chicken,
## napkins,
## whole_milk} => {root_vegetables} 0.001016777 0.4545455 0.002236909 4.1702001 10
## [12618] {napkins,
## root_vegetables,
## whole_milk} => {chicken} 0.001016777 0.2083333 0.004880529 4.8553515 10
## [12619] {chicken,
## pork,
## root_vegetables} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [12620] {chicken,
## pork,
## whole_milk} => {root_vegetables} 0.001016777 0.3448276 0.002948653 3.1636001 10
## [12621] {chicken,
## pork,
## rolls/buns} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [12622] {chicken,
## other_vegetables,
## pork} => {rolls/buns} 0.001118454 0.4074074 0.002745297 2.2149540 11
## [12623] {chicken,
## other_vegetables,
## rolls/buns} => {pork} 0.001118454 0.2244898 0.004982206 3.8939279 11
## [12624] {other_vegetables,
## pork,
## rolls/buns} => {chicken} 0.001118454 0.2000000 0.005592272 4.6611374 11
## [12625] {chicken,
## pork,
## rolls/buns} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [12626] {chicken,
## pork,
## whole_milk} => {rolls/buns} 0.001118454 0.3793103 0.002948653 2.0621986 11
## [12627] {chicken,
## rolls/buns,
## whole_milk} => {pork} 0.001118454 0.2115385 0.005287239 3.6692783 11
## [12628] {chicken,
## other_vegetables,
## pork} => {whole_milk} 0.001626843 0.5925926 0.002745297 2.3191994 16
## [12629] {chicken,
## pork,
## whole_milk} => {other_vegetables} 0.001626843 0.5517241 0.002948653 2.8513962 16
## [12630] {chicken,
## frankfurter,
## root_vegetables} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [12631] {chicken,
## frankfurter,
## other_vegetables} => {root_vegetables} 0.001016777 0.5263158 0.001931876 4.8286528 10
## [12632] {frankfurter,
## other_vegetables,
## root_vegetables} => {chicken} 0.001016777 0.2564103 0.003965430 5.9758172 10
## [12633] {chicken,
## frankfurter,
## root_vegetables} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [12634] {chicken,
## frankfurter,
## whole_milk} => {root_vegetables} 0.001016777 0.5882353 0.001728521 5.3967296 10
## [12635] {frankfurter,
## root_vegetables,
## whole_milk} => {chicken} 0.001016777 0.2000000 0.005083884 4.6611374 10
## [12636] {chicken,
## margarine,
## rolls/buns} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [12637] {chicken,
## margarine,
## whole_milk} => {rolls/buns} 0.001118454 0.5238095 0.002135231 2.8477980 11
## [12638] {chicken,
## rolls/buns,
## whole_milk} => {margarine} 0.001118454 0.2115385 0.005287239 3.6119458 11
## [12639] {chicken,
## margarine,
## other_vegetables} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [12640] {chicken,
## margarine,
## whole_milk} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [12641] {butter,
## chicken,
## domestic_eggs} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [12642] {butter,
## chicken,
## whole_milk} => {domestic_eggs} 0.001220132 0.3750000 0.003253686 5.9104567 12
## [12643] {chicken,
## domestic_eggs,
## whole_milk} => {butter} 0.001220132 0.3076923 0.003965430 5.5525759 12
## [12644] {butter,
## domestic_eggs,
## whole_milk} => {chicken} 0.001220132 0.2033898 0.005998983 4.7401398 12
## [12645] {butter,
## chicken,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [12646] {butter,
## chicken,
## other_vegetables} => {whipped/sour_cream} 0.001016777 0.3333333 0.003050330 4.6501182 10
## [12647] {chicken,
## other_vegetables,
## whipped/sour_cream} => {butter} 0.001016777 0.2631579 0.003863752 4.7489136 10
## [12648] {butter,
## chicken,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.8000000 0.001525165 3.1309192 12
## [12649] {butter,
## chicken,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.3750000 0.003253686 5.2313830 12
## [12650] {chicken,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001220132 0.2926829 0.004168785 5.2817185 12
## [12651] {butter,
## chicken,
## sausage} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [12652] {butter,
## chicken,
## whole_milk} => {sausage} 0.001118454 0.3437500 0.003253686 3.6588542 11
## [12653] {chicken,
## sausage,
## whole_milk} => {butter} 0.001118454 0.3666667 0.003050330 6.6168196 11
## [12654] {butter,
## sausage,
## whole_milk} => {chicken} 0.001118454 0.2340426 0.004778851 5.4545225 11
## [12655] {butter,
## chicken,
## root_vegetables} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [12656] {butter,
## chicken,
## other_vegetables} => {root_vegetables} 0.001321810 0.4333333 0.003050330 3.9755908 13
## [12657] {chicken,
## other_vegetables,
## root_vegetables} => {butter} 0.001321810 0.2321429 0.005693950 4.1892202 13
## [12658] {butter,
## other_vegetables,
## root_vegetables} => {chicken} 0.001321810 0.2000000 0.006609049 4.6611374 13
## [12659] {butter,
## chicken,
## root_vegetables} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [12660] {butter,
## chicken,
## whole_milk} => {root_vegetables} 0.001525165 0.4687500 0.003253686 4.3005189 15
## [12661] {chicken,
## root_vegetables,
## whole_milk} => {butter} 0.001525165 0.2542373 0.005998983 4.5879334 15
## [12662] {butter,
## chicken,
## yogurt} => {other_vegetables} 0.001423488 0.7368421 0.001931876 3.8081146 14
## [12663] {butter,
## chicken,
## other_vegetables} => {yogurt} 0.001423488 0.4666667 0.003050330 3.3452381 14
## [12664] {chicken,
## other_vegetables,
## yogurt} => {butter} 0.001423488 0.2916667 0.004880529 5.2633792 14
## [12665] {butter,
## other_vegetables,
## yogurt} => {chicken} 0.001423488 0.2222222 0.006405694 5.1790416 14
## [12666] {butter,
## chicken,
## yogurt} => {whole_milk} 0.001423488 0.7368421 0.001931876 2.8837414 14
## [12667] {butter,
## chicken,
## whole_milk} => {yogurt} 0.001423488 0.4375000 0.003253686 3.1361607 14
## [12668] {chicken,
## whole_milk,
## yogurt} => {butter} 0.001423488 0.3589744 0.003965430 6.4780052 14
## [12669] {butter,
## chicken,
## rolls/buns} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [12670] {butter,
## chicken,
## other_vegetables} => {rolls/buns} 0.001016777 0.3333333 0.003050330 1.8122351 10
## [12671] {chicken,
## other_vegetables,
## rolls/buns} => {butter} 0.001016777 0.2040816 0.004982206 3.6828309 10
## [12672] {butter,
## chicken,
## other_vegetables} => {whole_milk} 0.001728521 0.5666667 0.003050330 2.2177344 17
## [12673] {butter,
## chicken,
## whole_milk} => {other_vegetables} 0.001728521 0.5312500 0.003253686 2.7455826 17
## [12674] {chicken,
## other_vegetables,
## whole_milk} => {butter} 0.001728521 0.2048193 0.008439248 3.6961424 17
## [12675] {chicken,
## citrus_fruit,
## domestic_eggs} => {root_vegetables} 0.001016777 0.5000000 0.002033554 4.5872201 10
## [12676] {chicken,
## domestic_eggs,
## root_vegetables} => {citrus_fruit} 0.001016777 0.4166667 0.002440264 5.0342957 10
## [12677] {chicken,
## citrus_fruit,
## root_vegetables} => {domestic_eggs} 0.001016777 0.3333333 0.003050330 5.2537393 10
## [12678] {citrus_fruit,
## domestic_eggs,
## root_vegetables} => {chicken} 0.001016777 0.4166667 0.002440264 9.7107030 10
## [12679] {chicken,
## citrus_fruit,
## domestic_eggs} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [12680] {chicken,
## domestic_eggs,
## yogurt} => {citrus_fruit} 0.001016777 0.5000000 0.002033554 6.0411548 10
## [12681] {chicken,
## citrus_fruit,
## yogurt} => {domestic_eggs} 0.001016777 0.3703704 0.002745297 5.8374881 10
## [12682] {citrus_fruit,
## domestic_eggs,
## yogurt} => {chicken} 0.001016777 0.3448276 0.002948653 8.0364439 10
## [12683] {chicken,
## citrus_fruit,
## domestic_eggs} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [12684] {chicken,
## domestic_eggs,
## other_vegetables} => {citrus_fruit} 0.001118454 0.3333333 0.003355363 4.0274365 11
## [12685] {chicken,
## citrus_fruit,
## other_vegetables} => {domestic_eggs} 0.001118454 0.3142857 0.003558719 4.9535256 11
## [12686] {citrus_fruit,
## domestic_eggs,
## other_vegetables} => {chicken} 0.001118454 0.2500000 0.004473818 5.8264218 11
## [12687] {chicken,
## citrus_fruit,
## domestic_eggs} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [12688] {chicken,
## domestic_eggs,
## whole_milk} => {citrus_fruit} 0.001016777 0.2564103 0.003965430 3.0980281 10
## [12689] {chicken,
## citrus_fruit,
## whole_milk} => {domestic_eggs} 0.001016777 0.3225806 0.003152008 5.0842639 10
## [12690] {chicken,
## domestic_eggs,
## sausage} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [12691] {chicken,
## domestic_eggs,
## whole_milk} => {sausage} 0.001220132 0.3076923 0.003965430 3.2750583 12
## [12692] {chicken,
## sausage,
## whole_milk} => {domestic_eggs} 0.001220132 0.4000000 0.003050330 6.3044872 12
## [12693] {domestic_eggs,
## sausage,
## whole_milk} => {chicken} 0.001220132 0.2727273 0.004473818 6.3560965 12
## [12694] {chicken,
## domestic_eggs,
## tropical_fruit} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [12695] {chicken,
## domestic_eggs,
## other_vegetables} => {tropical_fruit} 0.001016777 0.3030303 0.003355363 2.8878905 10
## [12696] {chicken,
## other_vegetables,
## tropical_fruit} => {domestic_eggs} 0.001016777 0.2777778 0.003660397 4.3781161 10
## [12697] {domestic_eggs,
## other_vegetables,
## tropical_fruit} => {chicken} 0.001016777 0.2127660 0.004778851 4.9586569 10
## [12698] {chicken,
## domestic_eggs,
## tropical_fruit} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [12699] {chicken,
## domestic_eggs,
## whole_milk} => {tropical_fruit} 0.001016777 0.2564103 0.003965430 2.4435997 10
## [12700] {chicken,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.001016777 0.3571429 0.002846975 5.6290064 10
## [12701] {chicken,
## domestic_eggs,
## root_vegetables} => {other_vegetables} 0.001525165 0.6250000 0.002440264 3.2300972 15
## [12702] {chicken,
## domestic_eggs,
## other_vegetables} => {root_vegetables} 0.001525165 0.4545455 0.003355363 4.1702001 15
## [12703] {chicken,
## other_vegetables,
## root_vegetables} => {domestic_eggs} 0.001525165 0.2678571 0.005693950 4.2217548 15
## [12704] {domestic_eggs,
## other_vegetables,
## root_vegetables} => {chicken} 0.001525165 0.2083333 0.007320793 4.8553515 15
## [12705] {chicken,
## domestic_eggs,
## root_vegetables} => {whole_milk} 0.001830198 0.7500000 0.002440264 2.9352368 18
## [12706] {chicken,
## domestic_eggs,
## whole_milk} => {root_vegetables} 0.001830198 0.4615385 0.003965430 4.2343571 18
## [12707] {chicken,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001830198 0.3050847 0.005998983 4.8085072 18
## [12708] {domestic_eggs,
## root_vegetables,
## whole_milk} => {chicken} 0.001830198 0.2142857 0.008540925 4.9940758 18
## [12709] {chicken,
## domestic_eggs,
## yogurt} => {other_vegetables} 0.001321810 0.6500000 0.002033554 3.3593011 13
## [12710] {chicken,
## domestic_eggs,
## other_vegetables} => {yogurt} 0.001321810 0.3939394 0.003355363 2.8239023 13
## [12711] {chicken,
## other_vegetables,
## yogurt} => {domestic_eggs} 0.001321810 0.2708333 0.004880529 4.2686632 13
## [12712] {domestic_eggs,
## other_vegetables,
## yogurt} => {chicken} 0.001321810 0.2280702 0.005795628 5.3153322 13
## [12713] {chicken,
## domestic_eggs,
## yogurt} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [12714] {chicken,
## domestic_eggs,
## whole_milk} => {yogurt} 0.001220132 0.3076923 0.003965430 2.2056515 12
## [12715] {chicken,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001220132 0.3076923 0.003965430 4.8496055 12
## [12716] {chicken,
## domestic_eggs,
## rolls/buns} => {other_vegetables} 0.001423488 0.7000000 0.002033554 3.6177089 14
## [12717] {chicken,
## domestic_eggs,
## other_vegetables} => {rolls/buns} 0.001423488 0.4242424 0.003355363 2.3064811 14
## [12718] {chicken,
## other_vegetables,
## rolls/buns} => {domestic_eggs} 0.001423488 0.2857143 0.004982206 4.5032051 14
## [12719] {domestic_eggs,
## other_vegetables,
## rolls/buns} => {chicken} 0.001423488 0.2413793 0.005897306 5.6255107 14
## [12720] {chicken,
## domestic_eggs,
## rolls/buns} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [12721] {chicken,
## domestic_eggs,
## whole_milk} => {rolls/buns} 0.001321810 0.3333333 0.003965430 1.8122351 13
## [12722] {chicken,
## rolls/buns,
## whole_milk} => {domestic_eggs} 0.001321810 0.2500000 0.005287239 3.9403045 13
## [12723] {domestic_eggs,
## rolls/buns,
## whole_milk} => {chicken} 0.001321810 0.2000000 0.006609049 4.6611374 13
## [12724] {chicken,
## domestic_eggs,
## other_vegetables} => {whole_milk} 0.002440264 0.7272727 0.003355363 2.8462902 24
## [12725] {chicken,
## domestic_eggs,
## whole_milk} => {other_vegetables} 0.002440264 0.6153846 0.003965430 3.1804034 24
## [12726] {chicken,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.002440264 0.2891566 0.008439248 4.5574606 24
## [12727] {chicken,
## fruit/vegetable_juice,
## root_vegetables} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [12728] {chicken,
## fruit/vegetable_juice,
## other_vegetables} => {root_vegetables} 0.001016777 0.5263158 0.001931876 4.8286528 10
## [12729] {chicken,
## fruit/vegetable_juice,
## yogurt} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [12730] {chicken,
## fruit/vegetable_juice,
## other_vegetables} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [12731] {chicken,
## other_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.2083333 0.004880529 2.8817979 10
## [12732] {chicken,
## pip_fruit,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [12733] {chicken,
## whipped/sour_cream,
## whole_milk} => {pip_fruit} 0.001118454 0.2682927 0.004168785 3.5465841 11
## [12734] {chicken,
## pip_fruit,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.4400000 0.002541942 6.1381560 11
## [12735] {chicken,
## citrus_fruit,
## whipped/sour_cream} => {yogurt} 0.001016777 0.6666667 0.001525165 4.7789116 10
## [12736] {chicken,
## whipped/sour_cream,
## yogurt} => {citrus_fruit} 0.001016777 0.4166667 0.002440264 5.0342957 10
## [12737] {chicken,
## citrus_fruit,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3703704 0.002745297 5.1667980 10
## [12738] {citrus_fruit,
## whipped/sour_cream,
## yogurt} => {chicken} 0.001016777 0.2222222 0.004575496 5.1790416 10
## [12739] {chicken,
## sausage,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [12740] {chicken,
## other_vegetables,
## whipped/sour_cream} => {sausage} 0.001118454 0.2894737 0.003863752 3.0811404 11
## [12741] {chicken,
## other_vegetables,
## sausage} => {whipped/sour_cream} 0.001118454 0.3548387 0.003152008 4.9501258 11
## [12742] {other_vegetables,
## sausage,
## whipped/sour_cream} => {chicken} 0.001118454 0.2291667 0.004880529 5.3408867 11
## [12743] {chicken,
## sausage,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [12744] {chicken,
## whipped/sour_cream,
## whole_milk} => {sausage} 0.001220132 0.2926829 0.004168785 3.1152993 12
## [12745] {chicken,
## sausage,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.4000000 0.003050330 5.5801418 12
## [12746] {sausage,
## whipped/sour_cream,
## whole_milk} => {chicken} 0.001220132 0.2400000 0.005083884 5.5933649 12
## [12747] {chicken,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [12748] {chicken,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001016777 0.4166667 0.002440264 3.8226835 10
## [12749] {chicken,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3333333 0.003050330 4.6501182 10
## [12750] {chicken,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [12751] {chicken,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001321810 0.3421053 0.003863752 3.1386243 13
## [12752] {chicken,
## other_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.001321810 0.2321429 0.005693950 3.2384752 13
## [12753] {chicken,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [12754] {chicken,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001423488 0.3414634 0.004168785 3.1327357 14
## [12755] {chicken,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001423488 0.2372881 0.005998983 3.3102536 14
## [12756] {chicken,
## soda,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [12757] {chicken,
## whipped/sour_cream,
## whole_milk} => {soda} 0.001118454 0.2682927 0.004168785 1.5385764 11
## [12758] {chicken,
## soda,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.3142857 0.003558719 4.3843972 11
## [12759] {soda,
## whipped/sour_cream,
## whole_milk} => {chicken} 0.001118454 0.2037037 0.005490595 4.7474548 11
## [12760] {chicken,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001423488 0.5833333 0.002440264 3.0147574 14
## [12761] {chicken,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001423488 0.3684211 0.003863752 2.6409774 14
## [12762] {chicken,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001423488 0.2916667 0.004880529 4.0688534 14
## [12763] {chicken,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [12764] {chicken,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.2682927 0.004168785 1.9232205 11
## [12765] {chicken,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.2820513 0.003965430 3.9347154 11
## [12766] {chicken,
## rolls/buns,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.6666667 0.002135231 3.4454370 14
## [12767] {chicken,
## other_vegetables,
## whipped/sour_cream} => {rolls/buns} 0.001423488 0.3684211 0.003863752 2.0029967 14
## [12768] {chicken,
## other_vegetables,
## rolls/buns} => {whipped/sour_cream} 0.001423488 0.2857143 0.004982206 3.9858156 14
## [12769] {other_vegetables,
## rolls/buns,
## whipped/sour_cream} => {chicken} 0.001423488 0.2121212 0.006710727 4.9436306 14
## [12770] {chicken,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.001626843 0.7619048 0.002135231 2.9818278 16
## [12771] {chicken,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001626843 0.3902439 0.004168785 2.1216411 16
## [12772] {chicken,
## rolls/buns,
## whole_milk} => {whipped/sour_cream} 0.001626843 0.3076923 0.005287239 4.2924168 16
## [12773] {rolls/buns,
## whipped/sour_cream,
## whole_milk} => {chicken} 0.001626843 0.2077922 0.007829181 4.8427402 16
## [12774] {chicken,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.002338587 0.6052632 0.003863752 2.3687876 23
## [12775] {chicken,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.002338587 0.5609756 0.004168785 2.8992092 23
## [12776] {chicken,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.002338587 0.2771084 0.008439248 3.8657609 23
## [12777] {chicken,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001423488 0.7777778 0.001830198 4.0196765 14
## [12778] {chicken,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001423488 0.5000000 0.002846975 4.7650194 14
## [12779] {chicken,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001423488 0.3888889 0.003660397 5.1407557 14
## [12780] {chicken,
## pip_fruit,
## root_vegetables} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [12781] {chicken,
## other_vegetables,
## pip_fruit} => {root_vegetables} 0.001118454 0.3928571 0.002846975 3.6042444 11
## [12782] {chicken,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [12783] {chicken,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001118454 0.4400000 0.002541942 4.0367537 11
## [12784] {chicken,
## pip_fruit,
## yogurt} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [12785] {chicken,
## other_vegetables,
## pip_fruit} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [12786] {chicken,
## other_vegetables,
## yogurt} => {pip_fruit} 0.001016777 0.2083333 0.004880529 2.7539763 10
## [12787] {chicken,
## pip_fruit,
## rolls/buns} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [12788] {chicken,
## other_vegetables,
## pip_fruit} => {rolls/buns} 0.001016777 0.3571429 0.002846975 1.9416805 10
## [12789] {chicken,
## other_vegetables,
## rolls/buns} => {pip_fruit} 0.001016777 0.2040816 0.004982206 2.6977727 10
## [12790] {other_vegetables,
## pip_fruit,
## rolls/buns} => {chicken} 0.001016777 0.2000000 0.005083884 4.6611374 10
## [12791] {chicken,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001626843 0.5714286 0.002846975 2.2363709 16
## [12792] {chicken,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001626843 0.6400000 0.002541942 3.3076195 16
## [12793] {chicken,
## pastry,
## tropical_fruit} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [12794] {chicken,
## other_vegetables,
## pastry} => {tropical_fruit} 0.001016777 0.3846154 0.002643620 3.6653995 10
## [12795] {chicken,
## other_vegetables,
## tropical_fruit} => {pastry} 0.001016777 0.2777778 0.003660397 3.1222222 10
## [12796] {other_vegetables,
## pastry,
## tropical_fruit} => {chicken} 0.001016777 0.2000000 0.005083884 4.6611374 10
## [12797] {chicken,
## pastry,
## root_vegetables} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [12798] {chicken,
## other_vegetables,
## pastry} => {root_vegetables} 0.001016777 0.3846154 0.002643620 3.5286309 10
## [12799] {chicken,
## pastry,
## yogurt} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [12800] {chicken,
## other_vegetables,
## pastry} => {yogurt} 0.001118454 0.4230769 0.002643620 3.0327708 11
## [12801] {chicken,
## other_vegetables,
## yogurt} => {pastry} 0.001118454 0.2291667 0.004880529 2.5758333 11
## [12802] {chicken,
## other_vegetables,
## pastry} => {whole_milk} 0.001423488 0.5384615 0.002643620 2.1073495 14
## [12803] {chicken,
## pastry,
## whole_milk} => {other_vegetables} 0.001423488 0.5185185 0.002745297 2.6797844 14
## [12804] {chicken,
## citrus_fruit,
## sausage} => {root_vegetables} 0.001016777 0.7692308 0.001321810 7.0572618 10
## [12805] {chicken,
## citrus_fruit,
## root_vegetables} => {sausage} 0.001016777 0.3333333 0.003050330 3.5479798 10
## [12806] {chicken,
## root_vegetables,
## sausage} => {citrus_fruit} 0.001016777 0.4545455 0.002236909 5.4919589 10
## [12807] {citrus_fruit,
## root_vegetables,
## sausage} => {chicken} 0.001016777 0.3448276 0.002948653 8.0364439 10
## [12808] {chicken,
## citrus_fruit,
## tropical_fruit} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [12809] {chicken,
## citrus_fruit,
## other_vegetables} => {tropical_fruit} 0.001118454 0.3142857 0.003558719 2.9951550 11
## [12810] {chicken,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001118454 0.3055556 0.003660397 3.6918168 11
## [12811] {chicken,
## citrus_fruit,
## tropical_fruit} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [12812] {chicken,
## citrus_fruit,
## whole_milk} => {tropical_fruit} 0.001220132 0.3870968 0.003152008 3.6890473 12
## [12813] {chicken,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001220132 0.4285714 0.002846975 5.1781327 12
## [12814] {chicken,
## citrus_fruit,
## root_vegetables} => {other_vegetables} 0.001830198 0.6000000 0.003050330 3.1008933 18
## [12815] {chicken,
## citrus_fruit,
## other_vegetables} => {root_vegetables} 0.001830198 0.5142857 0.003558719 4.7182836 18
## [12816] {chicken,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001830198 0.3214286 0.005693950 3.8835995 18
## [12817] {chicken,
## citrus_fruit,
## root_vegetables} => {whole_milk} 0.001423488 0.4666667 0.003050330 1.8263695 14
## [12818] {chicken,
## citrus_fruit,
## whole_milk} => {root_vegetables} 0.001423488 0.4516129 0.003152008 4.1432956 14
## [12819] {chicken,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001423488 0.2372881 0.005998983 2.8669887 14
## [12820] {chicken,
## citrus_fruit,
## yogurt} => {rolls/buns} 0.001220132 0.4444444 0.002745297 2.4163135 12
## [12821] {chicken,
## citrus_fruit,
## rolls/buns} => {yogurt} 0.001220132 0.6000000 0.002033554 4.3010204 12
## [12822] {chicken,
## rolls/buns,
## yogurt} => {citrus_fruit} 0.001220132 0.4444444 0.002745297 5.3699154 12
## [12823] {citrus_fruit,
## rolls/buns,
## yogurt} => {chicken} 0.001220132 0.2105263 0.005795628 4.9064605 12
## [12824] {chicken,
## citrus_fruit,
## yogurt} => {other_vegetables} 0.001321810 0.4814815 0.002745297 2.4883712 13
## [12825] {chicken,
## citrus_fruit,
## other_vegetables} => {yogurt} 0.001321810 0.3714286 0.003558719 2.6625364 13
## [12826] {chicken,
## other_vegetables,
## yogurt} => {citrus_fruit} 0.001321810 0.2708333 0.004880529 3.2722922 13
## [12827] {chicken,
## citrus_fruit,
## yogurt} => {whole_milk} 0.001423488 0.5185185 0.002745297 2.0292995 14
## [12828] {chicken,
## citrus_fruit,
## whole_milk} => {yogurt} 0.001423488 0.4516129 0.003152008 3.2373272 14
## [12829] {chicken,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001423488 0.3589744 0.003965430 4.3372393 14
## [12830] {chicken,
## citrus_fruit,
## rolls/buns} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [12831] {chicken,
## citrus_fruit,
## other_vegetables} => {rolls/buns} 0.001118454 0.3142857 0.003558719 1.7086788 11
## [12832] {chicken,
## other_vegetables,
## rolls/buns} => {citrus_fruit} 0.001118454 0.2244898 0.004982206 2.7123552 11
## [12833] {chicken,
## citrus_fruit,
## rolls/buns} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [12834] {chicken,
## citrus_fruit,
## whole_milk} => {rolls/buns} 0.001118454 0.3548387 0.003152008 1.9291535 11
## [12835] {chicken,
## rolls/buns,
## whole_milk} => {citrus_fruit} 0.001118454 0.2115385 0.005287239 2.5558732 11
## [12836] {chicken,
## citrus_fruit,
## other_vegetables} => {whole_milk} 0.001728521 0.4857143 0.003558719 1.9009152 17
## [12837] {chicken,
## citrus_fruit,
## whole_milk} => {other_vegetables} 0.001728521 0.5483871 0.003152008 2.8341498 17
## [12838] {chicken,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001728521 0.2048193 0.008439248 2.4746899 17
## [12839] {chicken,
## root_vegetables,
## shopping_bags} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [12840] {chicken,
## other_vegetables,
## shopping_bags} => {root_vegetables} 0.001016777 0.4545455 0.002236909 4.1702001 10
## [12841] {chicken,
## root_vegetables,
## sausage} => {yogurt} 0.001016777 0.4545455 0.002236909 3.2583488 10
## [12842] {chicken,
## sausage,
## yogurt} => {root_vegetables} 0.001016777 0.5882353 0.001728521 5.3967296 10
## [12843] {chicken,
## root_vegetables,
## yogurt} => {sausage} 0.001016777 0.3333333 0.003050330 3.5479798 10
## [12844] {chicken,
## root_vegetables,
## sausage} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [12845] {chicken,
## other_vegetables,
## sausage} => {root_vegetables} 0.001220132 0.3870968 0.003152008 3.5513962 12
## [12846] {chicken,
## other_vegetables,
## root_vegetables} => {sausage} 0.001220132 0.2142857 0.005693950 2.2808442 12
## [12847] {chicken,
## root_vegetables,
## sausage} => {whole_milk} 0.001321810 0.5909091 0.002236909 2.3126108 13
## [12848] {chicken,
## sausage,
## whole_milk} => {root_vegetables} 0.001321810 0.4333333 0.003050330 3.9755908 13
## [12849] {chicken,
## root_vegetables,
## whole_milk} => {sausage} 0.001321810 0.2203390 0.005998983 2.3452748 13
## [12850] {chicken,
## sausage,
## soda} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [12851] {chicken,
## other_vegetables,
## sausage} => {soda} 0.001016777 0.3225806 0.003152008 1.8499013 10
## [12852] {chicken,
## other_vegetables,
## soda} => {sausage} 0.001016777 0.3333333 0.003050330 3.5479798 10
## [12853] {chicken,
## sausage,
## yogurt} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [12854] {chicken,
## other_vegetables,
## sausage} => {yogurt} 0.001220132 0.3870968 0.003152008 2.7748519 12
## [12855] {chicken,
## other_vegetables,
## yogurt} => {sausage} 0.001220132 0.2500000 0.004880529 2.6609848 12
## [12856] {chicken,
## rolls/buns,
## sausage} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [12857] {chicken,
## other_vegetables,
## sausage} => {rolls/buns} 0.001118454 0.3548387 0.003152008 1.9291535 11
## [12858] {chicken,
## other_vegetables,
## rolls/buns} => {sausage} 0.001118454 0.2244898 0.004982206 2.3894558 11
## [12859] {chicken,
## rolls/buns,
## sausage} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [12860] {chicken,
## sausage,
## whole_milk} => {rolls/buns} 0.001118454 0.3666667 0.003050330 1.9934586 11
## [12861] {chicken,
## rolls/buns,
## whole_milk} => {sausage} 0.001118454 0.2115385 0.005287239 2.2516026 11
## [12862] {chicken,
## other_vegetables,
## sausage} => {whole_milk} 0.001728521 0.5483871 0.003152008 2.1461946 17
## [12863] {chicken,
## sausage,
## whole_milk} => {other_vegetables} 0.001728521 0.5666667 0.003050330 2.9286215 17
## [12864] {chicken,
## other_vegetables,
## whole_milk} => {sausage} 0.001728521 0.2048193 0.008439248 2.1800840 17
## [12865] {chicken,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001016777 0.4347826 0.002338587 3.1166815 10
## [12866] {chicken,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001016777 0.4761905 0.002135231 4.3687811 10
## [12867] {chicken,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001016777 0.3333333 0.003050330 3.1766796 10
## [12868] {chicken,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001830198 0.7826087 0.002338587 4.0446435 18
## [12869] {chicken,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001830198 0.5000000 0.003660397 4.5872201 18
## [12870] {chicken,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001830198 0.3214286 0.005693950 3.0632267 18
## [12871] {chicken,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001525165 0.6521739 0.002338587 2.5523798 15
## [12872] {chicken,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001525165 0.5357143 0.002846975 4.9148787 15
## [12873] {chicken,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001525165 0.2542373 0.005998983 2.4228912 15
## [12874] {chicken,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001525165 0.7142857 0.002135231 3.6915397 15
## [12875] {chicken,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001525165 0.4166667 0.003660397 2.9868197 15
## [12876] {chicken,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001525165 0.3125000 0.004880529 2.9781371 15
## [12877] {chicken,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [12878] {chicken,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.3928571 0.002846975 2.8161443 11
## [12879] {chicken,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.2820513 0.003965430 2.6879597 11
## [12880] {chicken,
## rolls/buns,
## tropical_fruit} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [12881] {chicken,
## other_vegetables,
## tropical_fruit} => {rolls/buns} 0.001118454 0.3055556 0.003660397 1.6612155 11
## [12882] {chicken,
## other_vegetables,
## rolls/buns} => {tropical_fruit} 0.001118454 0.2244898 0.004982206 2.1393965 11
## [12883] {chicken,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001626843 0.4444444 0.003660397 1.7393996 16
## [12884] {chicken,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001626843 0.5714286 0.002846975 2.9532317 16
## [12885] {chicken,
## root_vegetables,
## soda} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [12886] {chicken,
## other_vegetables,
## soda} => {root_vegetables} 0.001118454 0.3666667 0.003050330 3.3639614 11
## [12887] {chicken,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001931876 0.6333333 0.003050330 3.2731652 19
## [12888] {chicken,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001931876 0.3392857 0.005693950 2.4321246 19
## [12889] {chicken,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001931876 0.3958333 0.004880529 3.6315493 19
## [12890] {chicken,
## root_vegetables,
## yogurt} => {whole_milk} 0.001830198 0.6000000 0.003050330 2.3481894 18
## [12891] {chicken,
## root_vegetables,
## whole_milk} => {yogurt} 0.001830198 0.3050847 0.005998983 2.1869595 18
## [12892] {chicken,
## whole_milk,
## yogurt} => {root_vegetables} 0.001830198 0.4615385 0.003965430 4.2343571 18
## [12893] {chicken,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001728521 0.6800000 0.002541942 3.5143458 17
## [12894] {chicken,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001728521 0.3035714 0.005693950 1.6504284 17
## [12895] {chicken,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001728521 0.3469388 0.004982206 3.1829691 17
## [12896] {chicken,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001728521 0.6800000 0.002541942 2.6612813 17
## [12897] {chicken,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001728521 0.2881356 0.005998983 1.5665083 17
## [12898] {chicken,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001728521 0.3269231 0.005287239 2.9993363 17
## [12899] {chicken,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.002948653 0.5178571 0.005693950 2.0267111 29
## [12900] {chicken,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.002948653 0.4915254 0.005998983 2.5402798 29
## [12901] {chicken,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.002948653 0.3493976 0.008439248 3.2055273 29
## [12902] {chicken,
## rolls/buns,
## soda} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [12903] {chicken,
## other_vegetables,
## soda} => {rolls/buns} 0.001220132 0.4000000 0.003050330 2.1746821 12
## [12904] {chicken,
## other_vegetables,
## rolls/buns} => {soda} 0.001220132 0.2448980 0.004982206 1.4044148 12
## [12905] {chicken,
## rolls/buns,
## soda} => {whole_milk} 0.001525165 0.6818182 0.002236909 2.6683971 15
## [12906] {chicken,
## soda,
## whole_milk} => {rolls/buns} 0.001525165 0.4285714 0.003558719 2.3300166 15
## [12907] {chicken,
## rolls/buns,
## whole_milk} => {soda} 0.001525165 0.2884615 0.005287239 1.6542386 15
## [12908] {chicken,
## other_vegetables,
## soda} => {whole_milk} 0.001525165 0.5000000 0.003050330 1.9568245 15
## [12909] {chicken,
## soda,
## whole_milk} => {other_vegetables} 0.001525165 0.4285714 0.003558719 2.2149238 15
## [12910] {chicken,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001728521 0.6296296 0.002745297 3.2540239 17
## [12911] {chicken,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001728521 0.3541667 0.004880529 1.9254998 17
## [12912] {chicken,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001728521 0.3469388 0.004982206 2.4869846 17
## [12913] {chicken,
## rolls/buns,
## yogurt} => {whole_milk} 0.001321810 0.4814815 0.002745297 1.8843495 13
## [12914] {chicken,
## whole_milk,
## yogurt} => {rolls/buns} 0.001321810 0.3333333 0.003965430 1.8122351 13
## [12915] {chicken,
## rolls/buns,
## whole_milk} => {yogurt} 0.001321810 0.2500000 0.005287239 1.7920918 13
## [12916] {chicken,
## other_vegetables,
## yogurt} => {whole_milk} 0.002541942 0.5208333 0.004880529 2.0383589 25
## [12917] {chicken,
## whole_milk,
## yogurt} => {other_vegetables} 0.002541942 0.6410256 0.003965430 3.3129202 25
## [12918] {chicken,
## other_vegetables,
## whole_milk} => {yogurt} 0.002541942 0.3012048 0.008439248 2.1591468 25
## [12919] {chicken,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.002846975 0.5714286 0.004982206 2.2363709 28
## [12920] {chicken,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.002846975 0.5384615 0.005287239 2.7828530 28
## [12921] {chicken,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.002846975 0.3373494 0.008439248 1.8340693 28
## [12922] {chocolate,
## white_bread,
## yogurt} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [12923] {chocolate,
## other_vegetables,
## white_bread} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [12924] {other_vegetables,
## white_bread,
## yogurt} => {chocolate} 0.001016777 0.2564103 0.003965430 5.1676124 10
## [12925] {chocolate,
## other_vegetables,
## yogurt} => {white_bread} 0.001016777 0.2777778 0.003660397 6.5988996 10
## [12926] {chocolate,
## other_vegetables,
## white_bread} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [12927] {chocolate,
## white_bread,
## whole_milk} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [12928] {chocolate,
## other_vegetables,
## whole_milk} => {white_bread} 0.001118454 0.2037037 0.005490595 4.8391931 11
## [12929] {curd,
## white_bread,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [12930] {curd,
## white_bread,
## whole_milk} => {yogurt} 0.001118454 0.5238095 0.002135231 3.7548591 11
## [12931] {white_bread,
## whole_milk,
## yogurt} => {curd} 0.001118454 0.2291667 0.004880529 4.3012484 11
## [12932] {napkins,
## tropical_fruit,
## white_bread} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [12933] {napkins,
## white_bread,
## whole_milk} => {tropical_fruit} 0.001220132 0.5217391 0.002338587 4.9721941 12
## [12934] {tropical_fruit,
## white_bread,
## whole_milk} => {napkins} 0.001220132 0.2666667 0.004575496 5.0925566 12
## [12935] {napkins,
## tropical_fruit,
## whole_milk} => {white_bread} 0.001220132 0.2448980 0.004982206 5.8178054 12
## [12936] {napkins,
## white_bread,
## yogurt} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [12937] {napkins,
## white_bread,
## whole_milk} => {yogurt} 0.001016777 0.4347826 0.002338587 3.1166815 10
## [12938] {white_bread,
## whole_milk,
## yogurt} => {napkins} 0.001016777 0.2083333 0.004880529 3.9785599 10
## [12939] {bottled_beer,
## tropical_fruit,
## white_bread} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [12940] {bottled_beer,
## white_bread,
## whole_milk} => {tropical_fruit} 0.001016777 0.5555556 0.001830198 5.2944660 10
## [12941] {tropical_fruit,
## white_bread,
## whole_milk} => {bottled_beer} 0.001016777 0.2222222 0.004575496 2.7595398 10
## [12942] {bottled_beer,
## tropical_fruit,
## whole_milk} => {white_bread} 0.001016777 0.3225806 0.003152008 7.6632383 10
## [12943] {butter,
## whipped/sour_cream,
## white_bread} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [12944] {butter,
## other_vegetables,
## white_bread} => {whipped/sour_cream} 0.001016777 0.4347826 0.002338587 6.0653716 10
## [12945] {other_vegetables,
## whipped/sour_cream,
## white_bread} => {butter} 0.001016777 0.3030303 0.003355363 5.4684459 10
## [12946] {butter,
## tropical_fruit,
## white_bread} => {yogurt} 0.001118454 0.8461538 0.001321810 6.0655416 11
## [12947] {butter,
## white_bread,
## yogurt} => {tropical_fruit} 0.001118454 0.5789474 0.001931876 5.5173909 11
## [12948] {tropical_fruit,
## white_bread,
## yogurt} => {butter} 0.001118454 0.3928571 0.002846975 7.0894495 11
## [12949] {butter,
## tropical_fruit,
## yogurt} => {white_bread} 0.001118454 0.2444444 0.004575496 5.8070317 11
## [12950] {butter,
## tropical_fruit,
## white_bread} => {other_vegetables} 0.001118454 0.8461538 0.001321810 4.3730547 11
## [12951] {butter,
## other_vegetables,
## white_bread} => {tropical_fruit} 0.001118454 0.4782609 0.002338587 4.5578446 11
## [12952] {other_vegetables,
## tropical_fruit,
## white_bread} => {butter} 0.001118454 0.2682927 0.004168785 4.8415753 11
## [12953] {butter,
## other_vegetables,
## tropical_fruit} => {white_bread} 0.001118454 0.2037037 0.005490595 4.8391931 11
## [12954] {butter,
## root_vegetables,
## white_bread} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [12955] {butter,
## other_vegetables,
## white_bread} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [12956] {other_vegetables,
## root_vegetables,
## white_bread} => {butter} 0.001016777 0.2564103 0.003965430 4.6271466 10
## [12957] {butter,
## root_vegetables,
## white_bread} => {whole_milk} 0.001118454 0.9166667 0.001220132 3.5875116 11
## [12958] {butter,
## white_bread,
## whole_milk} => {root_vegetables} 0.001118454 0.4782609 0.002338587 4.3877758 11
## [12959] {root_vegetables,
## white_bread,
## whole_milk} => {butter} 0.001118454 0.2820513 0.003965430 5.0898612 11
## [12960] {butter,
## white_bread,
## yogurt} => {other_vegetables} 0.001423488 0.7368421 0.001931876 3.8081146 14
## [12961] {butter,
## other_vegetables,
## white_bread} => {yogurt} 0.001423488 0.6086957 0.002338587 4.3633540 14
## [12962] {other_vegetables,
## white_bread,
## yogurt} => {butter} 0.001423488 0.3589744 0.003965430 6.4780052 14
## [12963] {butter,
## other_vegetables,
## yogurt} => {white_bread} 0.001423488 0.2222222 0.006405694 5.2791197 14
## [12964] {butter,
## white_bread,
## yogurt} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [12965] {butter,
## white_bread,
## whole_milk} => {yogurt} 0.001220132 0.5217391 0.002338587 3.7400177 12
## [12966] {white_bread,
## whole_milk,
## yogurt} => {butter} 0.001220132 0.2500000 0.004880529 4.5114679 12
## [12967] {butter,
## other_vegetables,
## white_bread} => {whole_milk} 0.001728521 0.7391304 0.002338587 2.8926971 17
## [12968] {butter,
## white_bread,
## whole_milk} => {other_vegetables} 0.001728521 0.7391304 0.002338587 3.8199411 17
## [12969] {other_vegetables,
## white_bread,
## whole_milk} => {butter} 0.001728521 0.2931034 0.005897306 5.2893072 17
## [12970] {domestic_eggs,
## tropical_fruit,
## white_bread} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [12971] {domestic_eggs,
## other_vegetables,
## white_bread} => {tropical_fruit} 0.001016777 0.4545455 0.002236909 4.3318358 10
## [12972] {other_vegetables,
## tropical_fruit,
## white_bread} => {domestic_eggs} 0.001016777 0.2439024 0.004168785 3.8441995 10
## [12973] {domestic_eggs,
## other_vegetables,
## tropical_fruit} => {white_bread} 0.001016777 0.2127660 0.004778851 5.0544763 10
## [12974] {domestic_eggs,
## tropical_fruit,
## white_bread} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [12975] {domestic_eggs,
## white_bread,
## whole_milk} => {tropical_fruit} 0.001016777 0.3125000 0.003253686 2.9781371 10
## [12976] {tropical_fruit,
## white_bread,
## whole_milk} => {domestic_eggs} 0.001016777 0.2222222 0.004575496 3.5024929 10
## [12977] {domestic_eggs,
## root_vegetables,
## white_bread} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [12978] {domestic_eggs,
## white_bread,
## yogurt} => {root_vegetables} 0.001016777 0.5263158 0.001931876 4.8286528 10
## [12979] {root_vegetables,
## white_bread,
## yogurt} => {domestic_eggs} 0.001016777 0.3703704 0.002745297 5.8374881 10
## [12980] {domestic_eggs,
## root_vegetables,
## yogurt} => {white_bread} 0.001016777 0.2777778 0.003660397 6.5988996 10
## [12981] {domestic_eggs,
## root_vegetables,
## white_bread} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [12982] {domestic_eggs,
## other_vegetables,
## white_bread} => {root_vegetables} 0.001220132 0.5454545 0.002236909 5.0042402 12
## [12983] {other_vegetables,
## root_vegetables,
## white_bread} => {domestic_eggs} 0.001220132 0.3076923 0.003965430 4.8496055 12
## [12984] {domestic_eggs,
## root_vegetables,
## white_bread} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [12985] {domestic_eggs,
## white_bread,
## whole_milk} => {root_vegetables} 0.001118454 0.3437500 0.003253686 3.1537139 11
## [12986] {root_vegetables,
## white_bread,
## whole_milk} => {domestic_eggs} 0.001118454 0.2820513 0.003965430 4.4454717 11
## [12987] {domestic_eggs,
## white_bread,
## yogurt} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [12988] {domestic_eggs,
## white_bread,
## whole_milk} => {yogurt} 0.001321810 0.4062500 0.003253686 2.9121492 13
## [12989] {white_bread,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001321810 0.2708333 0.004880529 4.2686632 13
## [12990] {domestic_eggs,
## other_vegetables,
## white_bread} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [12991] {domestic_eggs,
## white_bread,
## whole_milk} => {other_vegetables} 0.001118454 0.3437500 0.003253686 1.7765535 11
## [12992] {fruit/vegetable_juice,
## pip_fruit,
## white_bread} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [12993] {fruit/vegetable_juice,
## white_bread,
## whole_milk} => {pip_fruit} 0.001220132 0.3333333 0.003660397 4.4063620 12
## [12994] {pip_fruit,
## white_bread,
## whole_milk} => {fruit/vegetable_juice} 0.001220132 0.3529412 0.003457041 4.8821047 12
## [12995] {fruit/vegetable_juice,
## pip_fruit,
## whole_milk} => {white_bread} 0.001220132 0.2553191 0.004778851 6.0653716 12
## [12996] {fruit/vegetable_juice,
## tropical_fruit,
## white_bread} => {yogurt} 0.001118454 0.4583333 0.002440264 3.2855017 11
## [12997] {fruit/vegetable_juice,
## white_bread,
## yogurt} => {tropical_fruit} 0.001118454 0.4583333 0.002440264 4.3679344 11
## [12998] {tropical_fruit,
## white_bread,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.3928571 0.002846975 5.4342475 11
## [12999] {fruit/vegetable_juice,
## tropical_fruit,
## yogurt} => {white_bread} 0.001118454 0.2291667 0.004880529 5.4440922 11
## [13000] {fruit/vegetable_juice,
## tropical_fruit,
## white_bread} => {other_vegetables} 0.001321810 0.5416667 0.002440264 2.7994176 13
## [13001] {fruit/vegetable_juice,
## other_vegetables,
## white_bread} => {tropical_fruit} 0.001321810 0.4642857 0.002846975 4.4246609 13
## [13002] {other_vegetables,
## tropical_fruit,
## white_bread} => {fruit/vegetable_juice} 0.001321810 0.3170732 0.004168785 4.3859559 13
## [13003] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit} => {white_bread} 0.001321810 0.2000000 0.006609049 4.7512077 13
## [13004] {fruit/vegetable_juice,
## tropical_fruit,
## white_bread} => {whole_milk} 0.001220132 0.5000000 0.002440264 1.9568245 12
## [13005] {fruit/vegetable_juice,
## white_bread,
## whole_milk} => {tropical_fruit} 0.001220132 0.3333333 0.003660397 3.1766796 12
## [13006] {tropical_fruit,
## white_bread,
## whole_milk} => {fruit/vegetable_juice} 0.001220132 0.2666667 0.004575496 3.6887014 12
## [13007] {fruit/vegetable_juice,
## tropical_fruit,
## whole_milk} => {white_bread} 0.001220132 0.2033898 0.005998983 4.8317367 12
## [13008] {fruit/vegetable_juice,
## soda,
## white_bread} => {other_vegetables} 0.001118454 0.4074074 0.002745297 2.1055449 11
## [13009] {fruit/vegetable_juice,
## other_vegetables,
## white_bread} => {soda} 0.001118454 0.3928571 0.002846975 2.2529155 11
## [13010] {other_vegetables,
## soda,
## white_bread} => {fruit/vegetable_juice} 0.001118454 0.2820513 0.003965430 3.9015111 11
## [13011] {fruit/vegetable_juice,
## other_vegetables,
## soda} => {white_bread} 0.001118454 0.2500000 0.004473818 5.9390097 11
## [13012] {fruit/vegetable_juice,
## soda,
## white_bread} => {whole_milk} 0.001118454 0.4074074 0.002745297 1.5944496 11
## [13013] {fruit/vegetable_juice,
## white_bread,
## whole_milk} => {soda} 0.001118454 0.3055556 0.003660397 1.7522676 11
## [13014] {soda,
## white_bread,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.2750000 0.004067107 3.8039733 11
## [13015] {fruit/vegetable_juice,
## white_bread,
## yogurt} => {other_vegetables} 0.001220132 0.5000000 0.002440264 2.5840778 12
## [13016] {fruit/vegetable_juice,
## other_vegetables,
## white_bread} => {yogurt} 0.001220132 0.4285714 0.002846975 3.0721574 12
## [13017] {other_vegetables,
## white_bread,
## yogurt} => {fruit/vegetable_juice} 0.001220132 0.3076923 0.003965430 4.2561939 12
## [13018] {fruit/vegetable_juice,
## white_bread,
## yogurt} => {whole_milk} 0.001016777 0.4166667 0.002440264 1.6306871 10
## [13019] {fruit/vegetable_juice,
## white_bread,
## whole_milk} => {yogurt} 0.001016777 0.2777778 0.003660397 1.9912132 10
## [13020] {white_bread,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.2083333 0.004880529 2.8817979 10
## [13021] {fruit/vegetable_juice,
## other_vegetables,
## white_bread} => {whole_milk} 0.001321810 0.4642857 0.002846975 1.8170513 13
## [13022] {fruit/vegetable_juice,
## white_bread,
## whole_milk} => {other_vegetables} 0.001321810 0.3611111 0.003660397 1.8662784 13
## [13023] {other_vegetables,
## white_bread,
## whole_milk} => {fruit/vegetable_juice} 0.001321810 0.2241379 0.005897306 3.1004171 13
## [13024] {tropical_fruit,
## whipped/sour_cream,
## white_bread} => {yogurt} 0.001118454 0.5500000 0.002033554 3.9426020 11
## [13025] {whipped/sour_cream,
## white_bread,
## yogurt} => {tropical_fruit} 0.001118454 0.5238095 0.002135231 4.9919251 11
## [13026] {tropical_fruit,
## white_bread,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3928571 0.002846975 5.4804965 11
## [13027] {tropical_fruit,
## whipped/sour_cream,
## white_bread} => {other_vegetables} 0.001728521 0.8500000 0.002033554 4.3929322 17
## [13028] {other_vegetables,
## whipped/sour_cream,
## white_bread} => {tropical_fruit} 0.001728521 0.5151515 0.003355363 4.9094139 17
## [13029] {other_vegetables,
## tropical_fruit,
## white_bread} => {whipped/sour_cream} 0.001728521 0.4146341 0.004168785 5.7842934 17
## [13030] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {white_bread} 0.001728521 0.2207792 0.007829181 5.2448397 17
## [13031] {root_vegetables,
## whipped/sour_cream,
## white_bread} => {other_vegetables} 0.001423488 0.8750000 0.001626843 4.5221361 14
## [13032] {other_vegetables,
## whipped/sour_cream,
## white_bread} => {root_vegetables} 0.001423488 0.4242424 0.003355363 3.8921868 14
## [13033] {other_vegetables,
## root_vegetables,
## white_bread} => {whipped/sour_cream} 0.001423488 0.3589744 0.003965430 5.0078196 14
## [13034] {root_vegetables,
## whipped/sour_cream,
## white_bread} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [13035] {whipped/sour_cream,
## white_bread,
## whole_milk} => {root_vegetables} 0.001321810 0.4333333 0.003050330 3.9755908 13
## [13036] {root_vegetables,
## white_bread,
## whole_milk} => {whipped/sour_cream} 0.001321810 0.3333333 0.003965430 4.6501182 13
## [13037] {whipped/sour_cream,
## white_bread,
## yogurt} => {other_vegetables} 0.001626843 0.7619048 0.002135231 3.9376423 16
## [13038] {other_vegetables,
## whipped/sour_cream,
## white_bread} => {yogurt} 0.001626843 0.4848485 0.003355363 3.4755720 16
## [13039] {other_vegetables,
## white_bread,
## yogurt} => {whipped/sour_cream} 0.001626843 0.4102564 0.003965430 5.7232224 16
## [13040] {whipped/sour_cream,
## white_bread,
## yogurt} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [13041] {whipped/sour_cream,
## white_bread,
## whole_milk} => {yogurt} 0.001321810 0.4333333 0.003050330 3.1062925 13
## [13042] {white_bread,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001321810 0.2708333 0.004880529 3.7782210 13
## [13043] {other_vegetables,
## whipped/sour_cream,
## white_bread} => {whole_milk} 0.001728521 0.5151515 0.003355363 2.0161222 17
## [13044] {whipped/sour_cream,
## white_bread,
## whole_milk} => {other_vegetables} 0.001728521 0.5666667 0.003050330 2.9286215 17
## [13045] {other_vegetables,
## white_bread,
## whole_milk} => {whipped/sour_cream} 0.001728521 0.2931034 0.005897306 4.0888970 17
## [13046] {pip_fruit,
## sausage,
## white_bread} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [13047] {pip_fruit,
## white_bread,
## whole_milk} => {sausage} 0.001016777 0.2941176 0.003457041 3.1305704 10
## [13048] {sausage,
## white_bread,
## whole_milk} => {pip_fruit} 0.001016777 0.2941176 0.003457041 3.8879665 10
## [13049] {pip_fruit,
## tropical_fruit,
## white_bread} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [13050] {other_vegetables,
## pip_fruit,
## white_bread} => {tropical_fruit} 0.001220132 0.4615385 0.002643620 4.3984794 12
## [13051] {other_vegetables,
## tropical_fruit,
## white_bread} => {pip_fruit} 0.001220132 0.2926829 0.004168785 3.8690008 12
## [13052] {pip_fruit,
## tropical_fruit,
## white_bread} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [13053] {pip_fruit,
## white_bread,
## whole_milk} => {tropical_fruit} 0.001423488 0.4117647 0.003457041 3.9241336 14
## [13054] {tropical_fruit,
## white_bread,
## whole_milk} => {pip_fruit} 0.001423488 0.3111111 0.004575496 4.1126045 14
## [13055] {pip_fruit,
## root_vegetables,
## white_bread} => {yogurt} 0.001220132 0.7058824 0.001728521 5.0600240 12
## [13056] {pip_fruit,
## white_bread,
## yogurt} => {root_vegetables} 0.001220132 0.4800000 0.002541942 4.4037313 12
## [13057] {root_vegetables,
## white_bread,
## yogurt} => {pip_fruit} 0.001220132 0.4444444 0.002745297 5.8751493 12
## [13058] {pip_fruit,
## root_vegetables,
## yogurt} => {white_bread} 0.001220132 0.2307692 0.005287239 5.4821628 12
## [13059] {pip_fruit,
## root_vegetables,
## white_bread} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [13060] {pip_fruit,
## white_bread,
## whole_milk} => {root_vegetables} 0.001321810 0.3823529 0.003457041 3.5078742 13
## [13061] {root_vegetables,
## white_bread,
## whole_milk} => {pip_fruit} 0.001321810 0.3333333 0.003965430 4.4063620 13
## [13062] {pip_fruit,
## soda,
## white_bread} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [13063] {pip_fruit,
## white_bread,
## yogurt} => {soda} 0.001016777 0.4000000 0.002541942 2.2938776 10
## [13064] {soda,
## white_bread,
## yogurt} => {pip_fruit} 0.001016777 0.4000000 0.002541942 5.2876344 10
## [13065] {pip_fruit,
## soda,
## yogurt} => {white_bread} 0.001016777 0.2631579 0.003863752 6.2515891 10
## [13066] {pip_fruit,
## white_bread,
## yogurt} => {other_vegetables} 0.001220132 0.4800000 0.002541942 2.4807147 12
## [13067] {other_vegetables,
## pip_fruit,
## white_bread} => {yogurt} 0.001220132 0.4615385 0.002643620 3.3084772 12
## [13068] {other_vegetables,
## white_bread,
## yogurt} => {pip_fruit} 0.001220132 0.3076923 0.003965430 4.0674111 12
## [13069] {pip_fruit,
## white_bread,
## yogurt} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [13070] {pip_fruit,
## white_bread,
## whole_milk} => {yogurt} 0.001525165 0.4411765 0.003457041 3.1625150 15
## [13071] {white_bread,
## whole_milk,
## yogurt} => {pip_fruit} 0.001525165 0.3125000 0.004880529 4.1309644 15
## [13072] {other_vegetables,
## pip_fruit,
## white_bread} => {whole_milk} 0.001525165 0.5769231 0.002643620 2.2578744 15
## [13073] {pip_fruit,
## white_bread,
## whole_milk} => {other_vegetables} 0.001525165 0.4411765 0.003457041 2.2800686 15
## [13074] {other_vegetables,
## white_bread,
## whole_milk} => {pip_fruit} 0.001525165 0.2586207 0.005897306 3.4187291 15
## [13075] {pastry,
## soda,
## white_bread} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [13076] {other_vegetables,
## pastry,
## white_bread} => {soda} 0.001016777 0.5555556 0.001830198 3.1859410 10
## [13077] {other_vegetables,
## soda,
## white_bread} => {pastry} 0.001016777 0.2564103 0.003965430 2.8820513 10
## [13078] {sausage,
## shopping_bags,
## white_bread} => {soda} 0.001016777 0.6666667 0.001525165 3.8231293 10
## [13079] {shopping_bags,
## soda,
## white_bread} => {sausage} 0.001016777 0.3448276 0.002948653 3.6703239 10
## [13080] {sausage,
## soda,
## white_bread} => {shopping_bags} 0.001016777 0.4000000 0.002541942 4.0598555 10
## [13081] {shopping_bags,
## tropical_fruit,
## white_bread} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [13082] {shopping_bags,
## white_bread,
## whole_milk} => {tropical_fruit} 0.001220132 0.4285714 0.002846975 4.0843023 12
## [13083] {tropical_fruit,
## white_bread,
## whole_milk} => {shopping_bags} 0.001220132 0.2666667 0.004575496 2.7065703 12
## [13084] {shopping_bags,
## tropical_fruit,
## whole_milk} => {white_bread} 0.001220132 0.2448980 0.004982206 5.8178054 12
## [13085] {shopping_bags,
## soda,
## white_bread} => {whole_milk} 0.001525165 0.5172414 0.002948653 2.0243012 15
## [13086] {shopping_bags,
## white_bread,
## whole_milk} => {soda} 0.001525165 0.5357143 0.002846975 3.0721574 15
## [13087] {soda,
## white_bread,
## whole_milk} => {shopping_bags} 0.001525165 0.3750000 0.004067107 3.8061146 15
## [13088] {shopping_bags,
## soda,
## whole_milk} => {white_bread} 0.001525165 0.2238806 0.006812405 5.3185161 15
## [13089] {other_vegetables,
## shopping_bags,
## white_bread} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [13090] {shopping_bags,
## white_bread,
## whole_milk} => {other_vegetables} 0.001016777 0.3571429 0.002846975 1.8457698 10
## [13091] {sausage,
## tropical_fruit,
## white_bread} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [13092] {sausage,
## white_bread,
## whole_milk} => {tropical_fruit} 0.001423488 0.4117647 0.003457041 3.9241336 14
## [13093] {tropical_fruit,
## white_bread,
## whole_milk} => {sausage} 0.001423488 0.3111111 0.004575496 3.3114478 14
## [13094] {root_vegetables,
## sausage,
## white_bread} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [13095] {other_vegetables,
## sausage,
## white_bread} => {root_vegetables} 0.001016777 0.3571429 0.002846975 3.2765858 10
## [13096] {other_vegetables,
## root_vegetables,
## white_bread} => {sausage} 0.001016777 0.2564103 0.003965430 2.7292152 10
## [13097] {sausage,
## soda,
## white_bread} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [13098] {sausage,
## white_bread,
## yogurt} => {soda} 0.001016777 0.4347826 0.002338587 2.4933452 10
## [13099] {soda,
## white_bread,
## yogurt} => {sausage} 0.001016777 0.4000000 0.002541942 4.2575758 10
## [13100] {sausage,
## soda,
## white_bread} => {whole_milk} 0.001118454 0.4400000 0.002541942 1.7220056 11
## [13101] {sausage,
## white_bread,
## whole_milk} => {soda} 0.001118454 0.3235294 0.003457041 1.8553421 11
## [13102] {soda,
## white_bread,
## whole_milk} => {sausage} 0.001118454 0.2750000 0.004067107 2.9270833 11
## [13103] {sausage,
## white_bread,
## yogurt} => {other_vegetables} 0.001321810 0.5652174 0.002338587 2.9211314 13
## [13104] {other_vegetables,
## sausage,
## white_bread} => {yogurt} 0.001321810 0.4642857 0.002846975 3.3281706 13
## [13105] {other_vegetables,
## white_bread,
## yogurt} => {sausage} 0.001321810 0.3333333 0.003965430 3.5479798 13
## [13106] {sausage,
## white_bread,
## yogurt} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [13107] {sausage,
## white_bread,
## whole_milk} => {yogurt} 0.001118454 0.3235294 0.003457041 2.3191777 11
## [13108] {white_bread,
## whole_milk,
## yogurt} => {sausage} 0.001118454 0.2291667 0.004880529 2.4392361 11
## [13109] {other_vegetables,
## sausage,
## white_bread} => {whole_milk} 0.001220132 0.4285714 0.002846975 1.6772782 12
## [13110] {sausage,
## white_bread,
## whole_milk} => {other_vegetables} 0.001220132 0.3529412 0.003457041 1.8240549 12
## [13111] {other_vegetables,
## white_bread,
## whole_milk} => {sausage} 0.001220132 0.2068966 0.005897306 2.2021944 12
## [13112] {root_vegetables,
## tropical_fruit,
## white_bread} => {other_vegetables} 0.001321810 0.6500000 0.002033554 3.3593011 13
## [13113] {other_vegetables,
## tropical_fruit,
## white_bread} => {root_vegetables} 0.001321810 0.3170732 0.004168785 2.9089689 13
## [13114] {other_vegetables,
## root_vegetables,
## white_bread} => {tropical_fruit} 0.001321810 0.3333333 0.003965430 3.1766796 13
## [13115] {root_vegetables,
## tropical_fruit,
## white_bread} => {whole_milk} 0.001525165 0.7500000 0.002033554 2.9352368 15
## [13116] {tropical_fruit,
## white_bread,
## whole_milk} => {root_vegetables} 0.001525165 0.3333333 0.004575496 3.0581468 15
## [13117] {root_vegetables,
## white_bread,
## whole_milk} => {tropical_fruit} 0.001525165 0.3846154 0.003965430 3.6653995 15
## [13118] {soda,
## tropical_fruit,
## white_bread} => {other_vegetables} 0.001220132 0.5000000 0.002440264 2.5840778 12
## [13119] {other_vegetables,
## tropical_fruit,
## white_bread} => {soda} 0.001220132 0.2926829 0.004168785 1.6784470 12
## [13120] {other_vegetables,
## soda,
## white_bread} => {tropical_fruit} 0.001220132 0.3076923 0.003965430 2.9323196 12
## [13121] {soda,
## tropical_fruit,
## white_bread} => {whole_milk} 0.001016777 0.4166667 0.002440264 1.6306871 10
## [13122] {tropical_fruit,
## white_bread,
## whole_milk} => {soda} 0.001016777 0.2222222 0.004575496 1.2743764 10
## [13123] {soda,
## white_bread,
## whole_milk} => {tropical_fruit} 0.001016777 0.2500000 0.004067107 2.3825097 10
## [13124] {tropical_fruit,
## white_bread,
## yogurt} => {other_vegetables} 0.001525165 0.5357143 0.002846975 2.7686548 15
## [13125] {other_vegetables,
## tropical_fruit,
## white_bread} => {yogurt} 0.001525165 0.3658537 0.004168785 2.6225734 15
## [13126] {other_vegetables,
## white_bread,
## yogurt} => {tropical_fruit} 0.001525165 0.3846154 0.003965430 3.6653995 15
## [13127] {tropical_fruit,
## white_bread,
## yogurt} => {whole_milk} 0.002033554 0.7142857 0.002846975 2.7954636 20
## [13128] {tropical_fruit,
## white_bread,
## whole_milk} => {yogurt} 0.002033554 0.4444444 0.004575496 3.1859410 20
## [13129] {white_bread,
## whole_milk,
## yogurt} => {tropical_fruit} 0.002033554 0.4166667 0.004880529 3.9708495 20
## [13130] {other_vegetables,
## tropical_fruit,
## white_bread} => {whole_milk} 0.002033554 0.4878049 0.004168785 1.9090971 20
## [13131] {tropical_fruit,
## white_bread,
## whole_milk} => {other_vegetables} 0.002033554 0.4444444 0.004575496 2.2969580 20
## [13132] {other_vegetables,
## white_bread,
## whole_milk} => {tropical_fruit} 0.002033554 0.3448276 0.005897306 3.2862203 20
## [13133] {root_vegetables,
## soda,
## white_bread} => {other_vegetables} 0.001321810 0.5416667 0.002440264 2.7994176 13
## [13134] {other_vegetables,
## root_vegetables,
## white_bread} => {soda} 0.001321810 0.3333333 0.003965430 1.9115646 13
## [13135] {other_vegetables,
## soda,
## white_bread} => {root_vegetables} 0.001321810 0.3333333 0.003965430 3.0581468 13
## [13136] {root_vegetables,
## soda,
## white_bread} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [13137] {root_vegetables,
## white_bread,
## whole_milk} => {soda} 0.001118454 0.2820513 0.003965430 1.6174778 11
## [13138] {soda,
## white_bread,
## whole_milk} => {root_vegetables} 0.001118454 0.2750000 0.004067107 2.5229711 11
## [13139] {root_vegetables,
## white_bread,
## yogurt} => {other_vegetables} 0.001728521 0.6296296 0.002745297 3.2540239 17
## [13140] {other_vegetables,
## root_vegetables,
## white_bread} => {yogurt} 0.001728521 0.4358974 0.003965430 3.1246729 17
## [13141] {other_vegetables,
## white_bread,
## yogurt} => {root_vegetables} 0.001728521 0.4358974 0.003965430 3.9991150 17
## [13142] {root_vegetables,
## white_bread,
## yogurt} => {whole_milk} 0.001830198 0.6666667 0.002745297 2.6090994 18
## [13143] {root_vegetables,
## white_bread,
## whole_milk} => {yogurt} 0.001830198 0.4615385 0.003965430 3.3084772 18
## [13144] {white_bread,
## whole_milk,
## yogurt} => {root_vegetables} 0.001830198 0.3750000 0.004880529 3.4404151 18
## [13145] {rolls/buns,
## root_vegetables,
## white_bread} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [13146] {root_vegetables,
## white_bread,
## whole_milk} => {rolls/buns} 0.001016777 0.2564103 0.003965430 1.3940270 10
## [13147] {rolls/buns,
## white_bread,
## whole_milk} => {root_vegetables} 0.001016777 0.3125000 0.003253686 2.8670126 10
## [13148] {other_vegetables,
## root_vegetables,
## white_bread} => {whole_milk} 0.002338587 0.5897436 0.003965430 2.3080494 23
## [13149] {root_vegetables,
## white_bread,
## whole_milk} => {other_vegetables} 0.002338587 0.5897436 0.003965430 3.0478866 23
## [13150] {other_vegetables,
## white_bread,
## whole_milk} => {root_vegetables} 0.002338587 0.3965517 0.005897306 3.6381401 23
## [13151] {soda,
## white_bread,
## yogurt} => {whole_milk} 0.001220132 0.4800000 0.002541942 1.8785515 12
## [13152] {soda,
## white_bread,
## whole_milk} => {yogurt} 0.001220132 0.3000000 0.004067107 2.1505102 12
## [13153] {white_bread,
## whole_milk,
## yogurt} => {soda} 0.001220132 0.2500000 0.004880529 1.4336735 12
## [13154] {rolls/buns,
## soda,
## white_bread} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [13155] {soda,
## white_bread,
## whole_milk} => {rolls/buns} 0.001016777 0.2500000 0.004067107 1.3591763 10
## [13156] {rolls/buns,
## white_bread,
## whole_milk} => {soda} 0.001016777 0.3125000 0.003253686 1.7920918 10
## [13157] {other_vegetables,
## soda,
## white_bread} => {whole_milk} 0.001626843 0.4102564 0.003965430 1.6055996 16
## [13158] {soda,
## white_bread,
## whole_milk} => {other_vegetables} 0.001626843 0.4000000 0.004067107 2.0672622 16
## [13159] {other_vegetables,
## white_bread,
## whole_milk} => {soda} 0.001626843 0.2758621 0.005897306 1.5819845 16
## [13160] {other_vegetables,
## white_bread,
## yogurt} => {whole_milk} 0.002135231 0.5384615 0.003965430 2.1073495 21
## [13161] {white_bread,
## whole_milk,
## yogurt} => {other_vegetables} 0.002135231 0.4375000 0.004880529 2.2610681 21
## [13162] {other_vegetables,
## white_bread,
## whole_milk} => {yogurt} 0.002135231 0.3620690 0.005897306 2.5954433 21
## [13163] {other_vegetables,
## rolls/buns,
## white_bread} => {whole_milk} 0.001118454 0.4230769 0.002643620 1.6557746 11
## [13164] {rolls/buns,
## white_bread,
## whole_milk} => {other_vegetables} 0.001118454 0.3437500 0.003253686 1.7765535 11
## [13165] {chocolate,
## frozen_vegetables,
## other_vegetables} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [13166] {chocolate,
## frozen_vegetables,
## whole_milk} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [13167] {chocolate,
## other_vegetables,
## whole_milk} => {frozen_vegetables} 0.001118454 0.2037037 0.005490595 4.2355728 11
## [13168] {chocolate,
## napkins,
## root_vegetables} => {whole_milk} 0.001220132 0.8000000 0.001525165 3.1309192 12
## [13169] {chocolate,
## napkins,
## whole_milk} => {root_vegetables} 0.001220132 0.4285714 0.002846975 3.9319030 12
## [13170] {chocolate,
## root_vegetables,
## whole_milk} => {napkins} 0.001220132 0.3428571 0.003558719 6.5475728 12
## [13171] {napkins,
## root_vegetables,
## whole_milk} => {chocolate} 0.001220132 0.2500000 0.004880529 5.0384221 12
## [13172] {chocolate,
## napkins,
## soda} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [13173] {chocolate,
## napkins,
## whole_milk} => {soda} 0.001423488 0.5000000 0.002846975 2.8673469 14
## [13174] {chocolate,
## soda,
## whole_milk} => {napkins} 0.001423488 0.2800000 0.005083884 5.3471845 14
## [13175] {napkins,
## soda,
## whole_milk} => {chocolate} 0.001423488 0.3043478 0.004677173 6.1337313 14
## [13176] {chocolate,
## napkins,
## yogurt} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [13177] {chocolate,
## napkins,
## whole_milk} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [13178] {chocolate,
## whole_milk,
## yogurt} => {napkins} 0.001016777 0.2222222 0.004575496 4.2437972 10
## [13179] {chocolate,
## napkins,
## rolls/buns} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [13180] {chocolate,
## napkins,
## other_vegetables} => {rolls/buns} 0.001016777 0.6250000 0.001626843 3.3979409 10
## [13181] {chocolate,
## other_vegetables,
## rolls/buns} => {napkins} 0.001016777 0.2631579 0.003863752 5.0255493 10
## [13182] {napkins,
## other_vegetables,
## rolls/buns} => {chocolate} 0.001016777 0.2439024 0.004168785 4.9155338 10
## [13183] {chocolate,
## napkins,
## rolls/buns} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [13184] {chocolate,
## napkins,
## whole_milk} => {rolls/buns} 0.001118454 0.3928571 0.002846975 2.1358485 11
## [13185] {chocolate,
## rolls/buns,
## whole_milk} => {napkins} 0.001118454 0.2244898 0.004982206 4.2871012 11
## [13186] {napkins,
## rolls/buns,
## whole_milk} => {chocolate} 0.001118454 0.2115385 0.005287239 4.2632803 11
## [13187] {chocolate,
## napkins,
## other_vegetables} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [13188] {chocolate,
## napkins,
## whole_milk} => {other_vegetables} 0.001118454 0.3928571 0.002846975 2.0303468 11
## [13189] {chocolate,
## other_vegetables,
## whole_milk} => {napkins} 0.001118454 0.2037037 0.005490595 3.8901474 11
## [13190] {chocolate,
## pork,
## soda} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [13191] {chocolate,
## pork,
## whole_milk} => {soda} 0.001016777 0.4166667 0.002440264 2.3894558 10
## [13192] {chocolate,
## soda,
## whole_milk} => {pork} 0.001016777 0.2000000 0.005083884 3.4691358 10
## [13193] {pork,
## soda,
## whole_milk} => {chocolate} 0.001016777 0.2380952 0.004270463 4.7984973 10
## [13194] {brown_bread,
## chocolate,
## yogurt} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [13195] {brown_bread,
## chocolate,
## whole_milk} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [13196] {chocolate,
## whole_milk,
## yogurt} => {brown_bread} 0.001016777 0.2222222 0.004575496 3.4256357 10
## [13197] {chocolate,
## margarine,
## other_vegetables} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [13198] {chocolate,
## margarine,
## whole_milk} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [13199] {butter,
## chocolate,
## fruit/vegetable_juice} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [13200] {butter,
## chocolate,
## other_vegetables} => {fruit/vegetable_juice} 0.001118454 0.4782609 0.002338587 6.6156057 11
## [13201] {chocolate,
## fruit/vegetable_juice,
## other_vegetables} => {butter} 0.001118454 0.3928571 0.002846975 7.0894495 11
## [13202] {butter,
## fruit/vegetable_juice,
## other_vegetables} => {chocolate} 0.001118454 0.3333333 0.003355363 6.7178962 11
## [13203] {butter,
## chocolate,
## fruit/vegetable_juice} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [13204] {butter,
## chocolate,
## whole_milk} => {fruit/vegetable_juice} 0.001220132 0.3636364 0.003355363 5.0300473 12
## [13205] {chocolate,
## fruit/vegetable_juice,
## whole_milk} => {butter} 0.001220132 0.3750000 0.003253686 6.7672018 12
## [13206] {butter,
## fruit/vegetable_juice,
## whole_milk} => {chocolate} 0.001220132 0.2926829 0.004168785 5.8986405 12
## [13207] {butter,
## chocolate,
## sausage} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [13208] {butter,
## chocolate,
## whole_milk} => {sausage} 0.001220132 0.3636364 0.003355363 3.8705234 12
## [13209] {chocolate,
## sausage,
## whole_milk} => {butter} 0.001220132 0.3529412 0.003457041 6.3691311 12
## [13210] {butter,
## sausage,
## whole_milk} => {chocolate} 0.001220132 0.2553191 0.004778851 5.1456226 12
## [13211] {butter,
## chocolate,
## root_vegetables} => {whole_milk} 0.001525165 0.7894737 0.001931876 3.0897229 15
## [13212] {butter,
## chocolate,
## whole_milk} => {root_vegetables} 0.001525165 0.4545455 0.003355363 4.1702001 15
## [13213] {chocolate,
## root_vegetables,
## whole_milk} => {butter} 0.001525165 0.4285714 0.003558719 7.7339450 15
## [13214] {butter,
## chocolate,
## yogurt} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [13215] {butter,
## chocolate,
## other_vegetables} => {yogurt} 0.001016777 0.4347826 0.002338587 3.1166815 10
## [13216] {chocolate,
## other_vegetables,
## yogurt} => {butter} 0.001016777 0.2777778 0.003660397 5.0127421 10
## [13217] {butter,
## chocolate,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [13218] {butter,
## chocolate,
## whole_milk} => {yogurt} 0.001118454 0.3333333 0.003355363 2.3894558 11
## [13219] {chocolate,
## whole_milk,
## yogurt} => {butter} 0.001118454 0.2444444 0.004575496 4.4112130 11
## [13220] {butter,
## chocolate,
## other_vegetables} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [13221] {butter,
## chocolate,
## whole_milk} => {other_vegetables} 0.001321810 0.3939394 0.003355363 2.0359401 13
## [13222] {chocolate,
## other_vegetables,
## whole_milk} => {butter} 0.001321810 0.2407407 0.005490595 4.3443765 13
## [13223] {chocolate,
## newspapers,
## tropical_fruit} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [13224] {chocolate,
## newspapers,
## whole_milk} => {tropical_fruit} 0.001321810 0.4193548 0.003152008 3.9964679 13
## [13225] {chocolate,
## tropical_fruit,
## whole_milk} => {newspapers} 0.001321810 0.3333333 0.003965430 4.1762208 13
## [13226] {newspapers,
## tropical_fruit,
## whole_milk} => {chocolate} 0.001321810 0.2600000 0.005083884 5.2399590 13
## [13227] {chocolate,
## newspapers,
## soda} => {rolls/buns} 0.001016777 0.5000000 0.002033554 2.7183527 10
## [13228] {chocolate,
## newspapers,
## rolls/buns} => {soda} 0.001016777 0.4347826 0.002338587 2.4933452 10
## [13229] {chocolate,
## rolls/buns,
## soda} => {newspapers} 0.001016777 0.2500000 0.004067107 3.1321656 10
## [13230] {newspapers,
## rolls/buns,
## soda} => {chocolate} 0.001016777 0.2500000 0.004067107 5.0384221 10
## [13231] {chocolate,
## newspapers,
## soda} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [13232] {chocolate,
## newspapers,
## other_vegetables} => {soda} 0.001118454 0.5500000 0.002033554 3.1540816 11
## [13233] {chocolate,
## other_vegetables,
## soda} => {newspapers} 0.001118454 0.3055556 0.003660397 3.8282024 11
## [13234] {newspapers,
## other_vegetables,
## soda} => {chocolate} 0.001118454 0.2244898 0.004982206 4.5242974 11
## [13235] {chocolate,
## newspapers,
## soda} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [13236] {chocolate,
## newspapers,
## whole_milk} => {soda} 0.001016777 0.3225806 0.003152008 1.8499013 10
## [13237] {chocolate,
## soda,
## whole_milk} => {newspapers} 0.001016777 0.2000000 0.005083884 2.5057325 10
## [13238] {newspapers,
## soda,
## whole_milk} => {chocolate} 0.001016777 0.2127660 0.004778851 4.2880188 10
## [13239] {chocolate,
## newspapers,
## yogurt} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [13240] {chocolate,
## newspapers,
## whole_milk} => {yogurt} 0.001220132 0.3870968 0.003152008 2.7748519 12
## [13241] {chocolate,
## whole_milk,
## yogurt} => {newspapers} 0.001220132 0.2666667 0.004575496 3.3409766 12
## [13242] {chocolate,
## newspapers,
## rolls/buns} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [13243] {chocolate,
## newspapers,
## other_vegetables} => {rolls/buns} 0.001016777 0.5000000 0.002033554 2.7183527 10
## [13244] {chocolate,
## other_vegetables,
## rolls/buns} => {newspapers} 0.001016777 0.2631579 0.003863752 3.2970164 10
## [13245] {chocolate,
## newspapers,
## rolls/buns} => {whole_milk} 0.001525165 0.6521739 0.002338587 2.5523798 15
## [13246] {chocolate,
## newspapers,
## whole_milk} => {rolls/buns} 0.001525165 0.4838710 0.003152008 2.6306639 15
## [13247] {chocolate,
## rolls/buns,
## whole_milk} => {newspapers} 0.001525165 0.3061224 0.004982206 3.8353048 15
## [13248] {newspapers,
## rolls/buns,
## whole_milk} => {chocolate} 0.001525165 0.2000000 0.007625826 4.0307377 15
## [13249] {chocolate,
## newspapers,
## other_vegetables} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [13250] {chocolate,
## newspapers,
## whole_milk} => {other_vegetables} 0.001118454 0.3548387 0.003152008 1.8338616 11
## [13251] {chocolate,
## other_vegetables,
## whole_milk} => {newspapers} 0.001118454 0.2037037 0.005490595 2.5521349 11
## [13252] {chocolate,
## domestic_eggs,
## sausage} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [13253] {chocolate,
## domestic_eggs,
## whole_milk} => {sausage} 0.001016777 0.5000000 0.002033554 5.3219697 10
## [13254] {chocolate,
## sausage,
## whole_milk} => {domestic_eggs} 0.001016777 0.2941176 0.003457041 4.6356523 10
## [13255] {domestic_eggs,
## sausage,
## whole_milk} => {chocolate} 0.001016777 0.2272727 0.004473818 4.5803838 10
## [13256] {chocolate,
## fruit/vegetable_juice,
## sausage} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [13257] {chocolate,
## fruit/vegetable_juice,
## whole_milk} => {sausage} 0.001016777 0.3125000 0.003253686 3.3262311 10
## [13258] {chocolate,
## sausage,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.2941176 0.003457041 4.0684206 10
## [13259] {fruit/vegetable_juice,
## sausage,
## whole_milk} => {chocolate} 0.001016777 0.2083333 0.004880529 4.1986851 10
## [13260] {chocolate,
## fruit/vegetable_juice,
## root_vegetables} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [13261] {chocolate,
## fruit/vegetable_juice,
## other_vegetables} => {root_vegetables} 0.001016777 0.3571429 0.002846975 3.2765858 10
## [13262] {chocolate,
## other_vegetables,
## root_vegetables} => {fruit/vegetable_juice} 0.001016777 0.3030303 0.003355363 4.1917061 10
## [13263] {chocolate,
## fruit/vegetable_juice,
## soda} => {yogurt} 0.001118454 0.5000000 0.002236909 3.5841837 11
## [13264] {chocolate,
## fruit/vegetable_juice,
## yogurt} => {soda} 0.001118454 0.4583333 0.002440264 2.6284014 11
## [13265] {chocolate,
## soda,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.3793103 0.002948653 5.2468597 11
## [13266] {fruit/vegetable_juice,
## soda,
## yogurt} => {chocolate} 0.001118454 0.2200000 0.005083884 4.4338115 11
## [13267] {chocolate,
## fruit/vegetable_juice,
## soda} => {whole_milk} 0.001321810 0.5909091 0.002236909 2.3126108 13
## [13268] {chocolate,
## fruit/vegetable_juice,
## whole_milk} => {soda} 0.001321810 0.4062500 0.003253686 2.3297194 13
## [13269] {chocolate,
## soda,
## whole_milk} => {fruit/vegetable_juice} 0.001321810 0.2600000 0.005083884 3.5964838 13
## [13270] {fruit/vegetable_juice,
## soda,
## whole_milk} => {chocolate} 0.001321810 0.2166667 0.006100661 4.3666325 13
## [13271] {chocolate,
## fruit/vegetable_juice,
## yogurt} => {other_vegetables} 0.001321810 0.5416667 0.002440264 2.7994176 13
## [13272] {chocolate,
## fruit/vegetable_juice,
## other_vegetables} => {yogurt} 0.001321810 0.4642857 0.002846975 3.3281706 13
## [13273] {chocolate,
## other_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.001321810 0.3611111 0.003660397 4.9951164 13
## [13274] {chocolate,
## fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.001016777 0.4166667 0.002440264 1.6306871 10
## [13275] {chocolate,
## fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.001016777 0.3125000 0.003253686 2.2401148 10
## [13276] {chocolate,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.2222222 0.004575496 3.0739178 10
## [13277] {chocolate,
## fruit/vegetable_juice,
## rolls/buns} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [13278] {chocolate,
## fruit/vegetable_juice,
## whole_milk} => {rolls/buns} 0.001016777 0.3125000 0.003253686 1.6989704 10
## [13279] {chocolate,
## rolls/buns,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.2040816 0.004982206 2.8229857 10
## [13280] {chocolate,
## fruit/vegetable_juice,
## other_vegetables} => {whole_milk} 0.001423488 0.5000000 0.002846975 1.9568245 14
## [13281] {chocolate,
## fruit/vegetable_juice,
## whole_milk} => {other_vegetables} 0.001423488 0.4375000 0.003253686 2.2610681 14
## [13282] {chocolate,
## other_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001423488 0.2592593 0.005490595 3.5862374 14
## [13283] {chocolate,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001321810 0.6500000 0.002033554 3.3593011 13
## [13284] {chocolate,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001321810 0.5909091 0.002236909 4.2358534 13
## [13285] {chocolate,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001321810 0.3611111 0.003660397 5.0376281 13
## [13286] {chocolate,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [13287] {chocolate,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [13288] {chocolate,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001016777 0.2222222 0.004575496 3.1000788 10
## [13289] {chocolate,
## citrus_fruit,
## pip_fruit} => {tropical_fruit} 0.001016777 0.6250000 0.001626843 5.9562742 10
## [13290] {chocolate,
## pip_fruit,
## tropical_fruit} => {citrus_fruit} 0.001016777 0.4761905 0.002135231 5.7534808 10
## [13291] {chocolate,
## citrus_fruit,
## tropical_fruit} => {pip_fruit} 0.001016777 0.5000000 0.002033554 6.6095430 10
## [13292] {chocolate,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [13293] {chocolate,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001016777 0.4166667 0.002440264 3.9708495 10
## [13294] {chocolate,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001016777 0.2857143 0.003558719 3.7768817 10
## [13295] {chocolate,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [13296] {chocolate,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001118454 0.3437500 0.003253686 3.1537139 11
## [13297] {chocolate,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001118454 0.3142857 0.003558719 4.1545699 11
## [13298] {chocolate,
## pip_fruit,
## rolls/buns} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [13299] {chocolate,
## pip_fruit,
## whole_milk} => {rolls/buns} 0.001016777 0.3125000 0.003253686 1.6989704 10
## [13300] {chocolate,
## rolls/buns,
## whole_milk} => {pip_fruit} 0.001016777 0.2040816 0.004982206 2.6977727 10
## [13301] {chocolate,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001423488 0.5833333 0.002440264 2.2829619 14
## [13302] {chocolate,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001423488 0.4375000 0.003253686 2.2610681 14
## [13303] {chocolate,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001423488 0.2592593 0.005490595 3.4271705 14
## [13304] {chocolate,
## pastry,
## tropical_fruit} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [13305] {chocolate,
## other_vegetables,
## pastry} => {tropical_fruit} 0.001118454 0.4782609 0.002338587 4.5578446 11
## [13306] {chocolate,
## other_vegetables,
## tropical_fruit} => {pastry} 0.001118454 0.3142857 0.003558719 3.5325714 11
## [13307] {other_vegetables,
## pastry,
## tropical_fruit} => {chocolate} 0.001118454 0.2200000 0.005083884 4.4338115 11
## [13308] {chocolate,
## pastry,
## soda} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [13309] {chocolate,
## pastry,
## whole_milk} => {soda} 0.001016777 0.3448276 0.002948653 1.9774806 10
## [13310] {chocolate,
## soda,
## whole_milk} => {pastry} 0.001016777 0.2000000 0.005083884 2.2480000 10
## [13311] {chocolate,
## pastry,
## rolls/buns} => {whole_milk} 0.001016777 0.4166667 0.002440264 1.6306871 10
## [13312] {chocolate,
## pastry,
## whole_milk} => {rolls/buns} 0.001016777 0.3448276 0.002948653 1.8747260 10
## [13313] {chocolate,
## rolls/buns,
## whole_milk} => {pastry} 0.001016777 0.2040816 0.004982206 2.2938776 10
## [13314] {chocolate,
## other_vegetables,
## pastry} => {whole_milk} 0.001016777 0.4347826 0.002338587 1.7015865 10
## [13315] {chocolate,
## pastry,
## whole_milk} => {other_vegetables} 0.001016777 0.3448276 0.002948653 1.7821226 10
## [13316] {chocolate,
## citrus_fruit,
## sausage} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [13317] {chocolate,
## citrus_fruit,
## other_vegetables} => {sausage} 0.001016777 0.3703704 0.002745297 3.9421998 10
## [13318] {chocolate,
## other_vegetables,
## sausage} => {citrus_fruit} 0.001016777 0.3225806 0.003152008 3.8975192 10
## [13319] {citrus_fruit,
## other_vegetables,
## sausage} => {chocolate} 0.001016777 0.2272727 0.004473818 4.5803838 10
## [13320] {chocolate,
## citrus_fruit,
## sausage} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [13321] {chocolate,
## citrus_fruit,
## whole_milk} => {sausage} 0.001016777 0.3846154 0.002643620 4.0938228 10
## [13322] {chocolate,
## sausage,
## whole_milk} => {citrus_fruit} 0.001016777 0.2941176 0.003457041 3.5536205 10
## [13323] {citrus_fruit,
## sausage,
## whole_milk} => {chocolate} 0.001016777 0.2040816 0.004982206 4.1129977 10
## [13324] {chocolate,
## citrus_fruit,
## tropical_fruit} => {soda} 0.001016777 0.5000000 0.002033554 2.8673469 10
## [13325] {chocolate,
## citrus_fruit,
## soda} => {tropical_fruit} 0.001016777 0.5000000 0.002033554 4.7650194 10
## [13326] {chocolate,
## soda,
## tropical_fruit} => {citrus_fruit} 0.001016777 0.4347826 0.002338587 5.2531781 10
## [13327] {citrus_fruit,
## soda,
## tropical_fruit} => {chocolate} 0.001016777 0.2941176 0.003457041 5.9275554 10
## [13328] {chocolate,
## citrus_fruit,
## tropical_fruit} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [13329] {chocolate,
## citrus_fruit,
## other_vegetables} => {tropical_fruit} 0.001118454 0.4074074 0.002745297 3.8826084 11
## [13330] {chocolate,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001118454 0.3142857 0.003558719 3.7972973 11
## [13331] {chocolate,
## citrus_fruit,
## tropical_fruit} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [13332] {chocolate,
## citrus_fruit,
## whole_milk} => {tropical_fruit} 0.001118454 0.4230769 0.002643620 4.0319395 11
## [13333] {chocolate,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001118454 0.2820513 0.003965430 3.4078309 11
## [13334] {chocolate,
## citrus_fruit,
## root_vegetables} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [13335] {chocolate,
## citrus_fruit,
## other_vegetables} => {root_vegetables} 0.001118454 0.4074074 0.002745297 3.7377349 11
## [13336] {chocolate,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001118454 0.3333333 0.003355363 4.0274365 11
## [13337] {chocolate,
## citrus_fruit,
## root_vegetables} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [13338] {chocolate,
## citrus_fruit,
## whole_milk} => {root_vegetables} 0.001118454 0.4230769 0.002643620 3.8814940 11
## [13339] {chocolate,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001118454 0.3142857 0.003558719 3.7972973 11
## [13340] {chocolate,
## citrus_fruit,
## soda} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [13341] {chocolate,
## citrus_fruit,
## whole_milk} => {soda} 0.001016777 0.3846154 0.002643620 2.2056515 10
## [13342] {chocolate,
## soda,
## whole_milk} => {citrus_fruit} 0.001016777 0.2000000 0.005083884 2.4164619 10
## [13343] {citrus_fruit,
## soda,
## whole_milk} => {chocolate} 0.001016777 0.2272727 0.004473818 4.5803838 10
## [13344] {chocolate,
## citrus_fruit,
## yogurt} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [13345] {chocolate,
## citrus_fruit,
## whole_milk} => {yogurt} 0.001016777 0.3846154 0.002643620 2.7570644 10
## [13346] {chocolate,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001016777 0.2222222 0.004575496 2.6849577 10
## [13347] {chocolate,
## citrus_fruit,
## other_vegetables} => {whole_milk} 0.001220132 0.4444444 0.002745297 1.7393996 12
## [13348] {chocolate,
## citrus_fruit,
## whole_milk} => {other_vegetables} 0.001220132 0.4615385 0.002643620 2.3853026 12
## [13349] {chocolate,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001220132 0.2222222 0.005490595 2.6849577 12
## [13350] {chocolate,
## sausage,
## tropical_fruit} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [13351] {chocolate,
## other_vegetables,
## sausage} => {tropical_fruit} 0.001118454 0.3548387 0.003152008 3.3816267 11
## [13352] {chocolate,
## other_vegetables,
## tropical_fruit} => {sausage} 0.001118454 0.3142857 0.003558719 3.3452381 11
## [13353] {chocolate,
## sausage,
## tropical_fruit} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [13354] {chocolate,
## sausage,
## whole_milk} => {tropical_fruit} 0.001118454 0.3235294 0.003457041 3.0832478 11
## [13355] {chocolate,
## tropical_fruit,
## whole_milk} => {sausage} 0.001118454 0.2820513 0.003965430 3.0021368 11
## [13356] {chocolate,
## root_vegetables,
## sausage} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [13357] {chocolate,
## sausage,
## whole_milk} => {root_vegetables} 0.001016777 0.2941176 0.003457041 2.6983648 10
## [13358] {chocolate,
## root_vegetables,
## whole_milk} => {sausage} 0.001016777 0.2857143 0.003558719 3.0411255 10
## [13359] {chocolate,
## sausage,
## soda} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [13360] {chocolate,
## other_vegetables,
## sausage} => {soda} 0.001016777 0.3225806 0.003152008 1.8499013 10
## [13361] {chocolate,
## other_vegetables,
## soda} => {sausage} 0.001016777 0.2777778 0.003660397 2.9566498 10
## [13362] {chocolate,
## sausage,
## soda} => {whole_milk} 0.001321810 0.5909091 0.002236909 2.3126108 13
## [13363] {chocolate,
## sausage,
## whole_milk} => {soda} 0.001321810 0.3823529 0.003457041 2.1926771 13
## [13364] {chocolate,
## soda,
## whole_milk} => {sausage} 0.001321810 0.2600000 0.005083884 2.7674242 13
## [13365] {chocolate,
## sausage,
## yogurt} => {other_vegetables} 0.001321810 0.7222222 0.001830198 3.7325568 13
## [13366] {chocolate,
## other_vegetables,
## sausage} => {yogurt} 0.001321810 0.4193548 0.003152008 3.0060895 13
## [13367] {chocolate,
## other_vegetables,
## yogurt} => {sausage} 0.001321810 0.3611111 0.003660397 3.8436448 13
## [13368] {chocolate,
## rolls/buns,
## sausage} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [13369] {chocolate,
## other_vegetables,
## sausage} => {rolls/buns} 0.001220132 0.3870968 0.003152008 2.1045311 12
## [13370] {chocolate,
## other_vegetables,
## rolls/buns} => {sausage} 0.001220132 0.3157895 0.003863752 3.3612440 12
## [13371] {chocolate,
## other_vegetables,
## sausage} => {whole_milk} 0.001525165 0.4838710 0.003152008 1.8937011 15
## [13372] {chocolate,
## sausage,
## whole_milk} => {other_vegetables} 0.001525165 0.4411765 0.003457041 2.2800686 15
## [13373] {chocolate,
## other_vegetables,
## whole_milk} => {sausage} 0.001525165 0.2777778 0.005490595 2.9566498 15
## [13374] {bottled_water,
## chocolate,
## soda} => {rolls/buns} 0.001321810 0.5200000 0.002541942 2.8270868 13
## [13375] {bottled_water,
## chocolate,
## rolls/buns} => {soda} 0.001321810 0.6500000 0.002033554 3.7275510 13
## [13376] {chocolate,
## rolls/buns,
## soda} => {bottled_water} 0.001321810 0.3250000 0.004067107 2.9405474 13
## [13377] {chocolate,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [13378] {chocolate,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001118454 0.3142857 0.003558719 2.8833955 11
## [13379] {chocolate,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001118454 0.3333333 0.003355363 3.1766796 11
## [13380] {chocolate,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [13381] {chocolate,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001016777 0.2564103 0.003965430 2.3524206 10
## [13382] {chocolate,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001016777 0.2857143 0.003558719 2.7228682 10
## [13383] {chocolate,
## soda,
## tropical_fruit} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [13384] {chocolate,
## other_vegetables,
## tropical_fruit} => {soda} 0.001118454 0.3142857 0.003558719 1.8023324 11
## [13385] {chocolate,
## other_vegetables,
## soda} => {tropical_fruit} 0.001118454 0.3055556 0.003660397 2.9119563 11
## [13386] {chocolate,
## soda,
## tropical_fruit} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [13387] {chocolate,
## tropical_fruit,
## whole_milk} => {soda} 0.001423488 0.3589744 0.003965430 2.0586081 14
## [13388] {chocolate,
## soda,
## whole_milk} => {tropical_fruit} 0.001423488 0.2800000 0.005083884 2.6684109 14
## [13389] {chocolate,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [13390] {chocolate,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001220132 0.3428571 0.003558719 2.4577259 12
## [13391] {chocolate,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001220132 0.3333333 0.003660397 3.1766796 12
## [13392] {chocolate,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [13393] {chocolate,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001220132 0.3076923 0.003965430 2.2056515 12
## [13394] {chocolate,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001220132 0.2666667 0.004575496 2.5413437 12
## [13395] {chocolate,
## rolls/buns,
## tropical_fruit} => {other_vegetables} 0.001220132 0.4444444 0.002745297 2.2969580 12
## [13396] {chocolate,
## other_vegetables,
## tropical_fruit} => {rolls/buns} 0.001220132 0.3428571 0.003558719 1.8640133 12
## [13397] {chocolate,
## other_vegetables,
## rolls/buns} => {tropical_fruit} 0.001220132 0.3157895 0.003863752 3.0094859 12
## [13398] {chocolate,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001220132 0.4444444 0.002745297 1.7393996 12
## [13399] {chocolate,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001220132 0.3076923 0.003965430 1.6728324 12
## [13400] {chocolate,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001220132 0.2448980 0.004982206 2.3338870 12
## [13401] {chocolate,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001830198 0.5142857 0.003558719 2.0127338 18
## [13402] {chocolate,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001830198 0.4615385 0.003965430 2.3853026 18
## [13403] {chocolate,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001830198 0.3333333 0.005490595 3.1766796 18
## [13404] {chocolate,
## root_vegetables,
## soda} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [13405] {chocolate,
## root_vegetables,
## whole_milk} => {soda} 0.001220132 0.3428571 0.003558719 1.9661808 12
## [13406] {chocolate,
## soda,
## whole_milk} => {root_vegetables} 0.001220132 0.2400000 0.005083884 2.2018657 12
## [13407] {chocolate,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001525165 0.4545455 0.003355363 1.7789314 15
## [13408] {chocolate,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001525165 0.4285714 0.003558719 2.2149238 15
## [13409] {chocolate,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001525165 0.2777778 0.005490595 2.5484556 15
## [13410] {chocolate,
## soda,
## yogurt} => {rolls/buns} 0.001321810 0.4482759 0.002948653 2.4371438 13
## [13411] {chocolate,
## rolls/buns,
## soda} => {yogurt} 0.001321810 0.3250000 0.004067107 2.3297194 13
## [13412] {chocolate,
## rolls/buns,
## yogurt} => {soda} 0.001321810 0.3939394 0.003355363 2.2591218 13
## [13413] {chocolate,
## soda,
## yogurt} => {other_vegetables} 0.001321810 0.4482759 0.002948653 2.3167594 13
## [13414] {chocolate,
## other_vegetables,
## soda} => {yogurt} 0.001321810 0.3611111 0.003660397 2.5885771 13
## [13415] {chocolate,
## other_vegetables,
## yogurt} => {soda} 0.001321810 0.3611111 0.003660397 2.0708617 13
## [13416] {chocolate,
## soda,
## yogurt} => {whole_milk} 0.001423488 0.4827586 0.002948653 1.8893478 14
## [13417] {chocolate,
## soda,
## whole_milk} => {yogurt} 0.001423488 0.2800000 0.005083884 2.0071429 14
## [13418] {chocolate,
## whole_milk,
## yogurt} => {soda} 0.001423488 0.3111111 0.004575496 1.7841270 14
## [13419] {chocolate,
## rolls/buns,
## soda} => {other_vegetables} 0.001931876 0.4750000 0.004067107 2.4548739 19
## [13420] {chocolate,
## other_vegetables,
## soda} => {rolls/buns} 0.001931876 0.5277778 0.003660397 2.8693723 19
## [13421] {chocolate,
## other_vegetables,
## rolls/buns} => {soda} 0.001931876 0.5000000 0.003863752 2.8673469 19
## [13422] {chocolate,
## rolls/buns,
## soda} => {whole_milk} 0.001423488 0.3500000 0.004067107 1.3697772 14
## [13423] {chocolate,
## soda,
## whole_milk} => {rolls/buns} 0.001423488 0.2800000 0.005083884 1.5222775 14
## [13424] {chocolate,
## rolls/buns,
## whole_milk} => {soda} 0.001423488 0.2857143 0.004982206 1.6384840 14
## [13425] {chocolate,
## other_vegetables,
## soda} => {whole_milk} 0.001931876 0.5277778 0.003660397 2.0655370 19
## [13426] {chocolate,
## soda,
## whole_milk} => {other_vegetables} 0.001931876 0.3800000 0.005083884 1.9638991 19
## [13427] {chocolate,
## other_vegetables,
## whole_milk} => {soda} 0.001931876 0.3518519 0.005490595 2.0177627 19
## [13428] {chocolate,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001626843 0.4848485 0.003355363 2.5057724 16
## [13429] {chocolate,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001626843 0.4444444 0.003660397 2.4163135 16
## [13430] {chocolate,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001626843 0.4210526 0.003863752 3.0182599 16
## [13431] {chocolate,
## rolls/buns,
## yogurt} => {whole_milk} 0.001423488 0.4242424 0.003355363 1.6603360 14
## [13432] {chocolate,
## whole_milk,
## yogurt} => {rolls/buns} 0.001423488 0.3111111 0.004575496 1.6914194 14
## [13433] {chocolate,
## rolls/buns,
## whole_milk} => {yogurt} 0.001423488 0.2857143 0.004982206 2.0481050 14
## [13434] {chocolate,
## other_vegetables,
## yogurt} => {whole_milk} 0.001728521 0.4722222 0.003660397 1.8481120 17
## [13435] {chocolate,
## whole_milk,
## yogurt} => {other_vegetables} 0.001728521 0.3777778 0.004575496 1.9524143 17
## [13436] {chocolate,
## other_vegetables,
## whole_milk} => {yogurt} 0.001728521 0.3148148 0.005490595 2.2567082 17
## [13437] {chocolate,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.001728521 0.4473684 0.003863752 1.7508430 17
## [13438] {chocolate,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.001728521 0.3469388 0.004982206 1.7930336 17
## [13439] {chocolate,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.001728521 0.3148148 0.005490595 1.7115554 17
## [13440] {coffee,
## frozen_vegetables,
## yogurt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [13441] {coffee,
## frozen_vegetables,
## whole_milk} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [13442] {coffee,
## whole_milk,
## yogurt} => {frozen_vegetables} 0.001118454 0.2200000 0.005083884 4.5744186 11
## [13443] {coffee,
## napkins,
## yogurt} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [13444] {coffee,
## napkins,
## whole_milk} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [13445] {coffee,
## whole_milk,
## yogurt} => {napkins} 0.001016777 0.2000000 0.005083884 3.8194175 10
## [13446] {coffee,
## other_vegetables,
## pork} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [13447] {coffee,
## pork,
## whole_milk} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [13448] {coffee,
## frankfurter,
## rolls/buns} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [13449] {coffee,
## frankfurter,
## whole_milk} => {rolls/buns} 0.001016777 0.3846154 0.002643620 2.0910405 10
## [13450] {coffee,
## rolls/buns,
## whole_milk} => {frankfurter} 0.001016777 0.2173913 0.004677173 3.6862819 10
## [13451] {coffee,
## frankfurter,
## other_vegetables} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [13452] {coffee,
## frankfurter,
## whole_milk} => {other_vegetables} 0.001118454 0.4230769 0.002643620 2.1865273 11
## [13453] {bottled_beer,
## coffee,
## yogurt} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [13454] {bottled_beer,
## coffee,
## whole_milk} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [13455] {coffee,
## whole_milk,
## yogurt} => {bottled_beer} 0.001016777 0.2000000 0.005083884 2.4835859 10
## [13456] {bottled_beer,
## coffee,
## other_vegetables} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [13457] {bottled_beer,
## coffee,
## whole_milk} => {other_vegetables} 0.001220132 0.4800000 0.002541942 2.4807147 12
## [13458] {butter,
## coffee,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.9230769 0.001321810 3.6125991 12
## [13459] {butter,
## coffee,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.3636364 0.003355363 5.0728562 12
## [13460] {coffee,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001220132 0.3529412 0.003457041 6.3691311 12
## [13461] {butter,
## coffee,
## root_vegetables} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [13462] {butter,
## coffee,
## whole_milk} => {root_vegetables} 0.001220132 0.3636364 0.003355363 3.3361601 12
## [13463] {coffee,
## root_vegetables,
## whole_milk} => {butter} 0.001220132 0.3076923 0.003965430 5.5525759 12
## [13464] {butter,
## coffee,
## yogurt} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [13465] {butter,
## coffee,
## whole_milk} => {yogurt} 0.001220132 0.3636364 0.003355363 2.6066790 12
## [13466] {coffee,
## whole_milk,
## yogurt} => {butter} 0.001220132 0.2400000 0.005083884 4.3310092 12
## [13467] {butter,
## coffee,
## other_vegetables} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [13468] {butter,
## coffee,
## whole_milk} => {other_vegetables} 0.001321810 0.3939394 0.003355363 2.0359401 13
## [13469] {coffee,
## other_vegetables,
## whole_milk} => {butter} 0.001321810 0.2063492 0.006405694 3.7237513 13
## [13470] {coffee,
## domestic_eggs,
## root_vegetables} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [13471] {coffee,
## domestic_eggs,
## whole_milk} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [13472] {coffee,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001016777 0.2564103 0.003965430 4.0413379 10
## [13473] {coffee,
## domestic_eggs,
## yogurt} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [13474] {coffee,
## domestic_eggs,
## whole_milk} => {yogurt} 0.001016777 0.3703704 0.002745297 2.6549509 10
## [13475] {coffee,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001016777 0.2000000 0.005083884 3.1522436 10
## [13476] {coffee,
## domestic_eggs,
## other_vegetables} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [13477] {coffee,
## domestic_eggs,
## whole_milk} => {other_vegetables} 0.001220132 0.4444444 0.002745297 2.2969580 12
## [13478] {coffee,
## fruit/vegetable_juice,
## tropical_fruit} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [13479] {coffee,
## fruit/vegetable_juice,
## yogurt} => {tropical_fruit} 0.001016777 0.5263158 0.001931876 5.0158099 10
## [13480] {coffee,
## tropical_fruit,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.3333333 0.003050330 4.6108767 10
## [13481] {fruit/vegetable_juice,
## tropical_fruit,
## yogurt} => {coffee} 0.001016777 0.2083333 0.004880529 3.5883684 10
## [13482] {coffee,
## fruit/vegetable_juice,
## tropical_fruit} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [13483] {coffee,
## fruit/vegetable_juice,
## other_vegetables} => {tropical_fruit} 0.001016777 0.4166667 0.002440264 3.9708495 10
## [13484] {coffee,
## other_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.001016777 0.3846154 0.002643620 5.3202423 10
## [13485] {coffee,
## fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [13486] {coffee,
## fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.001220132 0.4615385 0.002643620 3.3084772 12
## [13487] {coffee,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001220132 0.2400000 0.005083884 3.3198312 12
## [13488] {coffee,
## fruit/vegetable_juice,
## other_vegetables} => {whole_milk} 0.001220132 0.5000000 0.002440264 1.9568245 12
## [13489] {coffee,
## fruit/vegetable_juice,
## whole_milk} => {other_vegetables} 0.001220132 0.4615385 0.002643620 2.3853026 12
## [13490] {coffee,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [13491] {coffee,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001016777 0.2941176 0.003457041 2.6983648 10
## [13492] {coffee,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2564103 0.003965430 3.5770140 10
## [13493] {coffee,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [13494] {coffee,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.3235294 0.003457041 2.3191777 11
## [13495] {coffee,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.2200000 0.005083884 3.0690780 11
## [13496] {coffee,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.002033554 0.7142857 0.002846975 2.7954636 20
## [13497] {coffee,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.002033554 0.5882353 0.003457041 3.0400915 20
## [13498] {coffee,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.002033554 0.3174603 0.006405694 4.4286840 20
## [13499] {coffee,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [13500] {coffee,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [13501] {coffee,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001016777 0.3846154 0.002643620 5.0842639 10
## [13502] {coffee,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001423488 0.7000000 0.002033554 2.7395543 14
## [13503] {coffee,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001423488 0.5384615 0.002643620 4.9400832 14
## [13504] {coffee,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001423488 0.3589744 0.003965430 4.7453129 14
## [13505] {coffee,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001118454 0.4400000 0.002541942 1.7220056 11
## [13506] {coffee,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001118454 0.4230769 0.002643620 2.1865273 11
## [13507] {coffee,
## pastry,
## tropical_fruit} => {yogurt} 0.001118454 0.5789474 0.001931876 4.1501074 11
## [13508] {coffee,
## pastry,
## yogurt} => {tropical_fruit} 0.001118454 0.5000000 0.002236909 4.7650194 11
## [13509] {coffee,
## tropical_fruit,
## yogurt} => {pastry} 0.001118454 0.3666667 0.003050330 4.1213333 11
## [13510] {pastry,
## tropical_fruit,
## yogurt} => {coffee} 0.001118454 0.2391304 0.004677173 4.1188228 11
## [13511] {coffee,
## pastry,
## yogurt} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [13512] {coffee,
## other_vegetables,
## pastry} => {yogurt} 0.001016777 0.5882353 0.001728521 4.2166867 10
## [13513] {coffee,
## other_vegetables,
## yogurt} => {pastry} 0.001016777 0.2857143 0.003558719 3.2114286 10
## [13514] {coffee,
## pastry,
## yogurt} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [13515] {coffee,
## pastry,
## whole_milk} => {yogurt} 0.001118454 0.4230769 0.002643620 3.0327708 11
## [13516] {coffee,
## whole_milk,
## yogurt} => {pastry} 0.001118454 0.2200000 0.005083884 2.4728000 11
## [13517] {citrus_fruit,
## coffee,
## other_vegetables} => {whole_milk} 0.001016777 0.4347826 0.002338587 1.7015865 10
## [13518] {citrus_fruit,
## coffee,
## whole_milk} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [13519] {coffee,
## sausage,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [13520] {coffee,
## sausage,
## whole_milk} => {yogurt} 0.001118454 0.4074074 0.002745297 2.9204460 11
## [13521] {coffee,
## whole_milk,
## yogurt} => {sausage} 0.001118454 0.2200000 0.005083884 2.3416667 11
## [13522] {coffee,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [13523] {coffee,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001016777 0.3333333 0.003050330 3.0581468 10
## [13524] {coffee,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001016777 0.4761905 0.002135231 4.5381137 10
## [13525] {coffee,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [13526] {coffee,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001118454 0.4230769 0.002643620 3.8814940 11
## [13527] {coffee,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001118454 0.3235294 0.003457041 3.0832478 11
## [13528] {coffee,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [13529] {coffee,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001220132 0.4444444 0.002745297 4.0775290 12
## [13530] {coffee,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001220132 0.3076923 0.003965430 2.9323196 12
## [13531] {coffee,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001423488 0.4666667 0.003050330 2.4118059 14
## [13532] {coffee,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001423488 0.5384615 0.002643620 3.8598901 14
## [13533] {coffee,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001423488 0.4000000 0.003558719 3.8120155 14
## [13534] {coffee,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001931876 0.6333333 0.003050330 2.4786444 19
## [13535] {coffee,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001931876 0.7037037 0.002745297 5.0444067 19
## [13536] {coffee,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001931876 0.3800000 0.005083884 3.6214147 19
## [13537] {coffee,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001118454 0.4230769 0.002643620 1.6557746 11
## [13538] {coffee,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001118454 0.4074074 0.002745297 2.1055449 11
## [13539] {coffee,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [13540] {coffee,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001118454 0.3235294 0.003457041 2.3191777 11
## [13541] {coffee,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001118454 0.3142857 0.003558719 2.8833955 11
## [13542] {coffee,
## root_vegetables,
## yogurt} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [13543] {coffee,
## root_vegetables,
## whole_milk} => {yogurt} 0.001321810 0.3333333 0.003965430 2.3894558 13
## [13544] {coffee,
## whole_milk,
## yogurt} => {root_vegetables} 0.001321810 0.2600000 0.005083884 2.3853545 13
## [13545] {coffee,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [13546] {coffee,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001220132 0.3076923 0.003965430 1.6728324 12
## [13547] {coffee,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001220132 0.2608696 0.004677173 2.3933323 12
## [13548] {coffee,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001728521 0.5000000 0.003457041 1.9568245 17
## [13549] {coffee,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001728521 0.4358974 0.003965430 2.2527857 17
## [13550] {coffee,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001728521 0.2698413 0.006405694 2.4756426 17
## [13551] {coffee,
## soda,
## yogurt} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [13552] {coffee,
## other_vegetables,
## soda} => {yogurt} 0.001016777 0.3846154 0.002643620 2.7570644 10
## [13553] {coffee,
## other_vegetables,
## yogurt} => {soda} 0.001016777 0.2857143 0.003558719 1.6384840 10
## [13554] {coffee,
## soda,
## yogurt} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [13555] {coffee,
## soda,
## whole_milk} => {yogurt} 0.001016777 0.3125000 0.003253686 2.2401148 10
## [13556] {coffee,
## whole_milk,
## yogurt} => {soda} 0.001016777 0.2000000 0.005083884 1.1469388 10
## [13557] {coffee,
## other_vegetables,
## soda} => {whole_milk} 0.001321810 0.5000000 0.002643620 1.9568245 13
## [13558] {coffee,
## soda,
## whole_milk} => {other_vegetables} 0.001321810 0.4062500 0.003253686 2.0995632 13
## [13559] {coffee,
## other_vegetables,
## whole_milk} => {soda} 0.001321810 0.2063492 0.006405694 1.1833495 13
## [13560] {coffee,
## rolls/buns,
## yogurt} => {whole_milk} 0.001626843 0.6956522 0.002338587 2.7225385 16
## [13561] {coffee,
## whole_milk,
## yogurt} => {rolls/buns} 0.001626843 0.3200000 0.005083884 1.7397457 16
## [13562] {coffee,
## rolls/buns,
## whole_milk} => {yogurt} 0.001626843 0.3478261 0.004677173 2.4933452 16
## [13563] {coffee,
## other_vegetables,
## yogurt} => {whole_milk} 0.002236909 0.6285714 0.003558719 2.4600080 22
## [13564] {coffee,
## whole_milk,
## yogurt} => {other_vegetables} 0.002236909 0.4400000 0.005083884 2.2739884 22
## [13565] {coffee,
## other_vegetables,
## whole_milk} => {yogurt} 0.002236909 0.3492063 0.006405694 2.5032394 22
## [13566] {coffee,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.001525165 0.5172414 0.002948653 2.0243012 15
## [13567] {coffee,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.001525165 0.3260870 0.004677173 1.6852681 15
## [13568] {coffee,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.001525165 0.2380952 0.006405694 1.2944537 15
## [13569] {beef,
## frozen_vegetables,
## other_vegetables} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [13570] {beef,
## frozen_vegetables,
## whole_milk} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [13571] {curd,
## frozen_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [13572] {curd,
## frozen_vegetables,
## other_vegetables} => {whipped/sour_cream} 0.001016777 0.5000000 0.002033554 6.9751773 10
## [13573] {frozen_vegetables,
## other_vegetables,
## whipped/sour_cream} => {curd} 0.001016777 0.2564103 0.003965430 4.8125856 10
## [13574] {curd,
## other_vegetables,
## whipped/sour_cream} => {frozen_vegetables} 0.001016777 0.2325581 0.004372140 4.8355376 10
## [13575] {curd,
## frozen_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [13576] {curd,
## frozen_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.3571429 0.002846975 4.9822695 10
## [13577] {frozen_vegetables,
## whipped/sour_cream,
## whole_milk} => {curd} 0.001016777 0.2631579 0.003863752 4.9392326 10
## [13578] {curd,
## frozen_vegetables,
## tropical_fruit} => {yogurt} 0.001016777 0.6666667 0.001525165 4.7789116 10
## [13579] {curd,
## frozen_vegetables,
## yogurt} => {tropical_fruit} 0.001016777 0.4761905 0.002135231 4.5381137 10
## [13580] {frozen_vegetables,
## tropical_fruit,
## yogurt} => {curd} 0.001016777 0.3030303 0.003355363 5.6876012 10
## [13581] {curd,
## frozen_vegetables,
## tropical_fruit} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [13582] {curd,
## frozen_vegetables,
## whole_milk} => {tropical_fruit} 0.001118454 0.3928571 0.002846975 3.7439438 11
## [13583] {frozen_vegetables,
## tropical_fruit,
## whole_milk} => {curd} 0.001118454 0.2244898 0.004982206 4.2134678 11
## [13584] {curd,
## frozen_vegetables,
## root_vegetables} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [13585] {curd,
## frozen_vegetables,
## whole_milk} => {root_vegetables} 0.001220132 0.4285714 0.002846975 3.9319030 12
## [13586] {curd,
## frozen_vegetables,
## yogurt} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [13587] {curd,
## frozen_vegetables,
## other_vegetables} => {yogurt} 0.001118454 0.5500000 0.002033554 3.9426020 11
## [13588] {frozen_vegetables,
## other_vegetables,
## yogurt} => {curd} 0.001118454 0.2115385 0.005287239 3.9703831 11
## [13589] {curd,
## frozen_vegetables,
## yogurt} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [13590] {curd,
## frozen_vegetables,
## whole_milk} => {yogurt} 0.001321810 0.4642857 0.002846975 3.3281706 13
## [13591] {frozen_vegetables,
## whole_milk,
## yogurt} => {curd} 0.001321810 0.2166667 0.006100661 4.0666349 13
## [13592] {curd,
## frozen_vegetables,
## other_vegetables} => {whole_milk} 0.001423488 0.7000000 0.002033554 2.7395543 14
## [13593] {curd,
## frozen_vegetables,
## whole_milk} => {other_vegetables} 0.001423488 0.5000000 0.002846975 2.5840778 14
## [13594] {citrus_fruit,
## frozen_vegetables,
## napkins} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [13595] {frozen_vegetables,
## napkins,
## whole_milk} => {citrus_fruit} 0.001118454 0.4230769 0.002643620 5.1117464 11
## [13596] {citrus_fruit,
## frozen_vegetables,
## whole_milk} => {napkins} 0.001118454 0.3142857 0.003558719 6.0019417 11
## [13597] {citrus_fruit,
## napkins,
## whole_milk} => {frozen_vegetables} 0.001118454 0.3333333 0.003355363 6.9309373 11
## [13598] {frozen_vegetables,
## napkins,
## root_vegetables} => {whole_milk} 0.001423488 0.7368421 0.001931876 2.8837414 14
## [13599] {frozen_vegetables,
## napkins,
## whole_milk} => {root_vegetables} 0.001423488 0.5384615 0.002643620 4.9400832 14
## [13600] {frozen_vegetables,
## root_vegetables,
## whole_milk} => {napkins} 0.001423488 0.2295082 0.006202339 4.3829381 14
## [13601] {napkins,
## root_vegetables,
## whole_milk} => {frozen_vegetables} 0.001423488 0.2916667 0.004880529 6.0645701 14
## [13602] {frozen_vegetables,
## napkins,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [13603] {frozen_vegetables,
## napkins,
## whole_milk} => {yogurt} 0.001016777 0.3846154 0.002643620 2.7570644 10
## [13604] {frozen_vegetables,
## napkins,
## other_vegetables} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [13605] {frozen_vegetables,
## napkins,
## whole_milk} => {other_vegetables} 0.001321810 0.5000000 0.002643620 2.5840778 13
## [13606] {frozen_vegetables,
## pork,
## tropical_fruit} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [13607] {frozen_vegetables,
## pork,
## yogurt} => {tropical_fruit} 0.001016777 0.5555556 0.001830198 5.2944660 10
## [13608] {frozen_vegetables,
## tropical_fruit,
## yogurt} => {pork} 0.001016777 0.3030303 0.003355363 5.2562664 10
## [13609] {pork,
## tropical_fruit,
## yogurt} => {frozen_vegetables} 0.001016777 0.3703704 0.002745297 7.7010414 10
## [13610] {frozen_vegetables,
## pork,
## tropical_fruit} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [13611] {frozen_vegetables,
## pork,
## whole_milk} => {tropical_fruit} 0.001220132 0.3870968 0.003152008 3.6890473 12
## [13612] {frozen_vegetables,
## tropical_fruit,
## whole_milk} => {pork} 0.001220132 0.2448980 0.004982206 4.2479214 12
## [13613] {pork,
## tropical_fruit,
## whole_milk} => {frozen_vegetables} 0.001220132 0.3157895 0.003863752 6.5661511 12
## [13614] {frozen_vegetables,
## pork,
## root_vegetables} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [13615] {frozen_vegetables,
## pork,
## whole_milk} => {root_vegetables} 0.001118454 0.3548387 0.003152008 3.2554466 11
## [13616] {frozen_vegetables,
## pork,
## rolls/buns} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [13617] {frozen_vegetables,
## pork,
## whole_milk} => {rolls/buns} 0.001016777 0.3225806 0.003152008 1.7537759 10
## [13618] {frozen_vegetables,
## rolls/buns,
## whole_milk} => {pork} 0.001016777 0.2000000 0.005083884 3.4691358 10
## [13619] {frozen_vegetables,
## other_vegetables,
## pork} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [13620] {frozen_vegetables,
## pork,
## whole_milk} => {other_vegetables} 0.001423488 0.4516129 0.003152008 2.3340057 14
## [13621] {frankfurter,
## frozen_vegetables,
## root_vegetables} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [13622] {frankfurter,
## frozen_vegetables,
## whole_milk} => {root_vegetables} 0.001118454 0.4400000 0.002541942 4.0367537 11
## [13623] {frankfurter,
## root_vegetables,
## whole_milk} => {frozen_vegetables} 0.001118454 0.2200000 0.005083884 4.5744186 11
## [13624] {bottled_beer,
## frozen_vegetables,
## yogurt} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [13625] {bottled_beer,
## frozen_vegetables,
## other_vegetables} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [13626] {bottled_beer,
## other_vegetables,
## yogurt} => {frozen_vegetables} 0.001016777 0.2777778 0.003660397 5.7757811 10
## [13627] {bottled_beer,
## frozen_vegetables,
## yogurt} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [13628] {bottled_beer,
## frozen_vegetables,
## whole_milk} => {yogurt} 0.001321810 0.5909091 0.002236909 4.2358534 13
## [13629] {frozen_vegetables,
## whole_milk,
## yogurt} => {bottled_beer} 0.001321810 0.2166667 0.006100661 2.6905513 13
## [13630] {bottled_beer,
## whole_milk,
## yogurt} => {frozen_vegetables} 0.001321810 0.2549020 0.005185562 5.3001285 13
## [13631] {bottled_beer,
## frozen_vegetables,
## other_vegetables} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [13632] {bottled_beer,
## frozen_vegetables,
## whole_milk} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [13633] {brown_bread,
## frozen_vegetables,
## other_vegetables} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [13634] {brown_bread,
## frozen_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [13635] {frozen_vegetables,
## margarine,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [13636] {frozen_vegetables,
## margarine,
## other_vegetables} => {whipped/sour_cream} 0.001016777 0.4347826 0.002338587 6.0653716 10
## [13637] {frozen_vegetables,
## other_vegetables,
## whipped/sour_cream} => {margarine} 0.001016777 0.2564103 0.003965430 4.3781161 10
## [13638] {margarine,
## other_vegetables,
## whipped/sour_cream} => {frozen_vegetables} 0.001016777 0.2941176 0.003457041 6.1155329 10
## [13639] {frozen_vegetables,
## margarine,
## root_vegetables} => {other_vegetables} 0.001118454 0.7857143 0.001423488 4.0606936 11
## [13640] {frozen_vegetables,
## margarine,
## other_vegetables} => {root_vegetables} 0.001118454 0.4782609 0.002338587 4.3877758 11
## [13641] {frozen_vegetables,
## margarine,
## root_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [13642] {frozen_vegetables,
## margarine,
## whole_milk} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [13643] {margarine,
## root_vegetables,
## whole_milk} => {frozen_vegetables} 0.001016777 0.2040816 0.004982206 4.2434310 10
## [13644] {frozen_vegetables,
## margarine,
## yogurt} => {whole_milk} 0.001423488 0.7368421 0.001931876 2.8837414 14
## [13645] {frozen_vegetables,
## margarine,
## whole_milk} => {yogurt} 0.001423488 0.5185185 0.002745297 3.7169312 14
## [13646] {frozen_vegetables,
## whole_milk,
## yogurt} => {margarine} 0.001423488 0.2333333 0.006100661 3.9840856 14
## [13647] {margarine,
## whole_milk,
## yogurt} => {frozen_vegetables} 0.001423488 0.2028986 0.007015760 4.2188314 14
## [13648] {frozen_vegetables,
## margarine,
## rolls/buns} => {whole_milk} 0.001321810 0.8666667 0.001525165 3.3918292 13
## [13649] {frozen_vegetables,
## margarine,
## whole_milk} => {rolls/buns} 0.001321810 0.4814815 0.002745297 2.6176730 13
## [13650] {frozen_vegetables,
## rolls/buns,
## whole_milk} => {margarine} 0.001321810 0.2600000 0.005083884 4.4394097 13
## [13651] {frozen_vegetables,
## margarine,
## other_vegetables} => {whole_milk} 0.001220132 0.5217391 0.002338587 2.0419038 12
## [13652] {frozen_vegetables,
## margarine,
## whole_milk} => {other_vegetables} 0.001220132 0.4444444 0.002745297 2.2969580 12
## [13653] {butter,
## citrus_fruit,
## frozen_vegetables} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [13654] {butter,
## frozen_vegetables,
## whole_milk} => {citrus_fruit} 0.001016777 0.3225806 0.003152008 3.8975192 10
## [13655] {citrus_fruit,
## frozen_vegetables,
## whole_milk} => {butter} 0.001016777 0.2857143 0.003558719 5.1559633 10
## [13656] {butter,
## citrus_fruit,
## whole_milk} => {frozen_vegetables} 0.001016777 0.2000000 0.005083884 4.1585624 10
## [13657] {butter,
## frozen_vegetables,
## tropical_fruit} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [13658] {butter,
## frozen_vegetables,
## whole_milk} => {tropical_fruit} 0.001016777 0.3225806 0.003152008 3.0742061 10
## [13659] {frozen_vegetables,
## tropical_fruit,
## whole_milk} => {butter} 0.001016777 0.2040816 0.004982206 3.6828309 10
## [13660] {butter,
## frozen_vegetables,
## root_vegetables} => {other_vegetables} 0.001321810 0.7647059 0.001728521 3.9521189 13
## [13661] {butter,
## frozen_vegetables,
## other_vegetables} => {root_vegetables} 0.001321810 0.5200000 0.002541942 4.7707090 13
## [13662] {frozen_vegetables,
## other_vegetables,
## root_vegetables} => {butter} 0.001321810 0.2166667 0.006100661 3.9099388 13
## [13663] {butter,
## other_vegetables,
## root_vegetables} => {frozen_vegetables} 0.001321810 0.2000000 0.006609049 4.1585624 13
## [13664] {butter,
## frozen_vegetables,
## root_vegetables} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [13665] {butter,
## frozen_vegetables,
## whole_milk} => {root_vegetables} 0.001118454 0.3548387 0.003152008 3.2554466 11
## [13666] {butter,
## frozen_vegetables,
## yogurt} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [13667] {butter,
## frozen_vegetables,
## other_vegetables} => {yogurt} 0.001220132 0.4800000 0.002541942 3.4408163 12
## [13668] {frozen_vegetables,
## other_vegetables,
## yogurt} => {butter} 0.001220132 0.2307692 0.005287239 4.1644319 12
## [13669] {butter,
## frozen_vegetables,
## yogurt} => {whole_milk} 0.001525165 0.6818182 0.002236909 2.6683971 15
## [13670] {butter,
## frozen_vegetables,
## whole_milk} => {yogurt} 0.001525165 0.4838710 0.003152008 3.4685648 15
## [13671] {frozen_vegetables,
## whole_milk,
## yogurt} => {butter} 0.001525165 0.2500000 0.006100661 4.5114679 15
## [13672] {butter,
## frozen_vegetables,
## rolls/buns} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [13673] {butter,
## frozen_vegetables,
## other_vegetables} => {rolls/buns} 0.001016777 0.4000000 0.002541942 2.1746821 10
## [13674] {frozen_vegetables,
## other_vegetables,
## rolls/buns} => {butter} 0.001016777 0.2380952 0.004270463 4.2966361 10
## [13675] {butter,
## frozen_vegetables,
## rolls/buns} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [13676] {butter,
## frozen_vegetables,
## whole_milk} => {rolls/buns} 0.001220132 0.3870968 0.003152008 2.1045311 12
## [13677] {frozen_vegetables,
## rolls/buns,
## whole_milk} => {butter} 0.001220132 0.2400000 0.005083884 4.3310092 12
## [13678] {butter,
## frozen_vegetables,
## other_vegetables} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [13679] {butter,
## frozen_vegetables,
## whole_milk} => {other_vegetables} 0.001525165 0.4838710 0.003152008 2.5007204 15
## [13680] {domestic_eggs,
## frozen_vegetables,
## root_vegetables} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [13681] {domestic_eggs,
## frozen_vegetables,
## whole_milk} => {root_vegetables} 0.001016777 0.4166667 0.002440264 3.8226835 10
## [13682] {domestic_eggs,
## frozen_vegetables,
## other_vegetables} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [13683] {domestic_eggs,
## frozen_vegetables,
## whole_milk} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [13684] {frozen_vegetables,
## fruit/vegetable_juice,
## whipped/sour_cream} => {yogurt} 0.001321810 0.6190476 0.002135231 4.4375607 13
## [13685] {frozen_vegetables,
## fruit/vegetable_juice,
## yogurt} => {whipped/sour_cream} 0.001321810 0.4193548 0.003152008 5.8501487 13
## [13686] {frozen_vegetables,
## whipped/sour_cream,
## yogurt} => {fruit/vegetable_juice} 0.001321810 0.3939394 0.003355363 5.4492179 13
## [13687] {fruit/vegetable_juice,
## whipped/sour_cream,
## yogurt} => {frozen_vegetables} 0.001321810 0.3421053 0.003863752 7.1133304 13
## [13688] {frozen_vegetables,
## fruit/vegetable_juice,
## whipped/sour_cream} => {other_vegetables} 0.001525165 0.7142857 0.002135231 3.6915397 15
## [13689] {frozen_vegetables,
## fruit/vegetable_juice,
## other_vegetables} => {whipped/sour_cream} 0.001525165 0.4054054 0.003762074 5.6555492 15
## [13690] {frozen_vegetables,
## other_vegetables,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001525165 0.3846154 0.003965430 5.3202423 15
## [13691] {fruit/vegetable_juice,
## other_vegetables,
## whipped/sour_cream} => {frozen_vegetables} 0.001525165 0.3571429 0.004270463 7.4260042 15
## [13692] {frozen_vegetables,
## fruit/vegetable_juice,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [13693] {frozen_vegetables,
## fruit/vegetable_juice,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.2619048 0.004270463 3.6536643 11
## [13694] {frozen_vegetables,
## whipped/sour_cream,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.2894737 0.003863752 4.0041824 11
## [13695] {fruit/vegetable_juice,
## whipped/sour_cream,
## whole_milk} => {frozen_vegetables} 0.001118454 0.2500000 0.004473818 5.1982030 11
## [13696] {frozen_vegetables,
## fruit/vegetable_juice,
## pip_fruit} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [13697] {frozen_vegetables,
## fruit/vegetable_juice,
## whole_milk} => {pip_fruit} 0.001118454 0.2619048 0.004270463 3.4621416 11
## [13698] {frozen_vegetables,
## pip_fruit,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.2972973 0.003762074 4.1124035 11
## [13699] {fruit/vegetable_juice,
## pip_fruit,
## whole_milk} => {frozen_vegetables} 0.001118454 0.2340426 0.004778851 4.8664028 11
## [13700] {citrus_fruit,
## frozen_vegetables,
## fruit/vegetable_juice} => {root_vegetables} 0.001016777 0.5263158 0.001931876 4.8286528 10
## [13701] {frozen_vegetables,
## fruit/vegetable_juice,
## root_vegetables} => {citrus_fruit} 0.001016777 0.3846154 0.002643620 4.6470421 10
## [13702] {citrus_fruit,
## frozen_vegetables,
## root_vegetables} => {fruit/vegetable_juice} 0.001016777 0.3846154 0.002643620 5.3202423 10
## [13703] {citrus_fruit,
## fruit/vegetable_juice,
## root_vegetables} => {frozen_vegetables} 0.001016777 0.2941176 0.003457041 6.1155329 10
## [13704] {citrus_fruit,
## frozen_vegetables,
## fruit/vegetable_juice} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [13705] {frozen_vegetables,
## fruit/vegetable_juice,
## other_vegetables} => {citrus_fruit} 0.001220132 0.3243243 0.003762074 3.9185869 12
## [13706] {citrus_fruit,
## frozen_vegetables,
## other_vegetables} => {fruit/vegetable_juice} 0.001220132 0.3750000 0.003253686 5.1872363 12
## [13707] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables} => {frozen_vegetables} 0.001220132 0.2553191 0.004778851 5.3088030 12
## [13708] {citrus_fruit,
## frozen_vegetables,
## fruit/vegetable_juice} => {whole_milk} 0.001626843 0.8421053 0.001931876 3.2957044 16
## [13709] {frozen_vegetables,
## fruit/vegetable_juice,
## whole_milk} => {citrus_fruit} 0.001626843 0.3809524 0.004270463 4.6027846 16
## [13710] {citrus_fruit,
## frozen_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001626843 0.4571429 0.003558719 6.3234880 16
## [13711] {citrus_fruit,
## fruit/vegetable_juice,
## whole_milk} => {frozen_vegetables} 0.001626843 0.3809524 0.004270463 7.9210712 16
## [13712] {frozen_vegetables,
## fruit/vegetable_juice,
## sausage} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [13713] {frozen_vegetables,
## fruit/vegetable_juice,
## whole_milk} => {sausage} 0.001220132 0.2857143 0.004270463 3.0411255 12
## [13714] {frozen_vegetables,
## sausage,
## whole_milk} => {fruit/vegetable_juice} 0.001220132 0.4137931 0.002948653 5.7238469 12
## [13715] {fruit/vegetable_juice,
## sausage,
## whole_milk} => {frozen_vegetables} 0.001220132 0.2500000 0.004880529 5.1982030 12
## [13716] {bottled_water,
## frozen_vegetables,
## fruit/vegetable_juice} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [13717] {frozen_vegetables,
## fruit/vegetable_juice,
## whole_milk} => {bottled_water} 0.001321810 0.3095238 0.004270463 2.8005213 13
## [13718] {bottled_water,
## frozen_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001321810 0.4062500 0.003253686 5.6195060 13
## [13719] {bottled_water,
## fruit/vegetable_juice,
## whole_milk} => {frozen_vegetables} 0.001321810 0.2280702 0.005795628 4.7422202 13
## [13720] {frozen_vegetables,
## fruit/vegetable_juice,
## tropical_fruit} => {other_vegetables} 0.001321810 0.7647059 0.001728521 3.9521189 13
## [13721] {frozen_vegetables,
## fruit/vegetable_juice,
## other_vegetables} => {tropical_fruit} 0.001321810 0.3513514 0.003762074 3.3483920 13
## [13722] {frozen_vegetables,
## other_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.001321810 0.3170732 0.004168785 4.3859559 13
## [13723] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit} => {frozen_vegetables} 0.001321810 0.2000000 0.006609049 4.1585624 13
## [13724] {frozen_vegetables,
## fruit/vegetable_juice,
## root_vegetables} => {other_vegetables} 0.001423488 0.5384615 0.002643620 2.7828530 14
## [13725] {frozen_vegetables,
## fruit/vegetable_juice,
## other_vegetables} => {root_vegetables} 0.001423488 0.3783784 0.003762074 3.4714098 14
## [13726] {frozen_vegetables,
## other_vegetables,
## root_vegetables} => {fruit/vegetable_juice} 0.001423488 0.2333333 0.006100661 3.2276137 14
## [13727] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {frozen_vegetables} 0.001423488 0.2153846 0.006609049 4.4784518 14
## [13728] {frozen_vegetables,
## fruit/vegetable_juice,
## root_vegetables} => {whole_milk} 0.001830198 0.6923077 0.002643620 2.7094493 18
## [13729] {frozen_vegetables,
## fruit/vegetable_juice,
## whole_milk} => {root_vegetables} 0.001830198 0.4285714 0.004270463 3.9319030 18
## [13730] {frozen_vegetables,
## root_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001830198 0.2950820 0.006202339 4.0817597 18
## [13731] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {frozen_vegetables} 0.001830198 0.2812500 0.006507372 5.8479783 18
## [13732] {frozen_vegetables,
## fruit/vegetable_juice,
## soda} => {yogurt} 0.001016777 0.4545455 0.002236909 3.2583488 10
## [13733] {frozen_vegetables,
## fruit/vegetable_juice,
## yogurt} => {soda} 0.001016777 0.3225806 0.003152008 1.8499013 10
## [13734] {frozen_vegetables,
## soda,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.3571429 0.002846975 4.9402250 10
## [13735] {fruit/vegetable_juice,
## soda,
## yogurt} => {frozen_vegetables} 0.001016777 0.2000000 0.005083884 4.1585624 10
## [13736] {frozen_vegetables,
## fruit/vegetable_juice,
## soda} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [13737] {frozen_vegetables,
## fruit/vegetable_juice,
## whole_milk} => {soda} 0.001016777 0.2380952 0.004270463 1.3654033 10
## [13738] {frozen_vegetables,
## soda,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.3448276 0.002948653 4.7698724 10
## [13739] {frozen_vegetables,
## fruit/vegetable_juice,
## yogurt} => {other_vegetables} 0.001830198 0.5806452 0.003152008 3.0008645 18
## [13740] {frozen_vegetables,
## fruit/vegetable_juice,
## other_vegetables} => {yogurt} 0.001830198 0.4864865 0.003762074 3.4873138 18
## [13741] {frozen_vegetables,
## other_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.001830198 0.3461538 0.005287239 4.7882181 18
## [13742] {fruit/vegetable_juice,
## other_vegetables,
## yogurt} => {frozen_vegetables} 0.001830198 0.2222222 0.008235892 4.6206249 18
## [13743] {frozen_vegetables,
## fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.002135231 0.6774194 0.003152008 2.6511816 21
## [13744] {frozen_vegetables,
## fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.002135231 0.5000000 0.004270463 3.5841837 21
## [13745] {frozen_vegetables,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.002135231 0.3500000 0.006100661 4.8414205 21
## [13746] {fruit/vegetable_juice,
## whole_milk,
## yogurt} => {frozen_vegetables} 0.002135231 0.2258065 0.009456024 4.6951511 21
## [13747] {frozen_vegetables,
## fruit/vegetable_juice,
## other_vegetables} => {whole_milk} 0.002236909 0.5945946 0.003762074 2.3270346 22
## [13748] {frozen_vegetables,
## fruit/vegetable_juice,
## whole_milk} => {other_vegetables} 0.002236909 0.5238095 0.004270463 2.7071291 22
## [13749] {frozen_vegetables,
## other_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.002236909 0.2315789 0.009659380 3.2033459 22
## [13750] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {frozen_vegetables} 0.002236909 0.2135922 0.010472801 4.4411831 22
## [13751] {citrus_fruit,
## frozen_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001118454 0.6111111 0.001830198 5.6066024 11
## [13752] {frozen_vegetables,
## root_vegetables,
## whipped/sour_cream} => {citrus_fruit} 0.001118454 0.4074074 0.002745297 4.9224224 11
## [13753] {citrus_fruit,
## frozen_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.001118454 0.4230769 0.002643620 5.9020731 11
## [13754] {citrus_fruit,
## root_vegetables,
## whipped/sour_cream} => {frozen_vegetables} 0.001118454 0.3333333 0.003355363 6.9309373 11
## [13755] {citrus_fruit,
## frozen_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [13756] {frozen_vegetables,
## other_vegetables,
## whipped/sour_cream} => {citrus_fruit} 0.001220132 0.3076923 0.003965430 3.7176337 12
## [13757] {citrus_fruit,
## frozen_vegetables,
## other_vegetables} => {whipped/sour_cream} 0.001220132 0.3750000 0.003253686 5.2313830 12
## [13758] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream} => {frozen_vegetables} 0.001220132 0.2142857 0.005693950 4.4556025 12
## [13759] {citrus_fruit,
## frozen_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [13760] {frozen_vegetables,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.001118454 0.2894737 0.003863752 3.4975107 11
## [13761] {citrus_fruit,
## frozen_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.3142857 0.003558719 4.3843972 11
## [13762] {frozen_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {root_vegetables} 0.001118454 0.4782609 0.002338587 4.3877758 11
## [13763] {frozen_vegetables,
## root_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001118454 0.4074074 0.002745297 3.8826084 11
## [13764] {frozen_vegetables,
## root_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001118454 0.3666667 0.003050330 5.1151300 11
## [13765] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {frozen_vegetables} 0.001118454 0.2444444 0.004575496 5.0826873 11
## [13766] {frozen_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001016777 0.4347826 0.002338587 3.1166815 10
## [13767] {frozen_vegetables,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001016777 0.3030303 0.003355363 2.8878905 10
## [13768] {frozen_vegetables,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3030303 0.003355363 4.2273802 10
## [13769] {frozen_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.6086957 0.002338587 3.1458338 14
## [13770] {frozen_vegetables,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001423488 0.3589744 0.003965430 3.4210396 14
## [13771] {frozen_vegetables,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001423488 0.3414634 0.004168785 4.7635357 14
## [13772] {frozen_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.5217391 0.002338587 2.0419038 12
## [13773] {frozen_vegetables,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001220132 0.3157895 0.003863752 3.0094859 12
## [13774] {frozen_vegetables,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.2448980 0.004982206 3.4164134 12
## [13775] {frozen_vegetables,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001321810 0.4814815 0.002745297 3.4514361 13
## [13776] {frozen_vegetables,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001321810 0.3939394 0.003355363 3.6141735 13
## [13777] {frozen_vegetables,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001321810 0.5200000 0.002541942 7.2541844 13
## [13778] {root_vegetables,
## whipped/sour_cream,
## yogurt} => {frozen_vegetables} 0.001321810 0.2063492 0.006405694 4.2905802 13
## [13779] {frozen_vegetables,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001626843 0.5925926 0.002745297 3.0626107 16
## [13780] {frozen_vegetables,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001626843 0.4102564 0.003965430 3.7638729 16
## [13781] {frozen_vegetables,
## other_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.001626843 0.2666667 0.006100661 3.7200946 16
## [13782] {frozen_vegetables,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001728521 0.6296296 0.002745297 2.4641494 17
## [13783] {frozen_vegetables,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001728521 0.4473684 0.003863752 4.1043549 17
## [13784] {frozen_vegetables,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001728521 0.2786885 0.006202339 3.8878037 17
## [13785] {frozen_vegetables,
## soda,
## whipped/sour_cream} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [13786] {frozen_vegetables,
## whipped/sour_cream,
## yogurt} => {soda} 0.001016777 0.3030303 0.003355363 1.7377860 10
## [13787] {frozen_vegetables,
## soda,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3571429 0.002846975 4.9822695 10
## [13788] {soda,
## whipped/sour_cream,
## yogurt} => {frozen_vegetables} 0.001016777 0.2500000 0.004067107 5.1982030 10
## [13789] {frozen_vegetables,
## soda,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [13790] {frozen_vegetables,
## whipped/sour_cream,
## whole_milk} => {soda} 0.001016777 0.2631579 0.003863752 1.5091300 10
## [13791] {frozen_vegetables,
## soda,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.3448276 0.002948653 4.8104671 10
## [13792] {frozen_vegetables,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.002236909 0.6666667 0.003355363 3.4454370 22
## [13793] {frozen_vegetables,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.002236909 0.5641026 0.003965430 4.0436944 22
## [13794] {frozen_vegetables,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.002236909 0.4230769 0.005287239 5.9020731 22
## [13795] {other_vegetables,
## whipped/sour_cream,
## yogurt} => {frozen_vegetables} 0.002236909 0.2200000 0.010167768 4.5744186 22
## [13796] {frozen_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001728521 0.5151515 0.003355363 2.0161222 17
## [13797] {frozen_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001728521 0.4473684 0.003863752 3.2069012 17
## [13798] {frozen_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001728521 0.2833333 0.006100661 3.9526005 17
## [13799] {frozen_vegetables,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.002440264 0.6153846 0.003965430 2.4083994 24
## [13800] {frozen_vegetables,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.002440264 0.6315789 0.003863752 3.2640982 24
## [13801] {frozen_vegetables,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.002440264 0.2526316 0.009659380 3.5243001 24
## [13802] {citrus_fruit,
## frozen_vegetables,
## pip_fruit} => {root_vegetables} 0.001016777 0.6250000 0.001626843 5.7340252 10
## [13803] {frozen_vegetables,
## pip_fruit,
## root_vegetables} => {citrus_fruit} 0.001016777 0.4761905 0.002135231 5.7534808 10
## [13804] {citrus_fruit,
## frozen_vegetables,
## root_vegetables} => {pip_fruit} 0.001016777 0.3846154 0.002643620 5.0842639 10
## [13805] {citrus_fruit,
## pip_fruit,
## root_vegetables} => {frozen_vegetables} 0.001016777 0.2631579 0.003863752 5.4717926 10
## [13806] {citrus_fruit,
## frozen_vegetables,
## pip_fruit} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [13807] {frozen_vegetables,
## other_vegetables,
## pip_fruit} => {citrus_fruit} 0.001118454 0.3333333 0.003355363 4.0274365 11
## [13808] {citrus_fruit,
## frozen_vegetables,
## other_vegetables} => {pip_fruit} 0.001118454 0.3437500 0.003253686 4.5440608 11
## [13809] {citrus_fruit,
## frozen_vegetables,
## pip_fruit} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [13810] {frozen_vegetables,
## pip_fruit,
## whole_milk} => {citrus_fruit} 0.001016777 0.2702703 0.003762074 3.2654891 10
## [13811] {citrus_fruit,
## frozen_vegetables,
## whole_milk} => {pip_fruit} 0.001016777 0.2857143 0.003558719 3.7768817 10
## [13812] {bottled_water,
## frozen_vegetables,
## pip_fruit} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [13813] {frozen_vegetables,
## pip_fruit,
## whole_milk} => {bottled_water} 0.001118454 0.2972973 0.003762074 2.6898978 11
## [13814] {bottled_water,
## frozen_vegetables,
## whole_milk} => {pip_fruit} 0.001118454 0.3437500 0.003253686 4.5440608 11
## [13815] {bottled_water,
## pip_fruit,
## whole_milk} => {frozen_vegetables} 0.001118454 0.2444444 0.004575496 5.0826873 11
## [13816] {frozen_vegetables,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [13817] {frozen_vegetables,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001016777 0.3030303 0.003355363 2.8878905 10
## [13818] {frozen_vegetables,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001016777 0.2439024 0.004168785 3.2241673 10
## [13819] {frozen_vegetables,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [13820] {frozen_vegetables,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001423488 0.3783784 0.003762074 3.6059606 14
## [13821] {frozen_vegetables,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001423488 0.2857143 0.004982206 3.7768817 14
## [13822] {frozen_vegetables,
## pip_fruit,
## root_vegetables} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [13823] {frozen_vegetables,
## other_vegetables,
## pip_fruit} => {root_vegetables} 0.001118454 0.3333333 0.003355363 3.0581468 11
## [13824] {frozen_vegetables,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [13825] {frozen_vegetables,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001423488 0.3783784 0.003762074 3.4714098 14
## [13826] {frozen_vegetables,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001423488 0.2295082 0.006202339 3.0338886 14
## [13827] {frozen_vegetables,
## pip_fruit,
## yogurt} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [13828] {frozen_vegetables,
## pip_fruit,
## whole_milk} => {yogurt} 0.001118454 0.2972973 0.003762074 2.1311362 11
## [13829] {frozen_vegetables,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001931876 0.5757576 0.003355363 2.2533131 19
## [13830] {frozen_vegetables,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001931876 0.5135135 0.003762074 2.6539177 19
## [13831] {frozen_vegetables,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001931876 0.2000000 0.009659380 2.6438172 19
## [13832] {frozen_vegetables,
## pastry,
## yogurt} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [13833] {frozen_vegetables,
## other_vegetables,
## pastry} => {yogurt} 0.001016777 0.4347826 0.002338587 3.1166815 10
## [13834] {frozen_vegetables,
## other_vegetables,
## pastry} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [13835] {frozen_vegetables,
## pastry,
## whole_milk} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [13836] {citrus_fruit,
## frozen_vegetables,
## tropical_fruit} => {root_vegetables} 0.001118454 0.6875000 0.001626843 6.3074277 11
## [13837] {citrus_fruit,
## frozen_vegetables,
## root_vegetables} => {tropical_fruit} 0.001118454 0.4230769 0.002643620 4.0319395 11
## [13838] {frozen_vegetables,
## root_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001118454 0.3666667 0.003050330 4.4301802 11
## [13839] {citrus_fruit,
## frozen_vegetables,
## tropical_fruit} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [13840] {citrus_fruit,
## frozen_vegetables,
## other_vegetables} => {tropical_fruit} 0.001016777 0.3125000 0.003253686 2.9781371 10
## [13841] {frozen_vegetables,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001016777 0.2439024 0.004168785 2.9469048 10
## [13842] {citrus_fruit,
## frozen_vegetables,
## tropical_fruit} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [13843] {citrus_fruit,
## frozen_vegetables,
## whole_milk} => {tropical_fruit} 0.001220132 0.3428571 0.003558719 3.2674419 12
## [13844] {frozen_vegetables,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001220132 0.2448980 0.004982206 2.9589330 12
## [13845] {citrus_fruit,
## frozen_vegetables,
## root_vegetables} => {yogurt} 0.001016777 0.3846154 0.002643620 2.7570644 10
## [13846] {citrus_fruit,
## frozen_vegetables,
## yogurt} => {root_vegetables} 0.001016777 0.4000000 0.002541942 3.6697761 10
## [13847] {frozen_vegetables,
## root_vegetables,
## yogurt} => {citrus_fruit} 0.001016777 0.4000000 0.002541942 4.8329238 10
## [13848] {citrus_fruit,
## root_vegetables,
## yogurt} => {frozen_vegetables} 0.001016777 0.2083333 0.004880529 4.3318358 10
## [13849] {citrus_fruit,
## frozen_vegetables,
## root_vegetables} => {other_vegetables} 0.002033554 0.7692308 0.002643620 3.9755043 20
## [13850] {citrus_fruit,
## frozen_vegetables,
## other_vegetables} => {root_vegetables} 0.002033554 0.6250000 0.003253686 5.7340252 20
## [13851] {frozen_vegetables,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.002033554 0.3333333 0.006100661 4.0274365 20
## [13852] {citrus_fruit,
## frozen_vegetables,
## root_vegetables} => {whole_milk} 0.001830198 0.6923077 0.002643620 2.7094493 18
## [13853] {citrus_fruit,
## frozen_vegetables,
## whole_milk} => {root_vegetables} 0.001830198 0.5142857 0.003558719 4.7182836 18
## [13854] {frozen_vegetables,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001830198 0.2950820 0.006202339 3.5652717 18
## [13855] {citrus_fruit,
## root_vegetables,
## whole_milk} => {frozen_vegetables} 0.001830198 0.2000000 0.009150991 4.1585624 18
## [13856] {citrus_fruit,
## frozen_vegetables,
## yogurt} => {other_vegetables} 0.001118454 0.4400000 0.002541942 2.2739884 11
## [13857] {citrus_fruit,
## frozen_vegetables,
## other_vegetables} => {yogurt} 0.001118454 0.3437500 0.003253686 2.4641263 11
## [13858] {frozen_vegetables,
## other_vegetables,
## yogurt} => {citrus_fruit} 0.001118454 0.2115385 0.005287239 2.5558732 11
## [13859] {citrus_fruit,
## frozen_vegetables,
## yogurt} => {whole_milk} 0.001626843 0.6400000 0.002541942 2.5047354 16
## [13860] {citrus_fruit,
## frozen_vegetables,
## whole_milk} => {yogurt} 0.001626843 0.4571429 0.003558719 3.2769679 16
## [13861] {frozen_vegetables,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001626843 0.2666667 0.006100661 3.2219492 16
## [13862] {citrus_fruit,
## frozen_vegetables,
## other_vegetables} => {whole_milk} 0.002033554 0.6250000 0.003253686 2.4460306 20
## [13863] {citrus_fruit,
## frozen_vegetables,
## whole_milk} => {other_vegetables} 0.002033554 0.5714286 0.003558719 2.9532317 20
## [13864] {frozen_vegetables,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.002033554 0.2105263 0.009659380 2.5436441 20
## [13865] {frozen_vegetables,
## sausage,
## tropical_fruit} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [13866] {frozen_vegetables,
## sausage,
## whole_milk} => {tropical_fruit} 0.001016777 0.3448276 0.002948653 3.2862203 10
## [13867] {frozen_vegetables,
## tropical_fruit,
## whole_milk} => {sausage} 0.001016777 0.2040816 0.004982206 2.1722325 10
## [13868] {frozen_vegetables,
## root_vegetables,
## sausage} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [13869] {frozen_vegetables,
## other_vegetables,
## sausage} => {root_vegetables} 0.001118454 0.3928571 0.002846975 3.6042444 11
## [13870] {frozen_vegetables,
## root_vegetables,
## sausage} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [13871] {frozen_vegetables,
## sausage,
## whole_milk} => {root_vegetables} 0.001118454 0.3793103 0.002948653 3.4799601 11
## [13872] {frozen_vegetables,
## sausage,
## yogurt} => {other_vegetables} 0.001423488 0.7000000 0.002033554 3.6177089 14
## [13873] {frozen_vegetables,
## other_vegetables,
## sausage} => {yogurt} 0.001423488 0.5000000 0.002846975 3.5841837 14
## [13874] {frozen_vegetables,
## other_vegetables,
## yogurt} => {sausage} 0.001423488 0.2692308 0.005287239 2.8656760 14
## [13875] {frozen_vegetables,
## rolls/buns,
## sausage} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [13876] {frozen_vegetables,
## other_vegetables,
## sausage} => {rolls/buns} 0.001118454 0.3928571 0.002846975 2.1358485 11
## [13877] {frozen_vegetables,
## other_vegetables,
## rolls/buns} => {sausage} 0.001118454 0.2619048 0.004270463 2.7876984 11
## [13878] {frozen_vegetables,
## other_vegetables,
## sausage} => {whole_milk} 0.001321810 0.4642857 0.002846975 1.8170513 13
## [13879] {frozen_vegetables,
## sausage,
## whole_milk} => {other_vegetables} 0.001321810 0.4482759 0.002948653 2.3167594 13
## [13880] {bottled_water,
## frozen_vegetables,
## tropical_fruit} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [13881] {bottled_water,
## frozen_vegetables,
## root_vegetables} => {tropical_fruit} 0.001016777 0.5263158 0.001931876 5.0158099 10
## [13882] {frozen_vegetables,
## root_vegetables,
## tropical_fruit} => {bottled_water} 0.001016777 0.3333333 0.003050330 3.0159460 10
## [13883] {bottled_water,
## root_vegetables,
## tropical_fruit} => {frozen_vegetables} 0.001016777 0.2222222 0.004575496 4.6206249 10
## [13884] {bottled_water,
## frozen_vegetables,
## tropical_fruit} => {yogurt} 0.001220132 0.5217391 0.002338587 3.7400177 12
## [13885] {bottled_water,
## frozen_vegetables,
## yogurt} => {tropical_fruit} 0.001220132 0.5217391 0.002338587 4.9721941 12
## [13886] {frozen_vegetables,
## tropical_fruit,
## yogurt} => {bottled_water} 0.001220132 0.3636364 0.003355363 3.2901229 12
## [13887] {bottled_water,
## frozen_vegetables,
## tropical_fruit} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [13888] {bottled_water,
## frozen_vegetables,
## other_vegetables} => {tropical_fruit} 0.001118454 0.5238095 0.002135231 4.9919251 11
## [13889] {frozen_vegetables,
## other_vegetables,
## tropical_fruit} => {bottled_water} 0.001118454 0.2682927 0.004168785 2.4274688 11
## [13890] {bottled_water,
## frozen_vegetables,
## tropical_fruit} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [13891] {bottled_water,
## frozen_vegetables,
## whole_milk} => {tropical_fruit} 0.001423488 0.4375000 0.003253686 4.1693920 14
## [13892] {frozen_vegetables,
## tropical_fruit,
## whole_milk} => {bottled_water} 0.001423488 0.2857143 0.004982206 2.5850966 14
## [13893] {bottled_water,
## frozen_vegetables,
## root_vegetables} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [13894] {bottled_water,
## frozen_vegetables,
## other_vegetables} => {root_vegetables} 0.001220132 0.5714286 0.002135231 5.2425373 12
## [13895] {frozen_vegetables,
## other_vegetables,
## root_vegetables} => {bottled_water} 0.001220132 0.2000000 0.006100661 1.8095676 12
## [13896] {bottled_water,
## frozen_vegetables,
## root_vegetables} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [13897] {bottled_water,
## frozen_vegetables,
## whole_milk} => {root_vegetables} 0.001220132 0.3750000 0.003253686 3.4404151 12
## [13898] {bottled_water,
## frozen_vegetables,
## yogurt} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [13899] {bottled_water,
## frozen_vegetables,
## other_vegetables} => {yogurt} 0.001220132 0.5714286 0.002135231 4.0962099 12
## [13900] {frozen_vegetables,
## other_vegetables,
## yogurt} => {bottled_water} 0.001220132 0.2307692 0.005287239 2.0879626 12
## [13901] {bottled_water,
## frozen_vegetables,
## yogurt} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [13902] {bottled_water,
## frozen_vegetables,
## whole_milk} => {yogurt} 0.001321810 0.4062500 0.003253686 2.9121492 13
## [13903] {frozen_vegetables,
## whole_milk,
## yogurt} => {bottled_water} 0.001321810 0.2166667 0.006100661 1.9603649 13
## [13904] {bottled_water,
## frozen_vegetables,
## other_vegetables} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [13905] {bottled_water,
## frozen_vegetables,
## whole_milk} => {other_vegetables} 0.001525165 0.4687500 0.003253686 2.4225729 15
## [13906] {frozen_vegetables,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001118454 0.3666667 0.003050330 2.6284014 11
## [13907] {frozen_vegetables,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001118454 0.3333333 0.003355363 3.0581468 11
## [13908] {frozen_vegetables,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001118454 0.4400000 0.002541942 4.1932171 11
## [13909] {frozen_vegetables,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001728521 0.5666667 0.003050330 2.9286215 17
## [13910] {frozen_vegetables,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001728521 0.4146341 0.004168785 3.8040362 17
## [13911] {frozen_vegetables,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001728521 0.2833333 0.006100661 2.7001776 17
## [13912] {frozen_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.002338587 0.7666667 0.003050330 3.0004643 23
## [13913] {frozen_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.002338587 0.4693878 0.004982206 4.3063699 23
## [13914] {frozen_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.002338587 0.3770492 0.006202339 3.5932933 23
## [13915] {frozen_vegetables,
## soda,
## tropical_fruit} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [13916] {frozen_vegetables,
## other_vegetables,
## tropical_fruit} => {soda} 0.001016777 0.2439024 0.004168785 1.3987058 10
## [13917] {frozen_vegetables,
## other_vegetables,
## soda} => {tropical_fruit} 0.001016777 0.3125000 0.003253686 2.9781371 10
## [13918] {frozen_vegetables,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001220132 0.3636364 0.003355363 1.9769838 12
## [13919] {frozen_vegetables,
## rolls/buns,
## tropical_fruit} => {yogurt} 0.001220132 0.5217391 0.002338587 3.7400177 12
## [13920] {frozen_vegetables,
## rolls/buns,
## yogurt} => {tropical_fruit} 0.001220132 0.3529412 0.003457041 3.3635431 12
## [13921] {frozen_vegetables,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.002033554 0.6060606 0.003355363 3.1322155 20
## [13922] {frozen_vegetables,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.002033554 0.4878049 0.004168785 3.4967646 20
## [13923] {frozen_vegetables,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.002033554 0.3846154 0.005287239 3.6653995 20
## [13924] {frozen_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001830198 0.5454545 0.003355363 2.1347177 18
## [13925] {frozen_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001830198 0.3673469 0.004982206 2.6332778 18
## [13926] {frozen_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001830198 0.3000000 0.006100661 2.8590116 18
## [13927] {frozen_vegetables,
## rolls/buns,
## tropical_fruit} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [13928] {frozen_vegetables,
## other_vegetables,
## tropical_fruit} => {rolls/buns} 0.001016777 0.2439024 0.004168785 1.3260257 10
## [13929] {frozen_vegetables,
## other_vegetables,
## rolls/buns} => {tropical_fruit} 0.001016777 0.2380952 0.004270463 2.2690568 10
## [13930] {frozen_vegetables,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [13931] {frozen_vegetables,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001118454 0.2244898 0.004982206 1.2204849 11
## [13932] {frozen_vegetables,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001118454 0.2200000 0.005083884 2.0966085 11
## [13933] {frozen_vegetables,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.002440264 0.5853659 0.004168785 2.2909165 24
## [13934] {frozen_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.002440264 0.4897959 0.004982206 2.5313415 24
## [13935] {frozen_vegetables,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.002440264 0.2526316 0.009659380 2.4075887 24
## [13936] {frozen_vegetables,
## root_vegetables,
## soda} => {other_vegetables} 0.001321810 0.6842105 0.001931876 3.5361064 13
## [13937] {frozen_vegetables,
## other_vegetables,
## root_vegetables} => {soda} 0.001321810 0.2166667 0.006100661 1.2425170 13
## [13938] {frozen_vegetables,
## other_vegetables,
## soda} => {root_vegetables} 0.001321810 0.4062500 0.003253686 3.7271164 13
## [13939] {frozen_vegetables,
## root_vegetables,
## soda} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [13940] {frozen_vegetables,
## soda,
## whole_milk} => {root_vegetables} 0.001118454 0.3793103 0.002948653 3.4799601 11
## [13941] {frozen_vegetables,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001931876 0.7600000 0.002541942 3.9277982 19
## [13942] {frozen_vegetables,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001931876 0.3166667 0.006100661 2.2699830 19
## [13943] {frozen_vegetables,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001931876 0.3653846 0.005287239 3.3521993 19
## [13944] {frozen_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.001728521 0.6800000 0.002541942 2.6612813 17
## [13945] {frozen_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.001728521 0.2786885 0.006202339 1.9977417 17
## [13946] {frozen_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.001728521 0.2833333 0.006100661 2.5994248 17
## [13947] {frozen_vegetables,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001525165 0.5172414 0.002948653 2.6731839 15
## [13948] {frozen_vegetables,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001525165 0.2500000 0.006100661 1.3591763 15
## [13949] {frozen_vegetables,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001525165 0.3571429 0.004270463 3.2765858 15
## [13950] {frozen_vegetables,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001423488 0.4827586 0.002948653 1.8893478 14
## [13951] {frozen_vegetables,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001423488 0.2295082 0.006202339 1.2477684 14
## [13952] {frozen_vegetables,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001423488 0.2800000 0.005083884 2.5688433 14
## [13953] {frozen_vegetables,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.003863752 0.6333333 0.006100661 2.4786444 38
## [13954] {frozen_vegetables,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.003863752 0.6229508 0.006202339 3.2195067 38
## [13955] {frozen_vegetables,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.003863752 0.4000000 0.009659380 3.6697761 38
## [13956] {frozen_vegetables,
## soda,
## yogurt} => {other_vegetables} 0.001016777 0.3571429 0.002846975 1.8457698 10
## [13957] {frozen_vegetables,
## other_vegetables,
## soda} => {yogurt} 0.001016777 0.3125000 0.003253686 2.2401148 10
## [13958] {frozen_vegetables,
## soda,
## yogurt} => {whole_milk} 0.001118454 0.3928571 0.002846975 1.5375050 11
## [13959] {frozen_vegetables,
## soda,
## whole_milk} => {yogurt} 0.001118454 0.3793103 0.002948653 2.7190359 11
## [13960] {frozen_vegetables,
## other_vegetables,
## soda} => {whole_milk} 0.001626843 0.5000000 0.003253686 1.9568245 16
## [13961] {frozen_vegetables,
## soda,
## whole_milk} => {other_vegetables} 0.001626843 0.5517241 0.002948653 2.8513962 16
## [13962] {frozen_vegetables,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001525165 0.4411765 0.003457041 2.2800686 15
## [13963] {frozen_vegetables,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001525165 0.2884615 0.005287239 1.5682804 15
## [13964] {frozen_vegetables,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001525165 0.3571429 0.004270463 2.5601312 15
## [13965] {frozen_vegetables,
## rolls/buns,
## yogurt} => {whole_milk} 0.001931876 0.5588235 0.003457041 2.1870392 19
## [13966] {frozen_vegetables,
## whole_milk,
## yogurt} => {rolls/buns} 0.001931876 0.3166667 0.006100661 1.7216234 19
## [13967] {frozen_vegetables,
## rolls/buns,
## whole_milk} => {yogurt} 0.001931876 0.3800000 0.005083884 2.7239796 19
## [13968] {frozen_vegetables,
## other_vegetables,
## yogurt} => {whole_milk} 0.003558719 0.6730769 0.005287239 2.6341868 35
## [13969] {frozen_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.003558719 0.5833333 0.006100661 3.0147574 35
## [13970] {frozen_vegetables,
## other_vegetables,
## whole_milk} => {yogurt} 0.003558719 0.3684211 0.009659380 2.6409774 35
## [13971] {frozen_vegetables,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.002135231 0.5000000 0.004270463 1.9568245 21
## [13972] {frozen_vegetables,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.002135231 0.4200000 0.005083884 2.1706253 21
## [13973] {frozen_vegetables,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.002135231 0.2210526 0.009659380 1.2017980 21
## [13974] {beef,
## butter,
## curd} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [13975] {beef,
## curd,
## whole_milk} => {butter} 0.001016777 0.3846154 0.002643620 6.9407198 10
## [13976] {beef,
## butter,
## whole_milk} => {curd} 0.001016777 0.2777778 0.003660397 5.2136344 10
## [13977] {butter,
## curd,
## whole_milk} => {beef} 0.001016777 0.2083333 0.004880529 3.9708495 10
## [13978] {beef,
## curd,
## root_vegetables} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [13979] {beef,
## curd,
## other_vegetables} => {root_vegetables} 0.001321810 0.6190476 0.002135231 5.6794154 13
## [13980] {curd,
## other_vegetables,
## root_vegetables} => {beef} 0.001321810 0.2407407 0.005490595 4.5885372 13
## [13981] {beef,
## curd,
## root_vegetables} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [13982] {beef,
## curd,
## whole_milk} => {root_vegetables} 0.001016777 0.3846154 0.002643620 3.5286309 10
## [13983] {beef,
## curd,
## yogurt} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [13984] {beef,
## curd,
## other_vegetables} => {yogurt} 0.001220132 0.5714286 0.002135231 4.0962099 12
## [13985] {beef,
## other_vegetables,
## yogurt} => {curd} 0.001220132 0.2352941 0.005185562 4.4162551 12
## [13986] {curd,
## other_vegetables,
## yogurt} => {beef} 0.001220132 0.2000000 0.006100661 3.8120155 12
## [13987] {beef,
## curd,
## yogurt} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [13988] {beef,
## curd,
## whole_milk} => {yogurt} 0.001321810 0.5000000 0.002643620 3.5841837 13
## [13989] {beef,
## whole_milk,
## yogurt} => {curd} 0.001321810 0.2166667 0.006100661 4.0666349 13
## [13990] {beef,
## curd,
## other_vegetables} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [13991] {beef,
## curd,
## whole_milk} => {other_vegetables} 0.001118454 0.4230769 0.002643620 2.1865273 11
## [13992] {beef,
## napkins,
## root_vegetables} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [13993] {beef,
## napkins,
## other_vegetables} => {root_vegetables} 0.001118454 0.6111111 0.001830198 5.6066024 11
## [13994] {napkins,
## other_vegetables,
## root_vegetables} => {beef} 0.001118454 0.2444444 0.004575496 4.6591301 11
## [13995] {beef,
## pork,
## root_vegetables} => {other_vegetables} 0.001830198 0.6666667 0.002745297 3.4454370 18
## [13996] {beef,
## other_vegetables,
## pork} => {root_vegetables} 0.001830198 0.4390244 0.004168785 4.0278031 18
## [13997] {beef,
## other_vegetables,
## root_vegetables} => {pork} 0.001830198 0.2307692 0.007930859 4.0028490 18
## [13998] {other_vegetables,
## pork,
## root_vegetables} => {beef} 0.001830198 0.2608696 0.007015760 4.9721941 18
## [13999] {beef,
## pork,
## root_vegetables} => {whole_milk} 0.001423488 0.5185185 0.002745297 2.0292995 14
## [14000] {beef,
## pork,
## whole_milk} => {root_vegetables} 0.001423488 0.3589744 0.003965430 3.2933888 14
## [14001] {pork,
## root_vegetables,
## whole_milk} => {beef} 0.001423488 0.2089552 0.006812405 3.9827028 14
## [14002] {beef,
## pork,
## yogurt} => {other_vegetables} 0.001321810 0.7222222 0.001830198 3.7325568 13
## [14003] {beef,
## other_vegetables,
## pork} => {yogurt} 0.001321810 0.3170732 0.004168785 2.2728970 13
## [14004] {beef,
## other_vegetables,
## yogurt} => {pork} 0.001321810 0.2549020 0.005185562 4.4214476 13
## [14005] {other_vegetables,
## pork,
## yogurt} => {beef} 0.001321810 0.2826087 0.004677173 5.3865436 13
## [14006] {beef,
## pork,
## yogurt} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [14007] {beef,
## pork,
## whole_milk} => {yogurt} 0.001016777 0.2564103 0.003965430 1.8380429 10
## [14008] {pork,
## whole_milk,
## yogurt} => {beef} 0.001016777 0.2083333 0.004880529 3.9708495 10
## [14009] {beef,
## pork,
## rolls/buns} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [14010] {beef,
## other_vegetables,
## pork} => {rolls/buns} 0.001220132 0.2926829 0.004168785 1.5912308 12
## [14011] {beef,
## other_vegetables,
## rolls/buns} => {pork} 0.001220132 0.2105263 0.005795628 3.6517219 12
## [14012] {other_vegetables,
## pork,
## rolls/buns} => {beef} 0.001220132 0.2181818 0.005592272 4.1585624 12
## [14013] {beef,
## pork,
## rolls/buns} => {whole_milk} 0.001321810 0.5909091 0.002236909 2.3126108 13
## [14014] {beef,
## pork,
## whole_milk} => {rolls/buns} 0.001321810 0.3333333 0.003965430 1.8122351 13
## [14015] {pork,
## rolls/buns,
## whole_milk} => {beef} 0.001321810 0.2131148 0.006202339 4.0619837 13
## [14016] {beef,
## other_vegetables,
## pork} => {whole_milk} 0.002338587 0.5609756 0.004168785 2.1954616 23
## [14017] {beef,
## pork,
## whole_milk} => {other_vegetables} 0.002338587 0.5897436 0.003965430 3.0478866 23
## [14018] {beef,
## other_vegetables,
## whole_milk} => {pork} 0.002338587 0.2527473 0.009252669 4.3840727 23
## [14019] {other_vegetables,
## pork,
## whole_milk} => {beef} 0.002338587 0.2300000 0.010167768 4.3838178 23
## [14020] {beef,
## frankfurter,
## root_vegetables} => {rolls/buns} 0.001016777 0.6250000 0.001626843 3.3979409 10
## [14021] {beef,
## frankfurter,
## rolls/buns} => {root_vegetables} 0.001016777 0.5555556 0.001830198 5.0969113 10
## [14022] {beef,
## rolls/buns,
## root_vegetables} => {frankfurter} 0.001016777 0.2040816 0.004982206 3.4605911 10
## [14023] {frankfurter,
## rolls/buns,
## root_vegetables} => {beef} 0.001016777 0.2941176 0.003457041 5.6059052 10
## [14024] {beef,
## frankfurter,
## root_vegetables} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [14025] {beef,
## frankfurter,
## whole_milk} => {root_vegetables} 0.001016777 0.3448276 0.002948653 3.1636001 10
## [14026] {frankfurter,
## root_vegetables,
## whole_milk} => {beef} 0.001016777 0.2000000 0.005083884 3.8120155 10
## [14027] {beef,
## frankfurter,
## yogurt} => {rolls/buns} 0.001016777 0.5555556 0.001830198 3.0203919 10
## [14028] {beef,
## frankfurter,
## rolls/buns} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [14029] {beef,
## rolls/buns,
## yogurt} => {frankfurter} 0.001016777 0.2702703 0.003762074 4.5829450 10
## [14030] {frankfurter,
## rolls/buns,
## yogurt} => {beef} 0.001016777 0.2439024 0.004168785 4.6487994 10
## [14031] {beef,
## frankfurter,
## yogurt} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [14032] {beef,
## frankfurter,
## other_vegetables} => {yogurt} 0.001118454 0.4400000 0.002541942 3.1540816 11
## [14033] {beef,
## other_vegetables,
## yogurt} => {frankfurter} 0.001118454 0.2156863 0.005185562 3.6573698 11
## [14034] {frankfurter,
## other_vegetables,
## yogurt} => {beef} 0.001118454 0.2291667 0.004880529 4.3679344 11
## [14035] {beef,
## frankfurter,
## yogurt} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [14036] {beef,
## frankfurter,
## whole_milk} => {yogurt} 0.001321810 0.4482759 0.002948653 3.2134061 13
## [14037] {beef,
## whole_milk,
## yogurt} => {frankfurter} 0.001321810 0.2166667 0.006100661 3.6739943 13
## [14038] {frankfurter,
## whole_milk,
## yogurt} => {beef} 0.001321810 0.2131148 0.006202339 4.0619837 13
## [14039] {beef,
## frankfurter,
## rolls/buns} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [14040] {beef,
## frankfurter,
## whole_milk} => {rolls/buns} 0.001220132 0.4137931 0.002948653 2.2496712 12
## [14041] {frankfurter,
## rolls/buns,
## whole_milk} => {beef} 0.001220132 0.2033898 0.005998983 3.8766259 12
## [14042] {beef,
## frankfurter,
## other_vegetables} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [14043] {beef,
## frankfurter,
## whole_milk} => {other_vegetables} 0.001423488 0.4827586 0.002948653 2.4949716 14
## [14044] {beef,
## bottled_beer,
## root_vegetables} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [14045] {beef,
## bottled_beer,
## other_vegetables} => {root_vegetables} 0.001016777 0.4761905 0.002135231 4.3687811 10
## [14046] {bottled_beer,
## other_vegetables,
## root_vegetables} => {beef} 0.001016777 0.2380952 0.004270463 4.5381137 10
## [14047] {beef,
## bottled_beer,
## root_vegetables} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [14048] {beef,
## bottled_beer,
## whole_milk} => {root_vegetables} 0.001016777 0.4761905 0.002135231 4.3687811 10
## [14049] {bottled_beer,
## root_vegetables,
## whole_milk} => {beef} 0.001016777 0.2564103 0.003965430 4.8871994 10
## [14050] {beef,
## bottled_beer,
## rolls/buns} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [14051] {beef,
## bottled_beer,
## whole_milk} => {rolls/buns} 0.001016777 0.4761905 0.002135231 2.5889073 10
## [14052] {beef,
## bottled_beer,
## other_vegetables} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [14053] {beef,
## bottled_beer,
## whole_milk} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [14054] {beef,
## brown_bread,
## other_vegetables} => {whole_milk} 0.001525165 0.7894737 0.001931876 3.0897229 15
## [14055] {beef,
## brown_bread,
## whole_milk} => {other_vegetables} 0.001525165 0.5769231 0.002643620 2.9816282 15
## [14056] {beef,
## margarine,
## rolls/buns} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [14057] {beef,
## margarine,
## whole_milk} => {rolls/buns} 0.001118454 0.4400000 0.002541942 2.3921504 11
## [14058] {beef,
## butter,
## domestic_eggs} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [14059] {beef,
## butter,
## whole_milk} => {domestic_eggs} 0.001118454 0.3055556 0.003660397 4.8159277 11
## [14060] {beef,
## domestic_eggs,
## whole_milk} => {butter} 0.001118454 0.2972973 0.003762074 5.3649888 11
## [14061] {beef,
## butter,
## sausage} => {root_vegetables} 0.001016777 0.7142857 0.001423488 6.5531716 10
## [14062] {beef,
## butter,
## root_vegetables} => {sausage} 0.001016777 0.3448276 0.002948653 3.6703239 10
## [14063] {beef,
## root_vegetables,
## sausage} => {butter} 0.001016777 0.3448276 0.002948653 6.2227143 10
## [14064] {butter,
## root_vegetables,
## sausage} => {beef} 0.001016777 0.4545455 0.002236909 8.6636716 10
## [14065] {beef,
## butter,
## sausage} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [14066] {beef,
## butter,
## whole_milk} => {sausage} 0.001118454 0.3055556 0.003660397 3.2523148 11
## [14067] {beef,
## sausage,
## whole_milk} => {butter} 0.001118454 0.3666667 0.003050330 6.6168196 11
## [14068] {butter,
## sausage,
## whole_milk} => {beef} 0.001118454 0.2340426 0.004778851 4.4608692 11
## [14069] {beef,
## butter,
## tropical_fruit} => {yogurt} 0.001016777 0.8333333 0.001220132 5.9736395 10
## [14070] {beef,
## butter,
## yogurt} => {tropical_fruit} 0.001016777 0.3703704 0.002745297 3.5296440 10
## [14071] {beef,
## tropical_fruit,
## yogurt} => {butter} 0.001016777 0.3448276 0.002948653 6.2227143 10
## [14072] {butter,
## tropical_fruit,
## yogurt} => {beef} 0.001016777 0.2222222 0.004575496 4.2355728 10
## [14073] {beef,
## butter,
## root_vegetables} => {yogurt} 0.001525165 0.5172414 0.002948653 3.7077762 15
## [14074] {beef,
## butter,
## yogurt} => {root_vegetables} 0.001525165 0.5555556 0.002745297 5.0969113 15
## [14075] {beef,
## root_vegetables,
## yogurt} => {butter} 0.001525165 0.3333333 0.004575496 6.0152905 15
## [14076] {butter,
## root_vegetables,
## yogurt} => {beef} 0.001525165 0.3947368 0.003863752 7.5237148 15
## [14077] {beef,
## butter,
## root_vegetables} => {rolls/buns} 0.001423488 0.4827586 0.002948653 2.6246164 14
## [14078] {beef,
## butter,
## rolls/buns} => {root_vegetables} 0.001423488 0.6363636 0.002236909 5.8382802 14
## [14079] {beef,
## rolls/buns,
## root_vegetables} => {butter} 0.001423488 0.2857143 0.004982206 5.1559633 14
## [14080] {butter,
## rolls/buns,
## root_vegetables} => {beef} 0.001423488 0.3684211 0.003863752 7.0221338 14
## [14081] {beef,
## butter,
## root_vegetables} => {other_vegetables} 0.001423488 0.4827586 0.002948653 2.4949716 14
## [14082] {beef,
## butter,
## other_vegetables} => {root_vegetables} 0.001423488 0.5384615 0.002643620 4.9400832 14
## [14083] {butter,
## other_vegetables,
## root_vegetables} => {beef} 0.001423488 0.2153846 0.006609049 4.1052475 14
## [14084] {beef,
## butter,
## root_vegetables} => {whole_milk} 0.002033554 0.6896552 0.002948653 2.6990683 20
## [14085] {beef,
## butter,
## whole_milk} => {root_vegetables} 0.002033554 0.5555556 0.003660397 5.0969113 20
## [14086] {beef,
## root_vegetables,
## whole_milk} => {butter} 0.002033554 0.2531646 0.008032537 4.5685751 20
## [14087] {butter,
## root_vegetables,
## whole_milk} => {beef} 0.002033554 0.2469136 0.008235892 4.7061920 20
## [14088] {beef,
## butter,
## yogurt} => {rolls/buns} 0.001118454 0.4074074 0.002745297 2.2149540 11
## [14089] {beef,
## butter,
## rolls/buns} => {yogurt} 0.001118454 0.5000000 0.002236909 3.5841837 11
## [14090] {beef,
## rolls/buns,
## yogurt} => {butter} 0.001118454 0.2972973 0.003762074 5.3649888 11
## [14091] {butter,
## rolls/buns,
## yogurt} => {beef} 0.001118454 0.2500000 0.004473818 4.7650194 11
## [14092] {beef,
## butter,
## yogurt} => {other_vegetables} 0.001423488 0.5185185 0.002745297 2.6797844 14
## [14093] {beef,
## butter,
## other_vegetables} => {yogurt} 0.001423488 0.5384615 0.002643620 3.8598901 14
## [14094] {beef,
## other_vegetables,
## yogurt} => {butter} 0.001423488 0.2745098 0.005185562 4.9537687 14
## [14095] {butter,
## other_vegetables,
## yogurt} => {beef} 0.001423488 0.2222222 0.006405694 4.2355728 14
## [14096] {beef,
## butter,
## yogurt} => {whole_milk} 0.001728521 0.6296296 0.002745297 2.4641494 17
## [14097] {beef,
## butter,
## whole_milk} => {yogurt} 0.001728521 0.4722222 0.003660397 3.3850624 17
## [14098] {beef,
## whole_milk,
## yogurt} => {butter} 0.001728521 0.2833333 0.006100661 5.1129969 17
## [14099] {beef,
## butter,
## rolls/buns} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [14100] {beef,
## butter,
## other_vegetables} => {rolls/buns} 0.001118454 0.4230769 0.002643620 2.3001446 11
## [14101] {beef,
## butter,
## rolls/buns} => {whole_milk} 0.001728521 0.7727273 0.002236909 3.0241833 17
## [14102] {beef,
## butter,
## whole_milk} => {rolls/buns} 0.001728521 0.4722222 0.003660397 2.5673331 17
## [14103] {beef,
## rolls/buns,
## whole_milk} => {butter} 0.001728521 0.2537313 0.006812405 4.5788032 17
## [14104] {butter,
## rolls/buns,
## whole_milk} => {beef} 0.001728521 0.2615385 0.006609049 4.9849434 17
## [14105] {beef,
## butter,
## other_vegetables} => {whole_milk} 0.001830198 0.6923077 0.002643620 2.7094493 18
## [14106] {beef,
## butter,
## whole_milk} => {other_vegetables} 0.001830198 0.5000000 0.003660397 2.5840778 18
## [14107] {beef,
## newspapers,
## root_vegetables} => {other_vegetables} 0.001626843 0.5925926 0.002745297 3.0626107 16
## [14108] {beef,
## newspapers,
## other_vegetables} => {root_vegetables} 0.001626843 0.5000000 0.003253686 4.5872201 16
## [14109] {beef,
## other_vegetables,
## root_vegetables} => {newspapers} 0.001626843 0.2051282 0.007930859 2.5699820 16
## [14110] {newspapers,
## other_vegetables,
## root_vegetables} => {beef} 0.001626843 0.2711864 0.005998983 5.1688346 16
## [14111] {beef,
## newspapers,
## root_vegetables} => {whole_milk} 0.001321810 0.4814815 0.002745297 1.8843495 13
## [14112] {beef,
## newspapers,
## whole_milk} => {root_vegetables} 0.001321810 0.5200000 0.002541942 4.7707090 13
## [14113] {newspapers,
## root_vegetables,
## whole_milk} => {beef} 0.001321810 0.2280702 0.005795628 4.3470352 13
## [14114] {beef,
## newspapers,
## rolls/buns} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [14115] {beef,
## newspapers,
## whole_milk} => {rolls/buns} 0.001118454 0.4400000 0.002541942 2.3921504 11
## [14116] {beef,
## newspapers,
## other_vegetables} => {whole_milk} 0.001220132 0.3750000 0.003253686 1.4676184 12
## [14117] {beef,
## newspapers,
## whole_milk} => {other_vegetables} 0.001220132 0.4800000 0.002541942 2.4807147 12
## [14118] {beef,
## citrus_fruit,
## domestic_eggs} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [14119] {beef,
## domestic_eggs,
## whole_milk} => {citrus_fruit} 0.001118454 0.2972973 0.003762074 3.5920380 11
## [14120] {beef,
## citrus_fruit,
## whole_milk} => {domestic_eggs} 0.001118454 0.2820513 0.003965430 4.4454717 11
## [14121] {beef,
## domestic_eggs,
## root_vegetables} => {other_vegetables} 0.001626843 0.6956522 0.002338587 3.5952386 16
## [14122] {beef,
## domestic_eggs,
## other_vegetables} => {root_vegetables} 0.001626843 0.4848485 0.003355363 4.4482135 16
## [14123] {beef,
## other_vegetables,
## root_vegetables} => {domestic_eggs} 0.001626843 0.2051282 0.007930859 3.2330703 16
## [14124] {domestic_eggs,
## other_vegetables,
## root_vegetables} => {beef} 0.001626843 0.2222222 0.007320793 4.2355728 16
## [14125] {beef,
## domestic_eggs,
## root_vegetables} => {whole_milk} 0.001626843 0.6956522 0.002338587 2.7225385 16
## [14126] {beef,
## domestic_eggs,
## whole_milk} => {root_vegetables} 0.001626843 0.4324324 0.003762074 3.9673255 16
## [14127] {beef,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001626843 0.2025316 0.008032537 3.1921454 16
## [14128] {beef,
## domestic_eggs,
## soda} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [14129] {beef,
## domestic_eggs,
## other_vegetables} => {soda} 0.001016777 0.3030303 0.003355363 1.7377860 10
## [14130] {beef,
## other_vegetables,
## soda} => {domestic_eggs} 0.001016777 0.2857143 0.003558719 4.5032051 10
## [14131] {domestic_eggs,
## other_vegetables,
## soda} => {beef} 0.001016777 0.2000000 0.005083884 3.8120155 10
## [14132] {beef,
## domestic_eggs,
## soda} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [14133] {beef,
## domestic_eggs,
## whole_milk} => {soda} 0.001016777 0.2702703 0.003762074 1.5499173 10
## [14134] {beef,
## soda,
## whole_milk} => {domestic_eggs} 0.001016777 0.2941176 0.003457041 4.6356523 10
## [14135] {beef,
## domestic_eggs,
## yogurt} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [14136] {beef,
## domestic_eggs,
## whole_milk} => {yogurt} 0.001118454 0.2972973 0.003762074 2.1311362 11
## [14137] {beef,
## domestic_eggs,
## rolls/buns} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [14138] {beef,
## domestic_eggs,
## whole_milk} => {rolls/buns} 0.001220132 0.3243243 0.003762074 1.7632558 12
## [14139] {beef,
## domestic_eggs,
## other_vegetables} => {whole_milk} 0.002541942 0.7575758 0.003355363 2.9648856 25
## [14140] {beef,
## domestic_eggs,
## whole_milk} => {other_vegetables} 0.002541942 0.6756757 0.003762074 3.4919970 25
## [14141] {beef,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.002541942 0.2747253 0.009252669 4.3300049 25
## [14142] {domestic_eggs,
## other_vegetables,
## whole_milk} => {beef} 0.002541942 0.2066116 0.012302999 3.9380325 25
## [14143] {beef,
## fruit/vegetable_juice,
## root_vegetables} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [14144] {beef,
## fruit/vegetable_juice,
## other_vegetables} => {root_vegetables} 0.001220132 0.4800000 0.002541942 4.4037313 12
## [14145] {beef,
## fruit/vegetable_juice,
## yogurt} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [14146] {beef,
## fruit/vegetable_juice,
## other_vegetables} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [14147] {beef,
## fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [14148] {beef,
## fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [14149] {beef,
## fruit/vegetable_juice,
## other_vegetables} => {whole_milk} 0.001220132 0.4800000 0.002541942 1.8785515 12
## [14150] {beef,
## fruit/vegetable_juice,
## whole_milk} => {other_vegetables} 0.001220132 0.5000000 0.002440264 2.5840778 12
## [14151] {beef,
## citrus_fruit,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.7692308 0.001321810 7.0572618 10
## [14152] {beef,
## root_vegetables,
## whipped/sour_cream} => {citrus_fruit} 0.001016777 0.3703704 0.002745297 4.4749295 10
## [14153] {beef,
## citrus_fruit,
## root_vegetables} => {whipped/sour_cream} 0.001016777 0.2631579 0.003863752 3.6711459 10
## [14154] {citrus_fruit,
## root_vegetables,
## whipped/sour_cream} => {beef} 0.001016777 0.3030303 0.003355363 5.7757811 10
## [14155] {beef,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.8750000 0.001626843 4.5221361 14
## [14156] {beef,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001423488 0.3783784 0.003762074 3.6059606 14
## [14157] {beef,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001423488 0.3181818 0.004473818 4.4387492 14
## [14158] {beef,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [14159] {beef,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001321810 0.3823529 0.003457041 3.6438383 13
## [14160] {beef,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001321810 0.2888889 0.004575496 4.0301024 13
## [14161] {beef,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001220132 0.4444444 0.002745297 3.1859410 12
## [14162] {beef,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001220132 0.4800000 0.002541942 4.4037313 12
## [14163] {beef,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001220132 0.2666667 0.004575496 3.7200946 12
## [14164] {beef,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001525165 0.5555556 0.002745297 2.8711975 15
## [14165] {beef,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001525165 0.4054054 0.003762074 3.7193677 15
## [14166] {beef,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001728521 0.6296296 0.002745297 2.4641494 17
## [14167] {beef,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001728521 0.5000000 0.003457041 4.5872201 17
## [14168] {beef,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001728521 0.2151899 0.008032537 3.0019750 17
## [14169] {beef,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001321810 0.5200000 0.002541942 2.6874409 13
## [14170] {beef,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001321810 0.3513514 0.003762074 2.5186156 13
## [14171] {beef,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001321810 0.2549020 0.005185562 3.5559727 13
## [14172] {beef,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [14173] {beef,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001525165 0.4411765 0.003457041 3.1625150 15
## [14174] {beef,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001525165 0.2500000 0.006100661 3.4875887 15
## [14175] {beef,
## rolls/buns,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [14176] {beef,
## other_vegetables,
## whipped/sour_cream} => {rolls/buns} 0.001016777 0.2702703 0.003762074 1.4693798 10
## [14177] {beef,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [14178] {beef,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001118454 0.3235294 0.003457041 1.7589341 11
## [14179] {beef,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.002135231 0.5675676 0.003762074 2.2212603 21
## [14180] {beef,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.002135231 0.6176471 0.003457041 3.1920961 21
## [14181] {beef,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.002135231 0.2307692 0.009252669 3.2193126 21
## [14182] {beef,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [14183] {beef,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001118454 0.4782609 0.002338587 4.5578446 11
## [14184] {beef,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001118454 0.2500000 0.004473818 3.3047715 11
## [14185] {beef,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [14186] {beef,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001016777 0.3448276 0.002948653 3.2862203 10
## [14187] {beef,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001016777 0.2222222 0.004575496 2.9375747 10
## [14188] {beef,
## pip_fruit,
## root_vegetables} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [14189] {beef,
## other_vegetables,
## pip_fruit} => {root_vegetables} 0.001220132 0.5217391 0.002338587 4.7866645 12
## [14190] {beef,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001525165 0.6521739 0.002338587 2.5523798 15
## [14191] {beef,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001525165 0.5172414 0.002948653 4.7454002 15
## [14192] {beef,
## pip_fruit,
## yogurt} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [14193] {beef,
## pip_fruit,
## whole_milk} => {yogurt} 0.001118454 0.3793103 0.002948653 2.7190359 11
## [14194] {beef,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001626843 0.6956522 0.002338587 2.7225385 16
## [14195] {beef,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001626843 0.5517241 0.002948653 2.8513962 16
## [14196] {beef,
## pastry,
## root_vegetables} => {rolls/buns} 0.001118454 0.5500000 0.002033554 2.9901879 11
## [14197] {beef,
## pastry,
## rolls/buns} => {root_vegetables} 0.001118454 0.5000000 0.002236909 4.5872201 11
## [14198] {beef,
## rolls/buns,
## root_vegetables} => {pastry} 0.001118454 0.2244898 0.004982206 2.5232653 11
## [14199] {pastry,
## rolls/buns,
## root_vegetables} => {beef} 0.001118454 0.2972973 0.003762074 5.6665095 11
## [14200] {beef,
## pastry,
## root_vegetables} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [14201] {beef,
## other_vegetables,
## pastry} => {root_vegetables} 0.001220132 0.4137931 0.002948653 3.7963201 12
## [14202] {other_vegetables,
## pastry,
## root_vegetables} => {beef} 0.001220132 0.2068966 0.005897306 3.9434643 12
## [14203] {beef,
## pastry,
## root_vegetables} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [14204] {beef,
## pastry,
## whole_milk} => {root_vegetables} 0.001118454 0.2972973 0.003762074 2.7275363 11
## [14205] {beef,
## pastry,
## soda} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [14206] {beef,
## other_vegetables,
## pastry} => {soda} 0.001118454 0.3793103 0.002948653 2.1752287 11
## [14207] {beef,
## other_vegetables,
## soda} => {pastry} 0.001118454 0.3142857 0.003558719 3.5325714 11
## [14208] {other_vegetables,
## pastry,
## soda} => {beef} 0.001118454 0.2037037 0.005490595 3.8826084 11
## [14209] {beef,
## pastry,
## soda} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [14210] {beef,
## pastry,
## whole_milk} => {soda} 0.001118454 0.2972973 0.003762074 1.7049090 11
## [14211] {beef,
## soda,
## whole_milk} => {pastry} 0.001118454 0.3235294 0.003457041 3.6364706 11
## [14212] {beef,
## pastry,
## yogurt} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [14213] {beef,
## pastry,
## whole_milk} => {yogurt} 0.001118454 0.2972973 0.003762074 2.1311362 11
## [14214] {beef,
## pastry,
## rolls/buns} => {whole_milk} 0.001321810 0.5909091 0.002236909 2.3126108 13
## [14215] {beef,
## pastry,
## whole_milk} => {rolls/buns} 0.001321810 0.3513514 0.003762074 1.9101938 13
## [14216] {beef,
## other_vegetables,
## pastry} => {whole_milk} 0.001626843 0.5517241 0.002948653 2.1592546 16
## [14217] {beef,
## pastry,
## whole_milk} => {other_vegetables} 0.001626843 0.4324324 0.003762074 2.2348781 16
## [14218] {beef,
## citrus_fruit,
## sausage} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [14219] {beef,
## citrus_fruit,
## whole_milk} => {sausage} 0.001016777 0.2564103 0.003965430 2.7292152 10
## [14220] {beef,
## sausage,
## whole_milk} => {citrus_fruit} 0.001016777 0.3333333 0.003050330 4.0274365 10
## [14221] {citrus_fruit,
## sausage,
## whole_milk} => {beef} 0.001016777 0.2040816 0.004982206 3.8898117 10
## [14222] {beef,
## citrus_fruit,
## tropical_fruit} => {root_vegetables} 0.001220132 0.6000000 0.002033554 5.5046642 12
## [14223] {beef,
## citrus_fruit,
## root_vegetables} => {tropical_fruit} 0.001220132 0.3157895 0.003863752 3.0094859 12
## [14224] {beef,
## root_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001220132 0.3243243 0.003762074 3.9185869 12
## [14225] {citrus_fruit,
## root_vegetables,
## tropical_fruit} => {beef} 0.001220132 0.2142857 0.005693950 4.0843023 12
## [14226] {beef,
## citrus_fruit,
## tropical_fruit} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [14227] {beef,
## citrus_fruit,
## other_vegetables} => {tropical_fruit} 0.001220132 0.3636364 0.003355363 3.4654686 12
## [14228] {beef,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001220132 0.2727273 0.004473818 3.2951753 12
## [14229] {beef,
## citrus_fruit,
## tropical_fruit} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [14230] {beef,
## citrus_fruit,
## whole_milk} => {tropical_fruit} 0.001321810 0.3333333 0.003965430 3.1766796 13
## [14231] {beef,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001321810 0.2888889 0.004575496 3.4904450 13
## [14232] {beef,
## citrus_fruit,
## root_vegetables} => {rolls/buns} 0.001118454 0.2894737 0.003863752 1.5737831 11
## [14233] {beef,
## citrus_fruit,
## rolls/buns} => {root_vegetables} 0.001118454 0.4230769 0.002643620 3.8814940 11
## [14234] {beef,
## rolls/buns,
## root_vegetables} => {citrus_fruit} 0.001118454 0.2244898 0.004982206 2.7123552 11
## [14235] {citrus_fruit,
## rolls/buns,
## root_vegetables} => {beef} 0.001118454 0.3235294 0.003457041 6.1664957 11
## [14236] {beef,
## citrus_fruit,
## root_vegetables} => {other_vegetables} 0.002135231 0.5526316 0.003863752 2.8560860 21
## [14237] {beef,
## citrus_fruit,
## other_vegetables} => {root_vegetables} 0.002135231 0.6363636 0.003355363 5.8382802 21
## [14238] {beef,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.002135231 0.2692308 0.007930859 3.2529295 21
## [14239] {citrus_fruit,
## other_vegetables,
## root_vegetables} => {beef} 0.002135231 0.2058824 0.010371124 3.9241336 21
## [14240] {beef,
## citrus_fruit,
## root_vegetables} => {whole_milk} 0.002236909 0.5789474 0.003863752 2.2657968 22
## [14241] {beef,
## citrus_fruit,
## whole_milk} => {root_vegetables} 0.002236909 0.5641026 0.003965430 5.1753253 22
## [14242] {beef,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.002236909 0.2784810 0.008032537 3.3646938 22
## [14243] {citrus_fruit,
## root_vegetables,
## whole_milk} => {beef} 0.002236909 0.2444444 0.009150991 4.6591301 22
## [14244] {beef,
## citrus_fruit,
## rolls/buns} => {other_vegetables} 0.001118454 0.4230769 0.002643620 2.1865273 11
## [14245] {beef,
## citrus_fruit,
## other_vegetables} => {rolls/buns} 0.001118454 0.3333333 0.003355363 1.8122351 11
## [14246] {beef,
## citrus_fruit,
## rolls/buns} => {whole_milk} 0.001525165 0.5769231 0.002643620 2.2578744 15
## [14247] {beef,
## citrus_fruit,
## whole_milk} => {rolls/buns} 0.001525165 0.3846154 0.003965430 2.0910405 15
## [14248] {beef,
## rolls/buns,
## whole_milk} => {citrus_fruit} 0.001525165 0.2238806 0.006812405 2.7049947 15
## [14249] {citrus_fruit,
## rolls/buns,
## whole_milk} => {beef} 0.001525165 0.2112676 0.007219115 4.0267769 15
## [14250] {beef,
## citrus_fruit,
## other_vegetables} => {whole_milk} 0.002135231 0.6363636 0.003355363 2.4905039 21
## [14251] {beef,
## citrus_fruit,
## whole_milk} => {other_vegetables} 0.002135231 0.5384615 0.003965430 2.7828530 21
## [14252] {beef,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.002135231 0.2307692 0.009252669 2.7882253 21
## [14253] {beef,
## root_vegetables,
## shopping_bags} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [14254] {beef,
## other_vegetables,
## shopping_bags} => {root_vegetables} 0.001220132 0.5000000 0.002440264 4.5872201 12
## [14255] {beef,
## sausage,
## tropical_fruit} => {root_vegetables} 0.001016777 0.6250000 0.001626843 5.7340252 10
## [14256] {beef,
## root_vegetables,
## sausage} => {tropical_fruit} 0.001016777 0.3448276 0.002948653 3.2862203 10
## [14257] {beef,
## root_vegetables,
## tropical_fruit} => {sausage} 0.001016777 0.2702703 0.003762074 2.8767404 10
## [14258] {root_vegetables,
## sausage,
## tropical_fruit} => {beef} 0.001016777 0.2857143 0.003558719 5.4457364 10
## [14259] {beef,
## sausage,
## tropical_fruit} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [14260] {beef,
## other_vegetables,
## sausage} => {tropical_fruit} 0.001118454 0.3928571 0.002846975 3.7439438 11
## [14261] {beef,
## other_vegetables,
## tropical_fruit} => {sausage} 0.001118454 0.2500000 0.004473818 2.6609848 11
## [14262] {beef,
## sausage,
## tropical_fruit} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [14263] {beef,
## sausage,
## whole_milk} => {tropical_fruit} 0.001220132 0.4000000 0.003050330 3.8120155 12
## [14264] {beef,
## tropical_fruit,
## whole_milk} => {sausage} 0.001220132 0.2666667 0.004575496 2.8383838 12
## [14265] {beef,
## root_vegetables,
## sausage} => {yogurt} 0.001321810 0.4482759 0.002948653 3.2134061 13
## [14266] {beef,
## sausage,
## yogurt} => {root_vegetables} 0.001321810 0.6842105 0.001931876 6.2772486 13
## [14267] {beef,
## root_vegetables,
## yogurt} => {sausage} 0.001321810 0.2888889 0.004575496 3.0749158 13
## [14268] {root_vegetables,
## sausage,
## yogurt} => {beef} 0.001321810 0.2549020 0.005185562 4.8584511 13
## [14269] {beef,
## root_vegetables,
## sausage} => {rolls/buns} 0.001220132 0.4137931 0.002948653 2.2496712 12
## [14270] {beef,
## rolls/buns,
## sausage} => {root_vegetables} 0.001220132 0.6315789 0.001931876 5.7943833 12
## [14271] {beef,
## rolls/buns,
## root_vegetables} => {sausage} 0.001220132 0.2448980 0.004982206 2.6066790 12
## [14272] {rolls/buns,
## root_vegetables,
## sausage} => {beef} 0.001220132 0.2448980 0.004982206 4.6677741 12
## [14273] {beef,
## root_vegetables,
## sausage} => {other_vegetables} 0.001626843 0.5517241 0.002948653 2.8513962 16
## [14274] {beef,
## other_vegetables,
## sausage} => {root_vegetables} 0.001626843 0.5714286 0.002846975 5.2425373 16
## [14275] {beef,
## other_vegetables,
## root_vegetables} => {sausage} 0.001626843 0.2051282 0.007930859 2.1833722 16
## [14276] {other_vegetables,
## root_vegetables,
## sausage} => {beef} 0.001626843 0.2388060 0.006812405 4.5516603 16
## [14277] {beef,
## root_vegetables,
## sausage} => {whole_milk} 0.001728521 0.5862069 0.002948653 2.2942080 17
## [14278] {beef,
## sausage,
## whole_milk} => {root_vegetables} 0.001728521 0.5666667 0.003050330 5.1988495 17
## [14279] {beef,
## root_vegetables,
## whole_milk} => {sausage} 0.001728521 0.2151899 0.008032537 2.2904680 17
## [14280] {root_vegetables,
## sausage,
## whole_milk} => {beef} 0.001728521 0.2236842 0.007727504 4.2634384 17
## [14281] {beef,
## sausage,
## yogurt} => {rolls/buns} 0.001016777 0.5263158 0.001931876 2.8614239 10
## [14282] {beef,
## rolls/buns,
## sausage} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [14283] {beef,
## rolls/buns,
## yogurt} => {sausage} 0.001016777 0.2702703 0.003762074 2.8767404 10
## [14284] {beef,
## sausage,
## yogurt} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [14285] {beef,
## other_vegetables,
## sausage} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [14286] {beef,
## rolls/buns,
## sausage} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [14287] {beef,
## sausage,
## whole_milk} => {rolls/buns} 0.001118454 0.3666667 0.003050330 1.9934586 11
## [14288] {beef,
## other_vegetables,
## sausage} => {whole_milk} 0.001525165 0.5357143 0.002846975 2.0965977 15
## [14289] {beef,
## sausage,
## whole_milk} => {other_vegetables} 0.001525165 0.5000000 0.003050330 2.5840778 15
## [14290] {beef,
## bottled_water,
## tropical_fruit} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [14291] {beef,
## bottled_water,
## other_vegetables} => {tropical_fruit} 0.001016777 0.4347826 0.002338587 4.1434951 10
## [14292] {beef,
## other_vegetables,
## tropical_fruit} => {bottled_water} 0.001016777 0.2272727 0.004473818 2.0563268 10
## [14293] {beef,
## bottled_water,
## root_vegetables} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [14294] {beef,
## bottled_water,
## whole_milk} => {root_vegetables} 0.001118454 0.3928571 0.002846975 3.6042444 11
## [14295] {beef,
## bottled_water,
## other_vegetables} => {whole_milk} 0.001016777 0.4347826 0.002338587 1.7015865 10
## [14296] {beef,
## bottled_water,
## whole_milk} => {other_vegetables} 0.001016777 0.3571429 0.002846975 1.8457698 10
## [14297] {beef,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001321810 0.3513514 0.003762074 2.5186156 13
## [14298] {beef,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001321810 0.4482759 0.002948653 4.1126801 13
## [14299] {beef,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001321810 0.2888889 0.004575496 2.7531223 13
## [14300] {beef,
## root_vegetables,
## tropical_fruit} => {rolls/buns} 0.001728521 0.4594595 0.003762074 2.4979457 17
## [14301] {beef,
## rolls/buns,
## tropical_fruit} => {root_vegetables} 0.001728521 0.6296296 0.002745297 5.7764994 17
## [14302] {beef,
## rolls/buns,
## root_vegetables} => {tropical_fruit} 0.001728521 0.3469388 0.004982206 3.3063400 17
## [14303] {rolls/buns,
## root_vegetables,
## tropical_fruit} => {beef} 0.001728521 0.2931034 0.005897306 5.5865744 17
## [14304] {beef,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.002745297 0.7297297 0.003762074 3.7713567 27
## [14305] {beef,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.002745297 0.6136364 0.004473818 5.6297702 27
## [14306] {beef,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.002745297 0.3461538 0.007930859 3.2988596 27
## [14307] {other_vegetables,
## root_vegetables,
## tropical_fruit} => {beef} 0.002745297 0.2231405 0.012302999 4.2530751 27
## [14308] {beef,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.002541942 0.6756757 0.003762074 2.6443574 25
## [14309] {beef,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.002541942 0.5555556 0.004575496 5.0969113 25
## [14310] {beef,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.002541942 0.3164557 0.008032537 3.0158351 25
## [14311] {root_vegetables,
## tropical_fruit,
## whole_milk} => {beef} 0.002541942 0.2118644 0.011997966 4.0381520 25
## [14312] {beef,
## soda,
## tropical_fruit} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [14313] {beef,
## other_vegetables,
## tropical_fruit} => {soda} 0.001016777 0.2272727 0.004473818 1.3033395 10
## [14314] {beef,
## other_vegetables,
## soda} => {tropical_fruit} 0.001016777 0.2857143 0.003558719 2.7228682 10
## [14315] {beef,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001423488 0.4827586 0.002948653 2.6246164 14
## [14316] {beef,
## rolls/buns,
## tropical_fruit} => {yogurt} 0.001423488 0.5185185 0.002745297 3.7169312 14
## [14317] {beef,
## rolls/buns,
## yogurt} => {tropical_fruit} 0.001423488 0.3783784 0.003762074 3.6059606 14
## [14318] {beef,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001830198 0.6206897 0.002948653 3.2078207 18
## [14319] {beef,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001830198 0.4090909 0.004473818 2.9325139 18
## [14320] {beef,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001830198 0.3529412 0.005185562 3.3635431 18
## [14321] {beef,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001931876 0.6551724 0.002948653 2.5641149 19
## [14322] {beef,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001931876 0.4222222 0.004575496 3.0266440 19
## [14323] {beef,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001931876 0.3166667 0.006100661 3.0178456 19
## [14324] {beef,
## rolls/buns,
## tropical_fruit} => {other_vegetables} 0.001728521 0.6296296 0.002745297 3.2540239 17
## [14325] {beef,
## other_vegetables,
## tropical_fruit} => {rolls/buns} 0.001728521 0.3863636 0.004473818 2.1005453 17
## [14326] {beef,
## other_vegetables,
## rolls/buns} => {tropical_fruit} 0.001728521 0.2982456 0.005795628 2.8422923 17
## [14327] {other_vegetables,
## rolls/buns,
## tropical_fruit} => {beef} 0.001728521 0.2207792 0.007829181 4.2080691 17
## [14328] {beef,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.002135231 0.7777778 0.002745297 3.0439492 21
## [14329] {beef,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.002135231 0.4666667 0.004575496 2.5371292 21
## [14330] {beef,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.002135231 0.3134328 0.006812405 2.9870271 21
## [14331] {beef,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.002948653 0.6590909 0.004473818 2.5794505 29
## [14332] {beef,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.002948653 0.6444444 0.004575496 3.3305891 29
## [14333] {beef,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.002948653 0.3186813 0.009252669 3.0370453 29
## [14334] {beef,
## root_vegetables,
## soda} => {rolls/buns} 0.001016777 0.2564103 0.003965430 1.3940270 10
## [14335] {beef,
## rolls/buns,
## root_vegetables} => {soda} 0.001016777 0.2040816 0.004982206 1.1703457 10
## [14336] {beef,
## rolls/buns,
## soda} => {root_vegetables} 0.001016777 0.4761905 0.002135231 4.3687811 10
## [14337] {rolls/buns,
## root_vegetables,
## soda} => {beef} 0.001016777 0.2083333 0.004880529 3.9708495 10
## [14338] {beef,
## root_vegetables,
## soda} => {other_vegetables} 0.002033554 0.5128205 0.003965430 2.6503362 20
## [14339] {beef,
## other_vegetables,
## root_vegetables} => {soda} 0.002033554 0.2564103 0.007930859 1.4704343 20
## [14340] {beef,
## other_vegetables,
## soda} => {root_vegetables} 0.002033554 0.5714286 0.003558719 5.2425373 20
## [14341] {other_vegetables,
## root_vegetables,
## soda} => {beef} 0.002033554 0.2469136 0.008235892 4.7061920 20
## [14342] {beef,
## root_vegetables,
## soda} => {whole_milk} 0.001626843 0.4102564 0.003965430 1.6055996 16
## [14343] {beef,
## root_vegetables,
## whole_milk} => {soda} 0.001626843 0.2025316 0.008032537 1.1614570 16
## [14344] {beef,
## soda,
## whole_milk} => {root_vegetables} 0.001626843 0.4705882 0.003457041 4.3173837 16
## [14345] {root_vegetables,
## soda,
## whole_milk} => {beef} 0.001626843 0.2000000 0.008134215 3.8120155 16
## [14346] {beef,
## root_vegetables,
## yogurt} => {rolls/buns} 0.001728521 0.3777778 0.004575496 2.0538665 17
## [14347] {beef,
## rolls/buns,
## root_vegetables} => {yogurt} 0.001728521 0.3469388 0.004982206 2.4869846 17
## [14348] {beef,
## rolls/buns,
## yogurt} => {root_vegetables} 0.001728521 0.4594595 0.003762074 4.2152834 17
## [14349] {rolls/buns,
## root_vegetables,
## yogurt} => {beef} 0.001728521 0.2394366 0.007219115 4.5636805 17
## [14350] {beef,
## root_vegetables,
## yogurt} => {other_vegetables} 0.002338587 0.5111111 0.004575496 2.6415017 23
## [14351] {beef,
## other_vegetables,
## root_vegetables} => {yogurt} 0.002338587 0.2948718 0.007930859 2.1137493 23
## [14352] {beef,
## other_vegetables,
## yogurt} => {root_vegetables} 0.002338587 0.4509804 0.005185562 4.1374927 23
## [14353] {beef,
## root_vegetables,
## yogurt} => {whole_milk} 0.002541942 0.5555556 0.004575496 2.1742495 25
## [14354] {beef,
## root_vegetables,
## whole_milk} => {yogurt} 0.002541942 0.3164557 0.008032537 2.2684707 25
## [14355] {beef,
## whole_milk,
## yogurt} => {root_vegetables} 0.002541942 0.4166667 0.006100661 3.8226835 25
## [14356] {beef,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.002846975 0.5714286 0.004982206 2.9532317 28
## [14357] {beef,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.002846975 0.3589744 0.007930859 1.9516378 28
## [14358] {beef,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.002846975 0.4912281 0.005795628 4.5067426 28
## [14359] {other_vegetables,
## rolls/buns,
## root_vegetables} => {beef} 0.002846975 0.2333333 0.012201322 4.4473514 28
## [14360] {beef,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.002846975 0.5714286 0.004982206 2.2363709 28
## [14361] {beef,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.002846975 0.3544304 0.008032537 1.9269335 28
## [14362] {beef,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.002846975 0.4179104 0.006812405 3.8340945 28
## [14363] {rolls/buns,
## root_vegetables,
## whole_milk} => {beef} 0.002846975 0.2240000 0.012709710 4.2694574 28
## [14364] {beef,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.003965430 0.5000000 0.007930859 1.9568245 39
## [14365] {beef,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.003965430 0.4936709 0.008032537 2.5513679 39
## [14366] {beef,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.003965430 0.4285714 0.009252669 3.9319030 39
## [14367] {beef,
## soda,
## yogurt} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [14368] {beef,
## soda,
## whole_milk} => {yogurt} 0.001220132 0.3529412 0.003457041 2.5300120 12
## [14369] {beef,
## whole_milk,
## yogurt} => {soda} 0.001220132 0.2000000 0.006100661 1.1469388 12
## [14370] {beef,
## rolls/buns,
## soda} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [14371] {beef,
## other_vegetables,
## soda} => {rolls/buns} 0.001118454 0.3142857 0.003558719 1.7086788 11
## [14372] {beef,
## rolls/buns,
## soda} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [14373] {beef,
## soda,
## whole_milk} => {rolls/buns} 0.001118454 0.3235294 0.003457041 1.7589341 11
## [14374] {beef,
## other_vegetables,
## soda} => {whole_milk} 0.002033554 0.5714286 0.003558719 2.2363709 20
## [14375] {beef,
## soda,
## whole_milk} => {other_vegetables} 0.002033554 0.5882353 0.003457041 3.0400915 20
## [14376] {beef,
## other_vegetables,
## whole_milk} => {soda} 0.002033554 0.2197802 0.009252669 1.2603723 20
## [14377] {beef,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001626843 0.4324324 0.003762074 2.2348781 16
## [14378] {beef,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001626843 0.3137255 0.005185562 1.7056331 16
## [14379] {beef,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001626843 0.2807018 0.005795628 2.0121733 16
## [14380] {beef,
## rolls/buns,
## yogurt} => {whole_milk} 0.002236909 0.5945946 0.003762074 2.3270346 22
## [14381] {beef,
## whole_milk,
## yogurt} => {rolls/buns} 0.002236909 0.3666667 0.006100661 1.9934586 22
## [14382] {beef,
## rolls/buns,
## whole_milk} => {yogurt} 0.002236909 0.3283582 0.006812405 2.3537923 22
## [14383] {beef,
## other_vegetables,
## yogurt} => {whole_milk} 0.003050330 0.5882353 0.005185562 2.3021465 30
## [14384] {beef,
## whole_milk,
## yogurt} => {other_vegetables} 0.003050330 0.5000000 0.006100661 2.5840778 30
## [14385] {beef,
## other_vegetables,
## whole_milk} => {yogurt} 0.003050330 0.3296703 0.009252669 2.3631980 30
## [14386] {beef,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.003355363 0.5789474 0.005795628 2.2657968 33
## [14387] {beef,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.003355363 0.4925373 0.006812405 2.5455094 33
## [14388] {beef,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.003355363 0.3626374 0.009252669 1.9715525 33
## [14389] {curd,
## napkins,
## yogurt} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [14390] {curd,
## napkins,
## whole_milk} => {yogurt} 0.001220132 0.4615385 0.002643620 3.3084772 12
## [14391] {napkins,
## whole_milk,
## yogurt} => {curd} 0.001220132 0.2000000 0.006100661 3.7538168 12
## [14392] {curd,
## napkins,
## other_vegetables} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [14393] {curd,
## napkins,
## whole_milk} => {other_vegetables} 0.001118454 0.4230769 0.002643620 2.1865273 11
## [14394] {curd,
## pork,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [14395] {curd,
## pork,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.4000000 0.002541942 5.5801418 10
## [14396] {pork,
## whipped/sour_cream,
## whole_milk} => {curd} 0.001016777 0.2222222 0.004575496 4.1709075 10
## [14397] {curd,
## pork,
## yogurt} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [14398] {curd,
## pork,
## whole_milk} => {yogurt} 0.001118454 0.4400000 0.002541942 3.1540816 11
## [14399] {pork,
## whole_milk,
## yogurt} => {curd} 0.001118454 0.2291667 0.004880529 4.3012484 11
## [14400] {curd,
## other_vegetables,
## pork} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [14401] {curd,
## pork,
## whole_milk} => {other_vegetables} 0.001016777 0.4000000 0.002541942 2.0672622 10
## [14402] {curd,
## frankfurter,
## other_vegetables} => {whole_milk} 0.001423488 0.7000000 0.002033554 2.7395543 14
## [14403] {curd,
## frankfurter,
## whole_milk} => {other_vegetables} 0.001423488 0.6363636 0.002236909 3.2888263 14
## [14404] {bottled_beer,
## curd,
## other_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [14405] {bottled_beer,
## curd,
## whole_milk} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [14406] {brown_bread,
## curd,
## yogurt} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [14407] {brown_bread,
## curd,
## other_vegetables} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [14408] {brown_bread,
## other_vegetables,
## yogurt} => {curd} 0.001118454 0.2156863 0.005185562 4.0482338 11
## [14409] {brown_bread,
## curd,
## yogurt} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [14410] {brown_bread,
## curd,
## whole_milk} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [14411] {brown_bread,
## curd,
## other_vegetables} => {whole_milk} 0.001016777 0.4347826 0.002338587 1.7015865 10
## [14412] {brown_bread,
## curd,
## whole_milk} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [14413] {butter,
## curd,
## margarine} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [14414] {curd,
## margarine,
## whole_milk} => {butter} 0.001016777 0.2941176 0.003457041 5.3076093 10
## [14415] {butter,
## curd,
## whole_milk} => {margarine} 0.001016777 0.2083333 0.004880529 3.5572193 10
## [14416] {butter,
## margarine,
## whole_milk} => {curd} 0.001016777 0.3333333 0.003050330 6.2563613 10
## [14417] {curd,
## domestic_eggs,
## margarine} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [14418] {curd,
## margarine,
## whole_milk} => {domestic_eggs} 0.001118454 0.3235294 0.003457041 5.0992176 11
## [14419] {curd,
## domestic_eggs,
## whole_milk} => {margarine} 0.001118454 0.2340426 0.004778851 3.9961953 11
## [14420] {domestic_eggs,
## margarine,
## whole_milk} => {curd} 0.001118454 0.2156863 0.005185562 4.0482338 11
## [14421] {curd,
## margarine,
## whipped/sour_cream} => {yogurt} 0.001016777 0.7692308 0.001321810 5.5141287 10
## [14422] {curd,
## margarine,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3703704 0.002745297 5.1667980 10
## [14423] {curd,
## whipped/sour_cream,
## yogurt} => {margarine} 0.001016777 0.2222222 0.004575496 3.7943673 10
## [14424] {margarine,
## whipped/sour_cream,
## yogurt} => {curd} 0.001016777 0.3225806 0.003152008 6.0545432 10
## [14425] {curd,
## margarine,
## pip_fruit} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [14426] {curd,
## margarine,
## yogurt} => {pip_fruit} 0.001016777 0.3703704 0.002745297 4.8959578 10
## [14427] {curd,
## pip_fruit,
## yogurt} => {margarine} 0.001016777 0.2631579 0.003863752 4.4933297 10
## [14428] {margarine,
## pip_fruit,
## yogurt} => {curd} 0.001016777 0.3846154 0.002643620 7.2188784 10
## [14429] {curd,
## margarine,
## pip_fruit} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [14430] {curd,
## margarine,
## whole_milk} => {pip_fruit} 0.001016777 0.2941176 0.003457041 3.8879665 10
## [14431] {curd,
## pip_fruit,
## whole_milk} => {margarine} 0.001016777 0.2083333 0.004880529 3.5572193 10
## [14432] {margarine,
## pip_fruit,
## whole_milk} => {curd} 0.001016777 0.2564103 0.003965430 4.8125856 10
## [14433] {curd,
## margarine,
## tropical_fruit} => {yogurt} 0.001118454 0.6111111 0.001830198 4.3806689 11
## [14434] {curd,
## margarine,
## yogurt} => {tropical_fruit} 0.001118454 0.4074074 0.002745297 3.8826084 11
## [14435] {curd,
## tropical_fruit,
## yogurt} => {margarine} 0.001118454 0.2115385 0.005287239 3.6119458 11
## [14436] {margarine,
## tropical_fruit,
## yogurt} => {curd} 0.001118454 0.2750000 0.004067107 5.1614981 11
## [14437] {curd,
## margarine,
## tropical_fruit} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [14438] {curd,
## margarine,
## other_vegetables} => {tropical_fruit} 0.001118454 0.4074074 0.002745297 3.8826084 11
## [14439] {curd,
## other_vegetables,
## tropical_fruit} => {margarine} 0.001118454 0.2115385 0.005287239 3.6119458 11
## [14440] {margarine,
## other_vegetables,
## tropical_fruit} => {curd} 0.001118454 0.2820513 0.003965430 5.2938442 11
## [14441] {curd,
## margarine,
## tropical_fruit} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [14442] {curd,
## margarine,
## whole_milk} => {tropical_fruit} 0.001118454 0.3235294 0.003457041 3.0832478 11
## [14443] {margarine,
## tropical_fruit,
## whole_milk} => {curd} 0.001118454 0.2500000 0.004473818 4.6922710 11
## [14444] {curd,
## margarine,
## root_vegetables} => {yogurt} 0.001220132 0.6666667 0.001830198 4.7789116 12
## [14445] {curd,
## margarine,
## yogurt} => {root_vegetables} 0.001220132 0.4444444 0.002745297 4.0775290 12
## [14446] {curd,
## root_vegetables,
## yogurt} => {margarine} 0.001220132 0.2608696 0.004677173 4.4542572 12
## [14447] {margarine,
## root_vegetables,
## yogurt} => {curd} 0.001220132 0.3529412 0.003457041 6.6243826 12
## [14448] {curd,
## margarine,
## root_vegetables} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [14449] {curd,
## margarine,
## other_vegetables} => {root_vegetables} 0.001220132 0.4444444 0.002745297 4.0775290 12
## [14450] {curd,
## other_vegetables,
## root_vegetables} => {margarine} 0.001220132 0.2222222 0.005490595 3.7943673 12
## [14451] {margarine,
## other_vegetables,
## root_vegetables} => {curd} 0.001220132 0.2068966 0.005897306 3.8832588 12
## [14452] {curd,
## margarine,
## yogurt} => {other_vegetables} 0.001423488 0.5185185 0.002745297 2.6797844 14
## [14453] {curd,
## margarine,
## other_vegetables} => {yogurt} 0.001423488 0.5185185 0.002745297 3.7169312 14
## [14454] {curd,
## other_vegetables,
## yogurt} => {margarine} 0.001423488 0.2333333 0.006100661 3.9840856 14
## [14455] {margarine,
## other_vegetables,
## yogurt} => {curd} 0.001423488 0.2500000 0.005693950 4.6922710 14
## [14456] {curd,
## margarine,
## yogurt} => {whole_milk} 0.001626843 0.5925926 0.002745297 2.3191994 16
## [14457] {curd,
## margarine,
## whole_milk} => {yogurt} 0.001626843 0.4705882 0.003457041 3.3733493 16
## [14458] {margarine,
## whole_milk,
## yogurt} => {curd} 0.001626843 0.2318841 0.007015760 4.3522514 16
## [14459] {curd,
## margarine,
## rolls/buns} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [14460] {curd,
## margarine,
## whole_milk} => {rolls/buns} 0.001321810 0.3823529 0.003457041 2.0787403 13
## [14461] {curd,
## rolls/buns,
## whole_milk} => {margarine} 0.001321810 0.2241379 0.005897306 3.8270773 13
## [14462] {curd,
## margarine,
## other_vegetables} => {whole_milk} 0.001626843 0.5925926 0.002745297 2.3191994 16
## [14463] {curd,
## margarine,
## whole_milk} => {other_vegetables} 0.001626843 0.4705882 0.003457041 2.4320732 16
## [14464] {butter,
## curd,
## domestic_eggs} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [14465] {butter,
## curd,
## other_vegetables} => {domestic_eggs} 0.001016777 0.3333333 0.003050330 5.2537393 10
## [14466] {curd,
## domestic_eggs,
## other_vegetables} => {butter} 0.001016777 0.2941176 0.003457041 5.3076093 10
## [14467] {butter,
## domestic_eggs,
## other_vegetables} => {curd} 0.001016777 0.2222222 0.004575496 4.1709075 10
## [14468] {butter,
## curd,
## domestic_eggs} => {whole_milk} 0.001118454 0.9166667 0.001220132 3.5875116 11
## [14469] {butter,
## curd,
## whole_milk} => {domestic_eggs} 0.001118454 0.2291667 0.004880529 3.6119458 11
## [14470] {curd,
## domestic_eggs,
## whole_milk} => {butter} 0.001118454 0.2340426 0.004778851 4.2235019 11
## [14471] {butter,
## curd,
## whipped/sour_cream} => {yogurt} 0.001220132 0.5714286 0.002135231 4.0962099 12
## [14472] {butter,
## curd,
## yogurt} => {whipped/sour_cream} 0.001220132 0.4137931 0.002948653 5.7725605 12
## [14473] {curd,
## whipped/sour_cream,
## yogurt} => {butter} 0.001220132 0.2666667 0.004575496 4.8122324 12
## [14474] {butter,
## whipped/sour_cream,
## yogurt} => {curd} 0.001220132 0.3157895 0.003863752 5.9270791 12
## [14475] {butter,
## curd,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.6666667 0.002135231 3.4454370 14
## [14476] {butter,
## curd,
## other_vegetables} => {whipped/sour_cream} 0.001423488 0.4666667 0.003050330 6.5101655 14
## [14477] {curd,
## other_vegetables,
## whipped/sour_cream} => {butter} 0.001423488 0.3255814 0.004372140 5.8754000 14
## [14478] {butter,
## other_vegetables,
## whipped/sour_cream} => {curd} 0.001423488 0.2456140 0.005795628 4.6099504 14
## [14479] {butter,
## curd,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [14480] {butter,
## curd,
## whole_milk} => {whipped/sour_cream} 0.001525165 0.3125000 0.004880529 4.3594858 15
## [14481] {curd,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001525165 0.2586207 0.005897306 4.6670357 15
## [14482] {butter,
## whipped/sour_cream,
## whole_milk} => {curd} 0.001525165 0.2272727 0.006710727 4.2657009 15
## [14483] {butter,
## curd,
## pip_fruit} => {whole_milk} 0.001220132 0.8000000 0.001525165 3.1309192 12
## [14484] {butter,
## curd,
## whole_milk} => {pip_fruit} 0.001220132 0.2500000 0.004880529 3.3047715 12
## [14485] {curd,
## pip_fruit,
## whole_milk} => {butter} 0.001220132 0.2500000 0.004880529 4.5114679 12
## [14486] {butter,
## pip_fruit,
## whole_milk} => {curd} 0.001220132 0.2727273 0.004473818 5.1188411 12
## [14487] {butter,
## curd,
## pastry} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [14488] {butter,
## curd,
## yogurt} => {pastry} 0.001016777 0.3448276 0.002948653 3.8758621 10
## [14489] {curd,
## pastry,
## yogurt} => {butter} 0.001016777 0.3125000 0.003253686 5.6393349 10
## [14490] {butter,
## pastry,
## yogurt} => {curd} 0.001016777 0.5000000 0.002033554 9.3845420 10
## [14491] {butter,
## curd,
## pastry} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [14492] {butter,
## curd,
## other_vegetables} => {pastry} 0.001118454 0.3666667 0.003050330 4.1213333 11
## [14493] {curd,
## other_vegetables,
## pastry} => {butter} 0.001118454 0.3437500 0.003253686 6.2032683 11
## [14494] {butter,
## other_vegetables,
## pastry} => {curd} 0.001118454 0.2894737 0.003863752 5.4331559 11
## [14495] {butter,
## curd,
## pastry} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [14496] {butter,
## curd,
## whole_milk} => {pastry} 0.001118454 0.2291667 0.004880529 2.5758333 11
## [14497] {curd,
## pastry,
## whole_milk} => {butter} 0.001118454 0.2500000 0.004473818 4.5114679 11
## [14498] {butter,
## pastry,
## whole_milk} => {curd} 0.001118454 0.2820513 0.003965430 5.2938442 11
## [14499] {butter,
## citrus_fruit,
## curd} => {whole_milk} 0.001118454 0.9166667 0.001220132 3.5875116 11
## [14500] {butter,
## curd,
## whole_milk} => {citrus_fruit} 0.001118454 0.2291667 0.004880529 2.7688626 11
## [14501] {citrus_fruit,
## curd,
## whole_milk} => {butter} 0.001118454 0.3055556 0.003660397 5.5140163 11
## [14502] {butter,
## citrus_fruit,
## whole_milk} => {curd} 0.001118454 0.2200000 0.005083884 4.1291985 11
## [14503] {butter,
## curd,
## tropical_fruit} => {yogurt} 0.001525165 0.7894737 0.001931876 5.6592374 15
## [14504] {butter,
## curd,
## yogurt} => {tropical_fruit} 0.001525165 0.5172414 0.002948653 4.9293304 15
## [14505] {curd,
## tropical_fruit,
## yogurt} => {butter} 0.001525165 0.2884615 0.005287239 5.2055399 15
## [14506] {butter,
## tropical_fruit,
## yogurt} => {curd} 0.001525165 0.3333333 0.004575496 6.2563613 15
## [14507] {butter,
## curd,
## tropical_fruit} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [14508] {butter,
## curd,
## other_vegetables} => {tropical_fruit} 0.001220132 0.4000000 0.003050330 3.8120155 12
## [14509] {curd,
## other_vegetables,
## tropical_fruit} => {butter} 0.001220132 0.2307692 0.005287239 4.1644319 12
## [14510] {butter,
## other_vegetables,
## tropical_fruit} => {curd} 0.001220132 0.2222222 0.005490595 4.1709075 12
## [14511] {butter,
## curd,
## tropical_fruit} => {whole_milk} 0.001423488 0.7368421 0.001931876 2.8837414 14
## [14512] {butter,
## curd,
## whole_milk} => {tropical_fruit} 0.001423488 0.2916667 0.004880529 2.7795946 14
## [14513] {curd,
## tropical_fruit,
## whole_milk} => {butter} 0.001423488 0.2187500 0.006507372 3.9475344 14
## [14514] {butter,
## tropical_fruit,
## whole_milk} => {curd} 0.001423488 0.2295082 0.006202339 4.3076586 14
## [14515] {butter,
## curd,
## root_vegetables} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [14516] {butter,
## curd,
## yogurt} => {root_vegetables} 0.001016777 0.3448276 0.002948653 3.1636001 10
## [14517] {curd,
## root_vegetables,
## yogurt} => {butter} 0.001016777 0.2173913 0.004677173 3.9230156 10
## [14518] {butter,
## root_vegetables,
## yogurt} => {curd} 0.001016777 0.2631579 0.003863752 4.9392326 10
## [14519] {butter,
## curd,
## root_vegetables} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [14520] {butter,
## curd,
## other_vegetables} => {root_vegetables} 0.001016777 0.3333333 0.003050330 3.0581468 10
## [14521] {butter,
## curd,
## root_vegetables} => {whole_milk} 0.001525165 0.7500000 0.002033554 2.9352368 15
## [14522] {butter,
## curd,
## whole_milk} => {root_vegetables} 0.001525165 0.3125000 0.004880529 2.8670126 15
## [14523] {curd,
## root_vegetables,
## whole_milk} => {butter} 0.001525165 0.2459016 0.006202339 4.4375094 15
## [14524] {butter,
## curd,
## yogurt} => {other_vegetables} 0.001525165 0.5172414 0.002948653 2.6731839 15
## [14525] {butter,
## curd,
## other_vegetables} => {yogurt} 0.001525165 0.5000000 0.003050330 3.5841837 15
## [14526] {curd,
## other_vegetables,
## yogurt} => {butter} 0.001525165 0.2500000 0.006100661 4.5114679 15
## [14527] {butter,
## other_vegetables,
## yogurt} => {curd} 0.001525165 0.2380952 0.006405694 4.4688295 15
## [14528] {butter,
## curd,
## yogurt} => {whole_milk} 0.002338587 0.7931034 0.002948653 3.1039285 23
## [14529] {butter,
## curd,
## whole_milk} => {yogurt} 0.002338587 0.4791667 0.004880529 3.4348427 23
## [14530] {curd,
## whole_milk,
## yogurt} => {butter} 0.002338587 0.2323232 0.010066090 4.1924752 23
## [14531] {butter,
## whole_milk,
## yogurt} => {curd} 0.002338587 0.2500000 0.009354347 4.6922710 23
## [14532] {butter,
## curd,
## rolls/buns} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [14533] {butter,
## curd,
## other_vegetables} => {rolls/buns} 0.001016777 0.3333333 0.003050330 1.8122351 10
## [14534] {curd,
## other_vegetables,
## rolls/buns} => {butter} 0.001016777 0.2777778 0.003660397 5.0127421 10
## [14535] {butter,
## curd,
## rolls/buns} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [14536] {butter,
## curd,
## whole_milk} => {rolls/buns} 0.001220132 0.2500000 0.004880529 1.3591763 12
## [14537] {curd,
## rolls/buns,
## whole_milk} => {butter} 0.001220132 0.2068966 0.005897306 3.7336286 12
## [14538] {butter,
## curd,
## other_vegetables} => {whole_milk} 0.002236909 0.7333333 0.003050330 2.8700093 22
## [14539] {butter,
## curd,
## whole_milk} => {other_vegetables} 0.002236909 0.4583333 0.004880529 2.3687380 22
## [14540] {curd,
## other_vegetables,
## whole_milk} => {butter} 0.002236909 0.2268041 0.009862735 4.0928781 22
## [14541] {curd,
## newspapers,
## other_vegetables} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [14542] {curd,
## newspapers,
## whole_milk} => {other_vegetables} 0.001321810 0.4642857 0.002846975 2.3995008 13
## [14543] {curd,
## domestic_eggs,
## whipped/sour_cream} => {yogurt} 0.001220132 0.6666667 0.001830198 4.7789116 12
## [14544] {curd,
## domestic_eggs,
## yogurt} => {whipped/sour_cream} 0.001220132 0.4444444 0.002745297 6.2001576 12
## [14545] {curd,
## whipped/sour_cream,
## yogurt} => {domestic_eggs} 0.001220132 0.2666667 0.004575496 4.2029915 12
## [14546] {domestic_eggs,
## whipped/sour_cream,
## yogurt} => {curd} 0.001220132 0.3428571 0.003558719 6.4351145 12
## [14547] {curd,
## domestic_eggs,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [14548] {curd,
## domestic_eggs,
## other_vegetables} => {whipped/sour_cream} 0.001118454 0.3235294 0.003457041 4.5133500 11
## [14549] {curd,
## other_vegetables,
## whipped/sour_cream} => {domestic_eggs} 0.001118454 0.2558140 0.004372140 4.0319395 11
## [14550] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {curd} 0.001118454 0.2200000 0.005083884 4.1291985 11
## [14551] {curd,
## domestic_eggs,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [14552] {curd,
## domestic_eggs,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.2553191 0.004778851 3.5617927 12
## [14553] {curd,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001220132 0.2068966 0.005897306 3.2609416 12
## [14554] {domestic_eggs,
## whipped/sour_cream,
## whole_milk} => {curd} 0.001220132 0.2142857 0.005693950 4.0219466 12
## [14555] {curd,
## domestic_eggs,
## tropical_fruit} => {yogurt} 0.001220132 0.5454545 0.002236909 3.9100186 12
## [14556] {curd,
## domestic_eggs,
## yogurt} => {tropical_fruit} 0.001220132 0.4444444 0.002745297 4.2355728 12
## [14557] {curd,
## tropical_fruit,
## yogurt} => {domestic_eggs} 0.001220132 0.2307692 0.005287239 3.6372041 12
## [14558] {domestic_eggs,
## tropical_fruit,
## yogurt} => {curd} 0.001220132 0.2857143 0.004270463 5.3625954 12
## [14559] {curd,
## domestic_eggs,
## tropical_fruit} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [14560] {curd,
## domestic_eggs,
## other_vegetables} => {tropical_fruit} 0.001321810 0.3823529 0.003457041 3.6438383 13
## [14561] {curd,
## other_vegetables,
## tropical_fruit} => {domestic_eggs} 0.001321810 0.2500000 0.005287239 3.9403045 13
## [14562] {domestic_eggs,
## other_vegetables,
## tropical_fruit} => {curd} 0.001321810 0.2765957 0.004778851 5.1914488 13
## [14563] {curd,
## domestic_eggs,
## tropical_fruit} => {whole_milk} 0.001728521 0.7727273 0.002236909 3.0241833 17
## [14564] {curd,
## domestic_eggs,
## whole_milk} => {tropical_fruit} 0.001728521 0.3617021 0.004778851 3.4470353 17
## [14565] {curd,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.001728521 0.2656250 0.006507372 4.1865735 17
## [14566] {domestic_eggs,
## tropical_fruit,
## whole_milk} => {curd} 0.001728521 0.2500000 0.006914082 4.6922710 17
## [14567] {curd,
## domestic_eggs,
## root_vegetables} => {yogurt} 0.001016777 0.4347826 0.002338587 3.1166815 10
## [14568] {curd,
## domestic_eggs,
## yogurt} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [14569] {curd,
## root_vegetables,
## yogurt} => {domestic_eggs} 0.001016777 0.2173913 0.004677173 3.4263517 10
## [14570] {domestic_eggs,
## root_vegetables,
## yogurt} => {curd} 0.001016777 0.2777778 0.003660397 5.2136344 10
## [14571] {curd,
## domestic_eggs,
## root_vegetables} => {other_vegetables} 0.001423488 0.6086957 0.002338587 3.1458338 14
## [14572] {curd,
## domestic_eggs,
## other_vegetables} => {root_vegetables} 0.001423488 0.4117647 0.003457041 3.7777107 14
## [14573] {curd,
## other_vegetables,
## root_vegetables} => {domestic_eggs} 0.001423488 0.2592593 0.005490595 4.0862417 14
## [14574] {curd,
## domestic_eggs,
## root_vegetables} => {whole_milk} 0.001830198 0.7826087 0.002338587 3.0628558 18
## [14575] {curd,
## domestic_eggs,
## whole_milk} => {root_vegetables} 0.001830198 0.3829787 0.004778851 3.5136154 18
## [14576] {curd,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001830198 0.2950820 0.006202339 4.6508512 18
## [14577] {domestic_eggs,
## root_vegetables,
## whole_milk} => {curd} 0.001830198 0.2142857 0.008540925 4.0219466 18
## [14578] {curd,
## domestic_eggs,
## yogurt} => {whole_milk} 0.002033554 0.7407407 0.002745297 2.8989993 20
## [14579] {curd,
## domestic_eggs,
## whole_milk} => {yogurt} 0.002033554 0.4255319 0.004778851 3.0503691 20
## [14580] {curd,
## whole_milk,
## yogurt} => {domestic_eggs} 0.002033554 0.2020202 0.010066090 3.1840844 20
## [14581] {domestic_eggs,
## whole_milk,
## yogurt} => {curd} 0.002033554 0.2631579 0.007727504 4.9392326 20
## [14582] {curd,
## domestic_eggs,
## other_vegetables} => {whole_milk} 0.002846975 0.8235294 0.003457041 3.2230051 28
## [14583] {curd,
## domestic_eggs,
## whole_milk} => {other_vegetables} 0.002846975 0.5957447 0.004778851 3.0789012 28
## [14584] {curd,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.002846975 0.2886598 0.009862735 4.5496299 28
## [14585] {domestic_eggs,
## other_vegetables,
## whole_milk} => {curd} 0.002846975 0.2314050 0.012302999 4.3432591 28
## [14586] {curd,
## fruit/vegetable_juice,
## tropical_fruit} => {other_vegetables} 0.001220132 0.7500000 0.001626843 3.8761167 12
## [14587] {curd,
## fruit/vegetable_juice,
## other_vegetables} => {tropical_fruit} 0.001220132 0.5217391 0.002338587 4.9721941 12
## [14588] {curd,
## other_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.001220132 0.2307692 0.005287239 3.1921454 12
## [14589] {curd,
## fruit/vegetable_juice,
## root_vegetables} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [14590] {curd,
## fruit/vegetable_juice,
## other_vegetables} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [14591] {curd,
## fruit/vegetable_juice,
## root_vegetables} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [14592] {curd,
## fruit/vegetable_juice,
## whole_milk} => {root_vegetables} 0.001321810 0.5416667 0.002440264 4.9694885 13
## [14593] {curd,
## root_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001321810 0.2131148 0.006202339 2.9479376 13
## [14594] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {curd} 0.001321810 0.2031250 0.006507372 3.8124702 13
## [14595] {curd,
## fruit/vegetable_juice,
## yogurt} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [14596] {curd,
## fruit/vegetable_juice,
## other_vegetables} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [14597] {curd,
## fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [14598] {curd,
## fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [14599] {curd,
## fruit/vegetable_juice,
## other_vegetables} => {whole_milk} 0.001220132 0.5217391 0.002338587 2.0419038 12
## [14600] {curd,
## fruit/vegetable_juice,
## whole_milk} => {other_vegetables} 0.001220132 0.5000000 0.002440264 2.5840778 12
## [14601] {curd,
## pip_fruit,
## whipped/sour_cream} => {yogurt} 0.001220132 0.5454545 0.002236909 3.9100186 12
## [14602] {curd,
## whipped/sour_cream,
## yogurt} => {pip_fruit} 0.001220132 0.2666667 0.004575496 3.5250896 12
## [14603] {curd,
## pip_fruit,
## yogurt} => {whipped/sour_cream} 0.001220132 0.3157895 0.003863752 4.4053751 12
## [14604] {pip_fruit,
## whipped/sour_cream,
## yogurt} => {curd} 0.001220132 0.3333333 0.003660397 6.2563613 12
## [14605] {curd,
## pip_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [14606] {curd,
## other_vegetables,
## whipped/sour_cream} => {pip_fruit} 0.001220132 0.2790698 0.004372140 3.6890473 12
## [14607] {curd,
## other_vegetables,
## pip_fruit} => {whipped/sour_cream} 0.001220132 0.3636364 0.003355363 5.0728562 12
## [14608] {other_vegetables,
## pip_fruit,
## whipped/sour_cream} => {curd} 0.001220132 0.2181818 0.005592272 4.0950729 12
## [14609] {curd,
## pip_fruit,
## whipped/sour_cream} => {whole_milk} 0.001830198 0.8181818 0.002236909 3.2020765 18
## [14610] {curd,
## whipped/sour_cream,
## whole_milk} => {pip_fruit} 0.001830198 0.3103448 0.005897306 4.1024750 18
## [14611] {curd,
## pip_fruit,
## whole_milk} => {whipped/sour_cream} 0.001830198 0.3750000 0.004880529 5.2313830 18
## [14612] {pip_fruit,
## whipped/sour_cream,
## whole_milk} => {curd} 0.001830198 0.3050847 0.005998983 5.7261612 18
## [14613] {curd,
## pastry,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [14614] {curd,
## other_vegetables,
## whipped/sour_cream} => {pastry} 0.001016777 0.2325581 0.004372140 2.6139535 10
## [14615] {curd,
## other_vegetables,
## pastry} => {whipped/sour_cream} 0.001016777 0.3125000 0.003253686 4.3594858 10
## [14616] {other_vegetables,
## pastry,
## whipped/sour_cream} => {curd} 0.001016777 0.2439024 0.004168785 4.5778254 10
## [14617] {citrus_fruit,
## curd,
## whipped/sour_cream} => {yogurt} 0.001118454 0.5789474 0.001931876 4.1501074 11
## [14618] {curd,
## whipped/sour_cream,
## yogurt} => {citrus_fruit} 0.001118454 0.2444444 0.004575496 2.9534535 11
## [14619] {citrus_fruit,
## curd,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3666667 0.003050330 5.1151300 11
## [14620] {citrus_fruit,
## whipped/sour_cream,
## yogurt} => {curd} 0.001118454 0.2444444 0.004575496 4.5879983 11
## [14621] {citrus_fruit,
## curd,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [14622] {curd,
## other_vegetables,
## whipped/sour_cream} => {citrus_fruit} 0.001118454 0.2558140 0.004372140 3.0908234 11
## [14623] {citrus_fruit,
## curd,
## other_vegetables} => {whipped/sour_cream} 0.001118454 0.3548387 0.003152008 4.9501258 11
## [14624] {citrus_fruit,
## curd,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [14625] {curd,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.001321810 0.2241379 0.005897306 2.7081039 13
## [14626] {citrus_fruit,
## curd,
## whole_milk} => {whipped/sour_cream} 0.001321810 0.3611111 0.003660397 5.0376281 13
## [14627] {citrus_fruit,
## whipped/sour_cream,
## whole_milk} => {curd} 0.001321810 0.2096774 0.006304016 3.9354531 13
## [14628] {curd,
## sausage,
## whipped/sour_cream} => {yogurt} 0.001220132 0.6315789 0.001931876 4.5273899 12
## [14629] {curd,
## whipped/sour_cream,
## yogurt} => {sausage} 0.001220132 0.2666667 0.004575496 2.8383838 12
## [14630] {curd,
## sausage,
## yogurt} => {whipped/sour_cream} 0.001220132 0.3428571 0.003558719 4.7829787 12
## [14631] {sausage,
## whipped/sour_cream,
## yogurt} => {curd} 0.001220132 0.3428571 0.003558719 6.4351145 12
## [14632] {curd,
## tropical_fruit,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.3571429 0.002846975 3.2765858 10
## [14633] {curd,
## root_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [14634] {curd,
## root_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001016777 0.3225806 0.003152008 4.5001144 10
## [14635] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {curd} 0.001016777 0.2222222 0.004575496 4.1709075 10
## [14636] {curd,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001728521 0.6071429 0.002846975 4.3522230 17
## [14637] {curd,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001728521 0.3777778 0.004575496 3.6002369 17
## [14638] {curd,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001728521 0.3269231 0.005287239 4.5606929 17
## [14639] {tropical_fruit,
## whipped/sour_cream,
## yogurt} => {curd} 0.001728521 0.2786885 0.006202339 5.2307283 17
## [14640] {curd,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001728521 0.6071429 0.002846975 3.1378087 17
## [14641] {curd,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001728521 0.3953488 0.004372140 3.7676897 17
## [14642] {curd,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001728521 0.3269231 0.005287239 4.5606929 17
## [14643] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {curd} 0.001728521 0.2207792 0.007829181 4.1438237 17
## [14644] {curd,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.002033554 0.7142857 0.002846975 2.7954636 20
## [14645] {curd,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.002033554 0.3448276 0.005897306 3.2862203 20
## [14646] {curd,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.002033554 0.3125000 0.006507372 4.3594858 20
## [14647] {tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {curd} 0.002033554 0.2564103 0.007930859 4.8125856 20
## [14648] {curd,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001220132 0.4800000 0.002541942 3.4408163 12
## [14649] {curd,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001220132 0.2666667 0.004575496 2.4465174 12
## [14650] {curd,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001220132 0.2608696 0.004677173 3.6392229 12
## [14651] {curd,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.5600000 0.002541942 2.8941671 14
## [14652] {curd,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001423488 0.3255814 0.004372140 2.9870271 14
## [14653] {curd,
## other_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.001423488 0.2592593 0.005490595 3.6167586 14
## [14654] {curd,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [14655] {curd,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001423488 0.2413793 0.005897306 2.2145201 14
## [14656] {curd,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001423488 0.2295082 0.006202339 3.2017207 14
## [14657] {curd,
## whipped/sour_cream,
## yogurt} => {rolls/buns} 0.001423488 0.3111111 0.004575496 1.6914194 14
## [14658] {curd,
## rolls/buns,
## whipped/sour_cream} => {yogurt} 0.001423488 0.5833333 0.002440264 4.1815476 14
## [14659] {curd,
## rolls/buns,
## yogurt} => {whipped/sour_cream} 0.001423488 0.4117647 0.003457041 5.7442637 14
## [14660] {rolls/buns,
## whipped/sour_cream,
## yogurt} => {curd} 0.001423488 0.2978723 0.004778851 5.5907910 14
## [14661] {curd,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001728521 0.3777778 0.004575496 1.9524143 17
## [14662] {curd,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001728521 0.3953488 0.004372140 2.8340057 17
## [14663] {curd,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001728521 0.2833333 0.006100661 3.9526005 17
## [14664] {curd,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.002745297 0.6000000 0.004575496 2.3481894 27
## [14665] {curd,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.002745297 0.4655172 0.005897306 3.3369986 27
## [14666] {curd,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.002745297 0.2727273 0.010066090 3.8046422 27
## [14667] {whipped/sour_cream,
## whole_milk,
## yogurt} => {curd} 0.002745297 0.2523364 0.010879512 4.7361240 27
## [14668] {curd,
## rolls/buns,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [14669] {curd,
## other_vegetables,
## whipped/sour_cream} => {rolls/buns} 0.001118454 0.2558140 0.004372140 1.3907851 11
## [14670] {curd,
## other_vegetables,
## rolls/buns} => {whipped/sour_cream} 0.001118454 0.3055556 0.003660397 4.2626084 11
## [14671] {curd,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.001728521 0.7083333 0.002440264 2.7721681 17
## [14672] {curd,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001728521 0.2931034 0.005897306 1.5935171 17
## [14673] {curd,
## rolls/buns,
## whole_milk} => {whipped/sour_cream} 0.001728521 0.2931034 0.005897306 4.0888970 17
## [14674] {rolls/buns,
## whipped/sour_cream,
## whole_milk} => {curd} 0.001728521 0.2207792 0.007829181 4.1438237 17
## [14675] {curd,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.002541942 0.5813953 0.004372140 2.2753773 25
## [14676] {curd,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.002541942 0.4310345 0.005897306 2.2276533 25
## [14677] {curd,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.002541942 0.2577320 0.009862735 3.5954522 25
## [14678] {curd,
## pastry,
## pip_fruit} => {yogurt} 0.001016777 0.6666667 0.001525165 4.7789116 10
## [14679] {curd,
## pip_fruit,
## yogurt} => {pastry} 0.001016777 0.2631579 0.003863752 2.9578947 10
## [14680] {curd,
## pastry,
## yogurt} => {pip_fruit} 0.001016777 0.3125000 0.003253686 4.1309644 10
## [14681] {pastry,
## pip_fruit,
## yogurt} => {curd} 0.001016777 0.2857143 0.003558719 5.3625954 10
## [14682] {curd,
## pastry,
## pip_fruit} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [14683] {curd,
## pip_fruit,
## whole_milk} => {pastry} 0.001118454 0.2291667 0.004880529 2.5758333 11
## [14684] {curd,
## pastry,
## whole_milk} => {pip_fruit} 0.001118454 0.2500000 0.004473818 3.3047715 11
## [14685] {pastry,
## pip_fruit,
## whole_milk} => {curd} 0.001118454 0.2200000 0.005083884 4.1291985 11
## [14686] {curd,
## pip_fruit,
## sausage} => {yogurt} 0.001321810 0.7222222 0.001830198 5.1771542 13
## [14687] {curd,
## pip_fruit,
## yogurt} => {sausage} 0.001321810 0.3421053 0.003863752 3.6413477 13
## [14688] {curd,
## sausage,
## yogurt} => {pip_fruit} 0.001321810 0.3714286 0.003558719 4.9099462 13
## [14689] {pip_fruit,
## sausage,
## yogurt} => {curd} 0.001321810 0.3333333 0.003965430 6.2563613 13
## [14690] {curd,
## pip_fruit,
## sausage} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [14691] {curd,
## pip_fruit,
## whole_milk} => {sausage} 0.001220132 0.2500000 0.004880529 2.6609848 12
## [14692] {curd,
## sausage,
## whole_milk} => {pip_fruit} 0.001220132 0.3529412 0.003457041 4.6655598 12
## [14693] {pip_fruit,
## sausage,
## whole_milk} => {curd} 0.001220132 0.2181818 0.005592272 4.0950729 12
## [14694] {curd,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001626843 0.5925926 0.002745297 4.2479214 16
## [14695] {curd,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001626843 0.4210526 0.003863752 4.0126479 16
## [14696] {curd,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001626843 0.3076923 0.005287239 4.0674111 16
## [14697] {pip_fruit,
## tropical_fruit,
## yogurt} => {curd} 0.001626843 0.2539683 0.006405694 4.7667515 16
## [14698] {curd,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001626843 0.5925926 0.002745297 3.0626107 16
## [14699] {curd,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001626843 0.4848485 0.003355363 4.6206249 16
## [14700] {curd,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001626843 0.3076923 0.005287239 4.0674111 16
## [14701] {curd,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001728521 0.6296296 0.002745297 2.4641494 17
## [14702] {curd,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001728521 0.3541667 0.004880529 3.3752221 17
## [14703] {curd,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001728521 0.2656250 0.006507372 3.5113197 17
## [14704] {pip_fruit,
## tropical_fruit,
## whole_milk} => {curd} 0.001728521 0.2048193 0.008439248 3.8442702 17
## [14705] {curd,
## pip_fruit,
## root_vegetables} => {yogurt} 0.001525165 0.6818182 0.002236909 4.8875232 15
## [14706] {curd,
## pip_fruit,
## yogurt} => {root_vegetables} 0.001525165 0.3947368 0.003863752 3.6214896 15
## [14707] {curd,
## root_vegetables,
## yogurt} => {pip_fruit} 0.001525165 0.3260870 0.004677173 4.3105715 15
## [14708] {pip_fruit,
## root_vegetables,
## yogurt} => {curd} 0.001525165 0.2884615 0.005287239 5.4141588 15
## [14709] {curd,
## pip_fruit,
## root_vegetables} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [14710] {curd,
## other_vegetables,
## pip_fruit} => {root_vegetables} 0.001321810 0.3939394 0.003355363 3.6141735 13
## [14711] {curd,
## other_vegetables,
## root_vegetables} => {pip_fruit} 0.001321810 0.2407407 0.005490595 3.1823726 13
## [14712] {curd,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [14713] {curd,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001220132 0.2500000 0.004880529 2.2936101 12
## [14714] {curd,
## pip_fruit,
## yogurt} => {other_vegetables} 0.001728521 0.4473684 0.003863752 2.3120696 17
## [14715] {curd,
## other_vegetables,
## pip_fruit} => {yogurt} 0.001728521 0.5151515 0.003355363 3.6927953 17
## [14716] {curd,
## other_vegetables,
## yogurt} => {pip_fruit} 0.001728521 0.2833333 0.006100661 3.7454077 17
## [14717] {other_vegetables,
## pip_fruit,
## yogurt} => {curd} 0.001728521 0.2125000 0.008134215 3.9884303 17
## [14718] {curd,
## pip_fruit,
## yogurt} => {whole_milk} 0.002541942 0.6578947 0.003863752 2.5747691 25
## [14719] {curd,
## pip_fruit,
## whole_milk} => {yogurt} 0.002541942 0.5208333 0.004880529 3.7335247 25
## [14720] {curd,
## whole_milk,
## yogurt} => {pip_fruit} 0.002541942 0.2525253 0.010066090 3.3381530 25
## [14721] {pip_fruit,
## whole_milk,
## yogurt} => {curd} 0.002541942 0.2659574 0.009557702 4.9917777 25
## [14722] {curd,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.002236909 0.6666667 0.003355363 2.6090994 22
## [14723] {curd,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.002236909 0.4583333 0.004880529 2.3687380 22
## [14724] {curd,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.002236909 0.2268041 0.009862735 2.9981432 22
## [14725] {curd,
## pastry,
## sausage} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [14726] {curd,
## other_vegetables,
## pastry} => {sausage} 0.001016777 0.3125000 0.003253686 3.3262311 10
## [14727] {curd,
## other_vegetables,
## sausage} => {pastry} 0.001016777 0.3030303 0.003355363 3.4060606 10
## [14728] {other_vegetables,
## pastry,
## sausage} => {curd} 0.001016777 0.2564103 0.003965430 4.8125856 10
## [14729] {curd,
## pastry,
## tropical_fruit} => {yogurt} 0.001118454 0.6470588 0.001728521 4.6383553 11
## [14730] {curd,
## pastry,
## yogurt} => {tropical_fruit} 0.001118454 0.3437500 0.003253686 3.2759508 11
## [14731] {curd,
## tropical_fruit,
## yogurt} => {pastry} 0.001118454 0.2115385 0.005287239 2.3776923 11
## [14732] {pastry,
## tropical_fruit,
## yogurt} => {curd} 0.001118454 0.2391304 0.004677173 4.4882592 11
## [14733] {curd,
## pastry,
## tropical_fruit} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [14734] {curd,
## pastry,
## whole_milk} => {tropical_fruit} 0.001220132 0.2727273 0.004473818 2.5991015 12
## [14735] {curd,
## pastry,
## yogurt} => {other_vegetables} 0.001626843 0.5000000 0.003253686 2.5840778 16
## [14736] {curd,
## other_vegetables,
## pastry} => {yogurt} 0.001626843 0.5000000 0.003253686 3.5841837 16
## [14737] {curd,
## other_vegetables,
## yogurt} => {pastry} 0.001626843 0.2666667 0.006100661 2.9973333 16
## [14738] {other_vegetables,
## pastry,
## yogurt} => {curd} 0.001626843 0.2461538 0.006609049 4.6200822 16
## [14739] {curd,
## pastry,
## yogurt} => {whole_milk} 0.002338587 0.7187500 0.003253686 2.8129352 23
## [14740] {curd,
## pastry,
## whole_milk} => {yogurt} 0.002338587 0.5227273 0.004473818 3.7471011 23
## [14741] {curd,
## whole_milk,
## yogurt} => {pastry} 0.002338587 0.2323232 0.010066090 2.6113131 23
## [14742] {pastry,
## whole_milk,
## yogurt} => {curd} 0.002338587 0.2555556 0.009150991 4.7965437 23
## [14743] {curd,
## pastry,
## rolls/buns} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [14744] {curd,
## pastry,
## whole_milk} => {rolls/buns} 0.001220132 0.2727273 0.004473818 1.4827378 12
## [14745] {curd,
## rolls/buns,
## whole_milk} => {pastry} 0.001220132 0.2068966 0.005897306 2.3255172 12
## [14746] {curd,
## other_vegetables,
## pastry} => {whole_milk} 0.001728521 0.5312500 0.003253686 2.0791260 17
## [14747] {curd,
## pastry,
## whole_milk} => {other_vegetables} 0.001728521 0.3863636 0.004473818 1.9967874 17
## [14748] {citrus_fruit,
## curd,
## tropical_fruit} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [14749] {citrus_fruit,
## curd,
## root_vegetables} => {tropical_fruit} 0.001016777 0.4761905 0.002135231 4.5381137 10
## [14750] {curd,
## root_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001016777 0.3225806 0.003152008 3.8975192 10
## [14751] {citrus_fruit,
## curd,
## tropical_fruit} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [14752] {citrus_fruit,
## curd,
## yogurt} => {tropical_fruit} 0.001118454 0.3666667 0.003050330 3.4943475 11
## [14753] {curd,
## tropical_fruit,
## yogurt} => {citrus_fruit} 0.001118454 0.2115385 0.005287239 2.5558732 11
## [14754] {citrus_fruit,
## curd,
## tropical_fruit} => {other_vegetables} 0.001525165 0.6521739 0.002338587 3.3705362 15
## [14755] {citrus_fruit,
## curd,
## other_vegetables} => {tropical_fruit} 0.001525165 0.4838710 0.003152008 4.6113091 15
## [14756] {curd,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001525165 0.2884615 0.005287239 3.4852816 15
## [14757] {citrus_fruit,
## curd,
## tropical_fruit} => {whole_milk} 0.001626843 0.6956522 0.002338587 2.7225385 16
## [14758] {citrus_fruit,
## curd,
## whole_milk} => {tropical_fruit} 0.001626843 0.4444444 0.003660397 4.2355728 16
## [14759] {curd,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001626843 0.2500000 0.006507372 3.0205774 16
## [14760] {citrus_fruit,
## curd,
## root_vegetables} => {yogurt} 0.001118454 0.5238095 0.002135231 3.7548591 11
## [14761] {citrus_fruit,
## curd,
## yogurt} => {root_vegetables} 0.001118454 0.3666667 0.003050330 3.3639614 11
## [14762] {curd,
## root_vegetables,
## yogurt} => {citrus_fruit} 0.001118454 0.2391304 0.004677173 2.8892479 11
## [14763] {citrus_fruit,
## root_vegetables,
## yogurt} => {curd} 0.001118454 0.2291667 0.004880529 4.3012484 11
## [14764] {citrus_fruit,
## curd,
## root_vegetables} => {other_vegetables} 0.001525165 0.7142857 0.002135231 3.6915397 15
## [14765] {citrus_fruit,
## curd,
## other_vegetables} => {root_vegetables} 0.001525165 0.4838710 0.003152008 4.4392453 15
## [14766] {curd,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001525165 0.2777778 0.005490595 3.3561971 15
## [14767] {citrus_fruit,
## curd,
## root_vegetables} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [14768] {citrus_fruit,
## curd,
## whole_milk} => {root_vegetables} 0.001321810 0.3611111 0.003660397 3.3129923 13
## [14769] {curd,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001321810 0.2131148 0.006202339 2.5749184 13
## [14770] {citrus_fruit,
## curd,
## yogurt} => {other_vegetables} 0.001423488 0.4666667 0.003050330 2.4118059 14
## [14771] {citrus_fruit,
## curd,
## other_vegetables} => {yogurt} 0.001423488 0.4516129 0.003152008 3.2373272 14
## [14772] {curd,
## other_vegetables,
## yogurt} => {citrus_fruit} 0.001423488 0.2333333 0.006100661 2.8192056 14
## [14773] {citrus_fruit,
## curd,
## yogurt} => {whole_milk} 0.002135231 0.7000000 0.003050330 2.7395543 21
## [14774] {citrus_fruit,
## curd,
## whole_milk} => {yogurt} 0.002135231 0.5833333 0.003660397 4.1815476 21
## [14775] {curd,
## whole_milk,
## yogurt} => {citrus_fruit} 0.002135231 0.2121212 0.010066090 2.5629142 21
## [14776] {citrus_fruit,
## whole_milk,
## yogurt} => {curd} 0.002135231 0.2079208 0.010269446 3.9024828 21
## [14777] {citrus_fruit,
## curd,
## rolls/buns} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [14778] {citrus_fruit,
## curd,
## whole_milk} => {rolls/buns} 0.001016777 0.2777778 0.003660397 1.5101959 10
## [14779] {citrus_fruit,
## curd,
## other_vegetables} => {whole_milk} 0.001931876 0.6129032 0.003152008 2.3986881 19
## [14780] {citrus_fruit,
## curd,
## whole_milk} => {other_vegetables} 0.001931876 0.5277778 0.003660397 2.7276376 19
## [14781] {curd,
## sausage,
## tropical_fruit} => {yogurt} 0.001220132 0.5714286 0.002135231 4.0962099 12
## [14782] {curd,
## sausage,
## yogurt} => {tropical_fruit} 0.001220132 0.3428571 0.003558719 3.2674419 12
## [14783] {curd,
## tropical_fruit,
## yogurt} => {sausage} 0.001220132 0.2307692 0.005287239 2.4562937 12
## [14784] {sausage,
## tropical_fruit,
## yogurt} => {curd} 0.001220132 0.2608696 0.004677173 4.8962828 12
## [14785] {curd,
## sausage,
## tropical_fruit} => {other_vegetables} 0.001525165 0.7142857 0.002135231 3.6915397 15
## [14786] {curd,
## other_vegetables,
## sausage} => {tropical_fruit} 0.001525165 0.4545455 0.003355363 4.3318358 15
## [14787] {curd,
## other_vegetables,
## tropical_fruit} => {sausage} 0.001525165 0.2884615 0.005287239 3.0703671 15
## [14788] {other_vegetables,
## sausage,
## tropical_fruit} => {curd} 0.001525165 0.2542373 0.005998983 4.7718010 15
## [14789] {curd,
## sausage,
## tropical_fruit} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [14790] {curd,
## sausage,
## whole_milk} => {tropical_fruit} 0.001220132 0.3529412 0.003457041 3.3635431 12
## [14791] {curd,
## root_vegetables,
## sausage} => {yogurt} 0.001423488 0.6666667 0.002135231 4.7789116 14
## [14792] {curd,
## sausage,
## yogurt} => {root_vegetables} 0.001423488 0.4000000 0.003558719 3.6697761 14
## [14793] {curd,
## root_vegetables,
## yogurt} => {sausage} 0.001423488 0.3043478 0.004677173 3.2394598 14
## [14794] {root_vegetables,
## sausage,
## yogurt} => {curd} 0.001423488 0.2745098 0.005185562 5.1522976 14
## [14795] {curd,
## root_vegetables,
## sausage} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [14796] {curd,
## other_vegetables,
## sausage} => {root_vegetables} 0.001118454 0.3333333 0.003355363 3.0581468 11
## [14797] {curd,
## other_vegetables,
## root_vegetables} => {sausage} 0.001118454 0.2037037 0.005490595 2.1682099 11
## [14798] {curd,
## root_vegetables,
## sausage} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [14799] {curd,
## sausage,
## whole_milk} => {root_vegetables} 0.001016777 0.2941176 0.003457041 2.6983648 10
## [14800] {curd,
## sausage,
## yogurt} => {other_vegetables} 0.001830198 0.5142857 0.003558719 2.6579086 18
## [14801] {curd,
## other_vegetables,
## sausage} => {yogurt} 0.001830198 0.5454545 0.003355363 3.9100186 18
## [14802] {curd,
## other_vegetables,
## yogurt} => {sausage} 0.001830198 0.3000000 0.006100661 3.1931818 18
## [14803] {other_vegetables,
## sausage,
## yogurt} => {curd} 0.001830198 0.2250000 0.008134215 4.2230439 18
## [14804] {curd,
## sausage,
## yogurt} => {whole_milk} 0.001830198 0.5142857 0.003558719 2.0127338 18
## [14805] {curd,
## sausage,
## whole_milk} => {yogurt} 0.001830198 0.5294118 0.003457041 3.7950180 18
## [14806] {sausage,
## whole_milk,
## yogurt} => {curd} 0.001830198 0.2093023 0.008744281 3.9284129 18
## [14807] {curd,
## other_vegetables,
## sausage} => {whole_milk} 0.001830198 0.5454545 0.003355363 2.1347177 18
## [14808] {curd,
## sausage,
## whole_milk} => {other_vegetables} 0.001830198 0.5294118 0.003457041 2.7360823 18
## [14809] {bottled_water,
## curd,
## tropical_fruit} => {yogurt} 0.001423488 0.6666667 0.002135231 4.7789116 14
## [14810] {bottled_water,
## curd,
## yogurt} => {tropical_fruit} 0.001423488 0.5384615 0.002643620 5.1315593 14
## [14811] {curd,
## tropical_fruit,
## yogurt} => {bottled_water} 0.001423488 0.2692308 0.005287239 2.4359564 14
## [14812] {bottled_water,
## tropical_fruit,
## yogurt} => {curd} 0.001423488 0.2000000 0.007117438 3.7538168 14
## [14813] {bottled_water,
## curd,
## tropical_fruit} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [14814] {bottled_water,
## curd,
## other_vegetables} => {tropical_fruit} 0.001118454 0.5238095 0.002135231 4.9919251 11
## [14815] {curd,
## other_vegetables,
## tropical_fruit} => {bottled_water} 0.001118454 0.2115385 0.005287239 1.9139657 11
## [14816] {bottled_water,
## curd,
## tropical_fruit} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [14817] {bottled_water,
## curd,
## whole_milk} => {tropical_fruit} 0.001118454 0.3437500 0.003253686 3.2759508 11
## [14818] {bottled_water,
## curd,
## yogurt} => {other_vegetables} 0.001118454 0.4230769 0.002643620 2.1865273 11
## [14819] {bottled_water,
## curd,
## other_vegetables} => {yogurt} 0.001118454 0.5238095 0.002135231 3.7548591 11
## [14820] {bottled_water,
## curd,
## yogurt} => {whole_milk} 0.001423488 0.5384615 0.002643620 2.1073495 14
## [14821] {bottled_water,
## curd,
## whole_milk} => {yogurt} 0.001423488 0.4375000 0.003253686 3.1361607 14
## [14822] {bottled_water,
## curd,
## other_vegetables} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [14823] {bottled_water,
## curd,
## whole_milk} => {other_vegetables} 0.001118454 0.3437500 0.003253686 1.7765535 11
## [14824] {curd,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001830198 0.5806452 0.003152008 4.1622778 18
## [14825] {curd,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001830198 0.3461538 0.005287239 3.1757678 18
## [14826] {curd,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001830198 0.3913043 0.004677173 3.7291456 18
## [14827] {root_vegetables,
## tropical_fruit,
## yogurt} => {curd} 0.001830198 0.2250000 0.008134215 4.2230439 18
## [14828] {curd,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.002033554 0.6451613 0.003152008 3.3342939 20
## [14829] {curd,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.002033554 0.3846154 0.005287239 3.5286309 20
## [14830] {curd,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.002033554 0.3703704 0.005490595 3.5296440 20
## [14831] {curd,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.002033554 0.6451613 0.003152008 2.5249349 20
## [14832] {curd,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.002033554 0.3125000 0.006507372 2.8670126 20
## [14833] {curd,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.002033554 0.3278689 0.006202339 3.1246029 20
## [14834] {curd,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001118454 0.2115385 0.005287239 1.1500723 11
## [14835] {curd,
## rolls/buns,
## tropical_fruit} => {yogurt} 0.001118454 0.5000000 0.002236909 3.5841837 11
## [14836] {curd,
## rolls/buns,
## yogurt} => {tropical_fruit} 0.001118454 0.3235294 0.003457041 3.0832478 11
## [14837] {curd,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.002541942 0.4807692 0.005287239 2.4846902 25
## [14838] {curd,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.002541942 0.4807692 0.005287239 3.4463305 25
## [14839] {curd,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.002541942 0.4166667 0.006100661 3.9708495 25
## [14840] {other_vegetables,
## tropical_fruit,
## yogurt} => {curd} 0.002541942 0.2066116 0.012302999 3.8779099 25
## [14841] {curd,
## tropical_fruit,
## yogurt} => {whole_milk} 0.003965430 0.7500000 0.005287239 2.9352368 39
## [14842] {curd,
## tropical_fruit,
## whole_milk} => {yogurt} 0.003965430 0.6093750 0.006507372 4.3682239 39
## [14843] {curd,
## whole_milk,
## yogurt} => {tropical_fruit} 0.003965430 0.3939394 0.010066090 3.7542577 39
## [14844] {tropical_fruit,
## whole_milk,
## yogurt} => {curd} 0.003965430 0.2617450 0.015149975 4.9127133 39
## [14845] {curd,
## rolls/buns,
## tropical_fruit} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [14846] {curd,
## other_vegetables,
## tropical_fruit} => {rolls/buns} 0.001220132 0.2307692 0.005287239 1.2546243 12
## [14847] {curd,
## other_vegetables,
## rolls/buns} => {tropical_fruit} 0.001220132 0.3333333 0.003660397 3.1766796 12
## [14848] {curd,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001423488 0.6363636 0.002236909 2.4905039 14
## [14849] {curd,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001423488 0.2187500 0.006507372 1.1892793 14
## [14850] {curd,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001423488 0.2413793 0.005897306 2.3003542 14
## [14851] {curd,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.003152008 0.5961538 0.005287239 2.3331369 31
## [14852] {curd,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.003152008 0.4843750 0.006507372 2.5033253 31
## [14853] {curd,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.003152008 0.3195876 0.009862735 3.0456825 31
## [14854] {curd,
## root_vegetables,
## yogurt} => {other_vegetables} 0.002440264 0.5217391 0.004677173 2.6964290 24
## [14855] {curd,
## other_vegetables,
## root_vegetables} => {yogurt} 0.002440264 0.4444444 0.005490595 3.1859410 24
## [14856] {curd,
## other_vegetables,
## yogurt} => {root_vegetables} 0.002440264 0.4000000 0.006100661 3.6697761 24
## [14857] {curd,
## root_vegetables,
## yogurt} => {whole_milk} 0.002948653 0.6304348 0.004677173 2.4673005 29
## [14858] {curd,
## root_vegetables,
## whole_milk} => {yogurt} 0.002948653 0.4754098 0.006202339 3.4079123 29
## [14859] {curd,
## whole_milk,
## yogurt} => {root_vegetables} 0.002948653 0.2929293 0.010066090 2.6874623 29
## [14860] {root_vegetables,
## whole_milk,
## yogurt} => {curd} 0.002948653 0.2027972 0.014539908 3.8063177 29
## [14861] {curd,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [14862] {curd,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001321810 0.2131148 0.006202339 1.1586421 13
## [14863] {curd,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001321810 0.2241379 0.005897306 2.0563401 13
## [14864] {curd,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.003152008 0.5740741 0.005490595 2.2467244 31
## [14865] {curd,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.003152008 0.5081967 0.006202339 2.6264397 31
## [14866] {curd,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.003152008 0.3195876 0.009862735 2.9320376 31
## [14867] {curd,
## soda,
## yogurt} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [14868] {curd,
## soda,
## whole_milk} => {yogurt} 0.001016777 0.2857143 0.003558719 2.0481050 10
## [14869] {curd,
## rolls/buns,
## soda} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [14870] {curd,
## soda,
## whole_milk} => {rolls/buns} 0.001118454 0.3142857 0.003558719 1.7086788 11
## [14871] {curd,
## other_vegetables,
## soda} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [14872] {curd,
## soda,
## whole_milk} => {other_vegetables} 0.001016777 0.2857143 0.003558719 1.4766159 10
## [14873] {curd,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001118454 0.3235294 0.003457041 1.6720503 11
## [14874] {curd,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001118454 0.3055556 0.003660397 2.1903345 11
## [14875] {curd,
## rolls/buns,
## yogurt} => {whole_milk} 0.002541942 0.7352941 0.003457041 2.8776831 25
## [14876] {curd,
## whole_milk,
## yogurt} => {rolls/buns} 0.002541942 0.2525253 0.010066090 1.3729054 25
## [14877] {curd,
## rolls/buns,
## whole_milk} => {yogurt} 0.002541942 0.4310345 0.005897306 3.0898135 25
## [14878] {curd,
## other_vegetables,
## yogurt} => {whole_milk} 0.003660397 0.6000000 0.006100661 2.3481894 36
## [14879] {curd,
## whole_milk,
## yogurt} => {other_vegetables} 0.003660397 0.3636364 0.010066090 1.8793293 36
## [14880] {curd,
## other_vegetables,
## whole_milk} => {yogurt} 0.003660397 0.3711340 0.009862735 2.6604250 36
## [14881] {curd,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.002440264 0.6666667 0.003660397 2.6090994 24
## [14882] {curd,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.002440264 0.4137931 0.005897306 2.1385471 24
## [14883] {curd,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.002440264 0.2474227 0.009862735 1.3451642 24
## [14884] {napkins,
## pork,
## soda} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [14885] {napkins,
## pork,
## whole_milk} => {soda} 0.001016777 0.3846154 0.002643620 2.2056515 10
## [14886] {napkins,
## soda,
## whole_milk} => {pork} 0.001016777 0.2173913 0.004677173 3.7707998 10
## [14887] {pork,
## soda,
## whole_milk} => {napkins} 0.001016777 0.2380952 0.004270463 4.5469256 10
## [14888] {bottled_beer,
## napkins,
## rolls/buns} => {whole_milk} 0.001220132 0.8000000 0.001525165 3.1309192 12
## [14889] {bottled_beer,
## napkins,
## whole_milk} => {rolls/buns} 0.001220132 0.4615385 0.002643620 2.5092486 12
## [14890] {napkins,
## rolls/buns,
## whole_milk} => {bottled_beer} 0.001220132 0.2307692 0.005287239 2.8656760 12
## [14891] {bottled_beer,
## rolls/buns,
## whole_milk} => {napkins} 0.001220132 0.2264151 0.005388917 4.3238688 12
## [14892] {bottled_beer,
## napkins,
## other_vegetables} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [14893] {bottled_beer,
## napkins,
## whole_milk} => {other_vegetables} 0.001118454 0.4230769 0.002643620 2.1865273 11
## [14894] {margarine,
## napkins,
## yogurt} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [14895] {margarine,
## napkins,
## whole_milk} => {yogurt} 0.001016777 0.4545455 0.002236909 3.2583488 10
## [14896] {butter,
## napkins,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.5882353 0.001728521 5.3967296 10
## [14897] {butter,
## napkins,
## root_vegetables} => {whipped/sour_cream} 0.001016777 0.5000000 0.002033554 6.9751773 10
## [14898] {napkins,
## root_vegetables,
## whipped/sour_cream} => {butter} 0.001016777 0.4000000 0.002541942 7.2183486 10
## [14899] {butter,
## root_vegetables,
## whipped/sour_cream} => {napkins} 0.001016777 0.2941176 0.003457041 5.6167904 10
## [14900] {butter,
## napkins,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [14901] {butter,
## napkins,
## other_vegetables} => {whipped/sour_cream} 0.001118454 0.4583333 0.002440264 6.3939125 11
## [14902] {napkins,
## other_vegetables,
## whipped/sour_cream} => {butter} 0.001118454 0.3333333 0.003355363 6.0152905 11
## [14903] {butter,
## napkins,
## whipped/sour_cream} => {whole_milk} 0.001423488 0.8235294 0.001728521 3.2230051 14
## [14904] {butter,
## napkins,
## whole_milk} => {whipped/sour_cream} 0.001423488 0.4516129 0.003152008 6.3001601 14
## [14905] {napkins,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001423488 0.3589744 0.003965430 6.4780052 14
## [14906] {butter,
## whipped/sour_cream,
## whole_milk} => {napkins} 0.001423488 0.2121212 0.006710727 4.0508973 14
## [14907] {bottled_water,
## butter,
## napkins} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [14908] {butter,
## napkins,
## whole_milk} => {bottled_water} 0.001118454 0.3548387 0.003152008 3.2105232 11
## [14909] {bottled_water,
## napkins,
## whole_milk} => {butter} 0.001118454 0.2820513 0.003965430 5.0898612 11
## [14910] {bottled_water,
## butter,
## whole_milk} => {napkins} 0.001118454 0.2075472 0.005388917 3.9635464 11
## [14911] {butter,
## napkins,
## tropical_fruit} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [14912] {butter,
## napkins,
## whole_milk} => {tropical_fruit} 0.001118454 0.3548387 0.003152008 3.3816267 11
## [14913] {napkins,
## tropical_fruit,
## whole_milk} => {butter} 0.001118454 0.2244898 0.004982206 4.0511140 11
## [14914] {butter,
## napkins,
## root_vegetables} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [14915] {butter,
## napkins,
## other_vegetables} => {root_vegetables} 0.001016777 0.4166667 0.002440264 3.8226835 10
## [14916] {napkins,
## other_vegetables,
## root_vegetables} => {butter} 0.001016777 0.2222222 0.004575496 4.0101937 10
## [14917] {butter,
## napkins,
## root_vegetables} => {whole_milk} 0.001525165 0.7500000 0.002033554 2.9352368 15
## [14918] {butter,
## napkins,
## whole_milk} => {root_vegetables} 0.001525165 0.4838710 0.003152008 4.4392453 15
## [14919] {napkins,
## root_vegetables,
## whole_milk} => {butter} 0.001525165 0.3125000 0.004880529 5.6393349 15
## [14920] {butter,
## napkins,
## yogurt} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [14921] {butter,
## napkins,
## whole_milk} => {yogurt} 0.001118454 0.3548387 0.003152008 2.5436142 11
## [14922] {butter,
## napkins,
## other_vegetables} => {whole_milk} 0.001830198 0.7500000 0.002440264 2.9352368 18
## [14923] {butter,
## napkins,
## whole_milk} => {other_vegetables} 0.001830198 0.5806452 0.003152008 3.0008645 18
## [14924] {napkins,
## other_vegetables,
## whole_milk} => {butter} 0.001830198 0.2686567 0.006812405 4.8481446 18
## [14925] {napkins,
## newspapers,
## rolls/buns} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [14926] {napkins,
## newspapers,
## whole_milk} => {rolls/buns} 0.001118454 0.4782609 0.002338587 2.6001634 11
## [14927] {napkins,
## rolls/buns,
## whole_milk} => {newspapers} 0.001118454 0.2115385 0.005287239 2.6502940 11
## [14928] {domestic_eggs,
## napkins,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [14929] {domestic_eggs,
## napkins,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.3333333 0.003355363 4.6501182 11
## [14930] {napkins,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001118454 0.2820513 0.003965430 4.4454717 11
## [14931] {domestic_eggs,
## napkins,
## tropical_fruit} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [14932] {domestic_eggs,
## napkins,
## whole_milk} => {tropical_fruit} 0.001321810 0.3939394 0.003355363 3.7542577 13
## [14933] {napkins,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.001321810 0.2653061 0.004982206 4.1815476 13
## [14934] {domestic_eggs,
## napkins,
## root_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [14935] {domestic_eggs,
## napkins,
## whole_milk} => {root_vegetables} 0.001016777 0.3030303 0.003355363 2.7801334 10
## [14936] {napkins,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001016777 0.2083333 0.004880529 3.2835871 10
## [14937] {domestic_eggs,
## napkins,
## yogurt} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [14938] {domestic_eggs,
## napkins,
## whole_milk} => {yogurt} 0.001321810 0.3939394 0.003355363 2.8239023 13
## [14939] {napkins,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001321810 0.2166667 0.006100661 3.4149306 13
## [14940] {domestic_eggs,
## napkins,
## other_vegetables} => {whole_milk} 0.001525165 0.6818182 0.002236909 2.6683971 15
## [14941] {domestic_eggs,
## napkins,
## whole_milk} => {other_vegetables} 0.001525165 0.4545455 0.003355363 2.3491616 15
## [14942] {napkins,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.001525165 0.2238806 0.006812405 3.5286309 15
## [14943] {fruit/vegetable_juice,
## napkins,
## tropical_fruit} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [14944] {fruit/vegetable_juice,
## napkins,
## other_vegetables} => {tropical_fruit} 0.001016777 0.4545455 0.002236909 4.3318358 10
## [14945] {napkins,
## other_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.001016777 0.2564103 0.003965430 3.5468282 10
## [14946] {fruit/vegetable_juice,
## napkins,
## root_vegetables} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [14947] {fruit/vegetable_juice,
## napkins,
## other_vegetables} => {root_vegetables} 0.001220132 0.5454545 0.002236909 5.0042402 12
## [14948] {napkins,
## other_vegetables,
## root_vegetables} => {fruit/vegetable_juice} 0.001220132 0.2666667 0.004575496 3.6887014 12
## [14949] {fruit/vegetable_juice,
## napkins,
## root_vegetables} => {whole_milk} 0.001321810 0.5909091 0.002236909 2.3126108 13
## [14950] {fruit/vegetable_juice,
## napkins,
## whole_milk} => {root_vegetables} 0.001321810 0.4062500 0.003253686 3.7271164 13
## [14951] {napkins,
## root_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001321810 0.2708333 0.004880529 3.7463373 13
## [14952] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {napkins} 0.001321810 0.2031250 0.006507372 3.8790959 13
## [14953] {fruit/vegetable_juice,
## napkins,
## soda} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [14954] {fruit/vegetable_juice,
## napkins,
## yogurt} => {soda} 0.001016777 0.3846154 0.002643620 2.2056515 10
## [14955] {napkins,
## soda,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.3030303 0.003355363 4.1917061 10
## [14956] {fruit/vegetable_juice,
## soda,
## yogurt} => {napkins} 0.001016777 0.2000000 0.005083884 3.8194175 10
## [14957] {fruit/vegetable_juice,
## napkins,
## yogurt} => {whole_milk} 0.001728521 0.6538462 0.002643620 2.5589244 17
## [14958] {fruit/vegetable_juice,
## napkins,
## whole_milk} => {yogurt} 0.001728521 0.5312500 0.003253686 3.8081952 17
## [14959] {napkins,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001728521 0.2833333 0.006100661 3.9192452 17
## [14960] {fruit/vegetable_juice,
## napkins,
## other_vegetables} => {whole_milk} 0.001321810 0.5909091 0.002236909 2.3126108 13
## [14961] {fruit/vegetable_juice,
## napkins,
## whole_milk} => {other_vegetables} 0.001321810 0.4062500 0.003253686 2.0995632 13
## [14962] {napkins,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [14963] {napkins,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [14964] {napkins,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3225806 0.003152008 4.5001144 10
## [14965] {napkins,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [14966] {napkins,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001016777 0.3030303 0.003355363 2.8878905 10
## [14967] {napkins,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001016777 0.2564103 0.003965430 3.5770140 10
## [14968] {napkins,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [14969] {napkins,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001220132 0.3076923 0.003965430 2.9323196 12
## [14970] {napkins,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.2448980 0.004982206 3.4164134 12
## [14971] {napkins,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001321810 0.5200000 0.002541942 2.6874409 13
## [14972] {napkins,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001321810 0.3939394 0.003355363 3.6141735 13
## [14973] {napkins,
## other_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.001321810 0.2888889 0.004575496 4.0301024 13
## [14974] {napkins,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001626843 0.6400000 0.002541942 2.5047354 16
## [14975] {napkins,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001626843 0.4102564 0.003965430 3.7638729 16
## [14976] {napkins,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001626843 0.3333333 0.004880529 4.6501182 16
## [14977] {napkins,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001220132 0.4800000 0.002541942 2.4807147 12
## [14978] {napkins,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001220132 0.3636364 0.003355363 2.6066790 12
## [14979] {napkins,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001220132 0.3076923 0.003965430 4.2924168 12
## [14980] {napkins,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001626843 0.6400000 0.002541942 2.5047354 16
## [14981] {napkins,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001626843 0.4102564 0.003965430 2.9408687 16
## [14982] {napkins,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001626843 0.2666667 0.006100661 3.7200946 16
## [14983] {napkins,
## rolls/buns,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [14984] {napkins,
## other_vegetables,
## whipped/sour_cream} => {rolls/buns} 0.001016777 0.3030303 0.003355363 1.6474865 10
## [14985] {napkins,
## other_vegetables,
## rolls/buns} => {whipped/sour_cream} 0.001016777 0.2439024 0.004168785 3.4025255 10
## [14986] {napkins,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.002033554 0.6060606 0.003355363 2.3719085 20
## [14987] {napkins,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.002033554 0.5128205 0.003965430 2.6503362 20
## [14988] {napkins,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.002033554 0.2985075 0.006812405 4.1642850 20
## [14989] {napkins,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001016777 0.3703704 0.002745297 2.6549509 10
## [14990] {napkins,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001016777 0.5000000 0.002033554 4.7650194 10
## [14991] {napkins,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001016777 0.3225806 0.003152008 4.2642213 10
## [14992] {napkins,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001118454 0.4074074 0.002745297 2.1055449 11
## [14993] {napkins,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001118454 0.4230769 0.002643620 4.0319395 11
## [14994] {napkins,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001118454 0.2820513 0.003965430 3.7284602 11
## [14995] {napkins,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001525165 0.5555556 0.002745297 2.1742495 15
## [14996] {napkins,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001525165 0.4687500 0.003253686 4.4672057 15
## [14997] {napkins,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001525165 0.3061224 0.004982206 4.0466590 15
## [14998] {napkins,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [14999] {napkins,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001016777 0.3125000 0.003253686 2.8670126 10
## [15000] {napkins,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001016777 0.2083333 0.004880529 2.7539763 10
## [15001] {napkins,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001728521 0.6538462 0.002643620 2.5589244 17
## [15002] {napkins,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001728521 0.5312500 0.003253686 2.7455826 17
## [15003] {napkins,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.001728521 0.2537313 0.006812405 3.3540965 17
## [15004] {napkins,
## pastry,
## root_vegetables} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [15005] {napkins,
## other_vegetables,
## pastry} => {root_vegetables} 0.001016777 0.3571429 0.002846975 3.2765858 10
## [15006] {napkins,
## other_vegetables,
## root_vegetables} => {pastry} 0.001016777 0.2222222 0.004575496 2.4977778 10
## [15007] {napkins,
## pastry,
## soda} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [15008] {napkins,
## other_vegetables,
## pastry} => {soda} 0.001016777 0.3571429 0.002846975 2.0481050 10
## [15009] {napkins,
## other_vegetables,
## soda} => {pastry} 0.001016777 0.3333333 0.003050330 3.7466667 10
## [15010] {napkins,
## pastry,
## soda} => {whole_milk} 0.001220132 0.5000000 0.002440264 1.9568245 12
## [15011] {napkins,
## pastry,
## whole_milk} => {soda} 0.001220132 0.4137931 0.002948653 2.3729768 12
## [15012] {napkins,
## soda,
## whole_milk} => {pastry} 0.001220132 0.2608696 0.004677173 2.9321739 12
## [15013] {napkins,
## pastry,
## yogurt} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [15014] {napkins,
## pastry,
## whole_milk} => {yogurt} 0.001220132 0.4137931 0.002948653 2.9662210 12
## [15015] {napkins,
## whole_milk,
## yogurt} => {pastry} 0.001220132 0.2000000 0.006100661 2.2480000 12
## [15016] {napkins,
## other_vegetables,
## pastry} => {whole_milk} 0.001423488 0.5000000 0.002846975 1.9568245 14
## [15017] {napkins,
## pastry,
## whole_milk} => {other_vegetables} 0.001423488 0.4827586 0.002948653 2.4949716 14
## [15018] {napkins,
## other_vegetables,
## whole_milk} => {pastry} 0.001423488 0.2089552 0.006812405 2.3486567 14
## [15019] {bottled_water,
## citrus_fruit,
## napkins} => {root_vegetables} 0.001016777 0.5555556 0.001830198 5.0969113 10
## [15020] {citrus_fruit,
## napkins,
## root_vegetables} => {bottled_water} 0.001016777 0.4347826 0.002338587 3.9338426 10
## [15021] {bottled_water,
## napkins,
## root_vegetables} => {citrus_fruit} 0.001016777 0.4761905 0.002135231 5.7534808 10
## [15022] {bottled_water,
## citrus_fruit,
## root_vegetables} => {napkins} 0.001016777 0.3030303 0.003355363 5.7869962 10
## [15023] {bottled_water,
## citrus_fruit,
## napkins} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [15024] {citrus_fruit,
## napkins,
## whole_milk} => {bottled_water} 0.001016777 0.3030303 0.003355363 2.7417691 10
## [15025] {bottled_water,
## napkins,
## whole_milk} => {citrus_fruit} 0.001016777 0.2564103 0.003965430 3.0980281 10
## [15026] {citrus_fruit,
## napkins,
## tropical_fruit} => {root_vegetables} 0.001118454 0.3928571 0.002846975 3.6042444 11
## [15027] {citrus_fruit,
## napkins,
## root_vegetables} => {tropical_fruit} 0.001118454 0.4782609 0.002338587 4.5578446 11
## [15028] {napkins,
## root_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001118454 0.4230769 0.002643620 5.1117464 11
## [15029] {citrus_fruit,
## napkins,
## tropical_fruit} => {other_vegetables} 0.001321810 0.4642857 0.002846975 2.3995008 13
## [15030] {citrus_fruit,
## napkins,
## other_vegetables} => {tropical_fruit} 0.001321810 0.5000000 0.002643620 4.7650194 13
## [15031] {napkins,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001321810 0.3333333 0.003965430 4.0274365 13
## [15032] {citrus_fruit,
## napkins,
## tropical_fruit} => {whole_milk} 0.001321810 0.4642857 0.002846975 1.8170513 13
## [15033] {citrus_fruit,
## napkins,
## whole_milk} => {tropical_fruit} 0.001321810 0.3939394 0.003355363 3.7542577 13
## [15034] {napkins,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001321810 0.2653061 0.004982206 3.2055107 13
## [15035] {citrus_fruit,
## napkins,
## root_vegetables} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [15036] {citrus_fruit,
## napkins,
## other_vegetables} => {root_vegetables} 0.001220132 0.4615385 0.002643620 4.2343571 12
## [15037] {napkins,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001220132 0.2666667 0.004575496 3.2219492 12
## [15038] {citrus_fruit,
## napkins,
## root_vegetables} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [15039] {citrus_fruit,
## napkins,
## whole_milk} => {root_vegetables} 0.001321810 0.3939394 0.003355363 3.6141735 13
## [15040] {napkins,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001321810 0.2708333 0.004880529 3.2722922 13
## [15041] {citrus_fruit,
## napkins,
## yogurt} => {whole_milk} 0.001321810 0.5000000 0.002643620 1.9568245 13
## [15042] {citrus_fruit,
## napkins,
## whole_milk} => {yogurt} 0.001321810 0.3939394 0.003355363 2.8239023 13
## [15043] {napkins,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001321810 0.2166667 0.006100661 2.6178337 13
## [15044] {citrus_fruit,
## napkins,
## other_vegetables} => {whole_milk} 0.001525165 0.5769231 0.002643620 2.2578744 15
## [15045] {citrus_fruit,
## napkins,
## whole_milk} => {other_vegetables} 0.001525165 0.4545455 0.003355363 2.3491616 15
## [15046] {napkins,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001525165 0.2238806 0.006812405 2.7049947 15
## [15047] {napkins,
## shopping_bags,
## tropical_fruit} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [15048] {napkins,
## shopping_bags,
## whole_milk} => {tropical_fruit} 0.001321810 0.3714286 0.003558719 3.5397287 13
## [15049] {napkins,
## tropical_fruit,
## whole_milk} => {shopping_bags} 0.001321810 0.2653061 0.004982206 2.6927613 13
## [15050] {shopping_bags,
## tropical_fruit,
## whole_milk} => {napkins} 0.001321810 0.2653061 0.004982206 5.0665742 13
## [15051] {napkins,
## shopping_bags,
## soda} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [15052] {napkins,
## shopping_bags,
## whole_milk} => {soda} 0.001220132 0.3428571 0.003558719 1.9661808 12
## [15053] {napkins,
## soda,
## whole_milk} => {shopping_bags} 0.001220132 0.2608696 0.004677173 2.6477319 12
## [15054] {napkins,
## shopping_bags,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [15055] {napkins,
## shopping_bags,
## whole_milk} => {yogurt} 0.001118454 0.3142857 0.003558719 2.2529155 11
## [15056] {shopping_bags,
## whole_milk,
## yogurt} => {napkins} 0.001118454 0.2115385 0.005287239 4.0397685 11
## [15057] {napkins,
## sausage,
## soda} => {whole_milk} 0.001016777 0.4166667 0.002440264 1.6306871 10
## [15058] {napkins,
## sausage,
## whole_milk} => {soda} 0.001016777 0.3703704 0.002745297 2.1239607 10
## [15059] {napkins,
## soda,
## whole_milk} => {sausage} 0.001016777 0.2173913 0.004677173 2.3138999 10
## [15060] {napkins,
## sausage,
## yogurt} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [15061] {napkins,
## sausage,
## whole_milk} => {yogurt} 0.001118454 0.4074074 0.002745297 2.9204460 11
## [15062] {bottled_water,
## napkins,
## tropical_fruit} => {other_vegetables} 0.001016777 0.3846154 0.002643620 1.9877521 10
## [15063] {bottled_water,
## napkins,
## other_vegetables} => {tropical_fruit} 0.001016777 0.3703704 0.002745297 3.5296440 10
## [15064] {napkins,
## other_vegetables,
## tropical_fruit} => {bottled_water} 0.001016777 0.2564103 0.003965430 2.3199585 10
## [15065] {bottled_water,
## napkins,
## tropical_fruit} => {whole_milk} 0.001525165 0.5769231 0.002643620 2.2578744 15
## [15066] {bottled_water,
## napkins,
## whole_milk} => {tropical_fruit} 0.001525165 0.3846154 0.003965430 3.6653995 15
## [15067] {napkins,
## tropical_fruit,
## whole_milk} => {bottled_water} 0.001525165 0.3061224 0.004982206 2.7697464 15
## [15068] {bottled_water,
## napkins,
## root_vegetables} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [15069] {bottled_water,
## napkins,
## other_vegetables} => {root_vegetables} 0.001220132 0.4444444 0.002745297 4.0775290 12
## [15070] {napkins,
## other_vegetables,
## root_vegetables} => {bottled_water} 0.001220132 0.2666667 0.004575496 2.4127568 12
## [15071] {bottled_water,
## napkins,
## root_vegetables} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [15072] {bottled_water,
## napkins,
## whole_milk} => {root_vegetables} 0.001118454 0.2820513 0.003965430 2.5876626 11
## [15073] {napkins,
## root_vegetables,
## whole_milk} => {bottled_water} 0.001118454 0.2291667 0.004880529 2.0734629 11
## [15074] {bottled_water,
## napkins,
## other_vegetables} => {whole_milk} 0.001626843 0.5925926 0.002745297 2.3191994 16
## [15075] {bottled_water,
## napkins,
## whole_milk} => {other_vegetables} 0.001626843 0.4102564 0.003965430 2.1202689 16
## [15076] {napkins,
## other_vegetables,
## whole_milk} => {bottled_water} 0.001626843 0.2388060 0.006812405 2.1606778 16
## [15077] {napkins,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001626843 0.6153846 0.002643620 3.1804034 16
## [15078] {napkins,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001626843 0.4102564 0.003965430 3.7638729 16
## [15079] {napkins,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001626843 0.3555556 0.004575496 3.3884582 16
## [15080] {napkins,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001423488 0.5384615 0.002643620 2.1073495 14
## [15081] {napkins,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001423488 0.2857143 0.004982206 2.6212687 14
## [15082] {napkins,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001423488 0.2916667 0.004880529 2.7795946 14
## [15083] {napkins,
## soda,
## tropical_fruit} => {other_vegetables} 0.001220132 0.4000000 0.003050330 2.0672622 12
## [15084] {napkins,
## other_vegetables,
## tropical_fruit} => {soda} 0.001220132 0.3076923 0.003965430 1.7645212 12
## [15085] {napkins,
## other_vegetables,
## soda} => {tropical_fruit} 0.001220132 0.4000000 0.003050330 3.8120155 12
## [15086] {napkins,
## soda,
## tropical_fruit} => {whole_milk} 0.001321810 0.4333333 0.003050330 1.6959146 13
## [15087] {napkins,
## tropical_fruit,
## whole_milk} => {soda} 0.001321810 0.2653061 0.004982206 1.5214494 13
## [15088] {napkins,
## soda,
## whole_milk} => {tropical_fruit} 0.001321810 0.2826087 0.004677173 2.6932718 13
## [15089] {napkins,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001118454 0.3548387 0.003152008 1.8338616 11
## [15090] {napkins,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001118454 0.2820513 0.003965430 2.0218472 11
## [15091] {napkins,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001118454 0.2820513 0.003965430 2.6879597 11
## [15092] {napkins,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001931876 0.6129032 0.003152008 2.3986881 19
## [15093] {napkins,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001931876 0.3877551 0.004982206 2.7795710 19
## [15094] {napkins,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001931876 0.3166667 0.006100661 3.0178456 19
## [15095] {napkins,
## rolls/buns,
## tropical_fruit} => {other_vegetables} 0.001220132 0.4000000 0.003050330 2.0672622 12
## [15096] {napkins,
## other_vegetables,
## tropical_fruit} => {rolls/buns} 0.001220132 0.3076923 0.003965430 1.6728324 12
## [15097] {napkins,
## other_vegetables,
## rolls/buns} => {tropical_fruit} 0.001220132 0.2926829 0.004168785 2.7892796 12
## [15098] {napkins,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001525165 0.5000000 0.003050330 1.9568245 15
## [15099] {napkins,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001525165 0.3061224 0.004982206 1.6642976 15
## [15100] {napkins,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001525165 0.2884615 0.005287239 2.7490496 15
## [15101] {napkins,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001931876 0.4871795 0.003965430 1.9066495 19
## [15102] {napkins,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001931876 0.3877551 0.004982206 2.0039787 19
## [15103] {napkins,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001931876 0.2835821 0.006812405 2.7025483 19
## [15104] {napkins,
## root_vegetables,
## soda} => {rolls/buns} 0.001016777 0.4000000 0.002541942 2.1746821 10
## [15105] {napkins,
## rolls/buns,
## root_vegetables} => {soda} 0.001016777 0.3448276 0.002948653 1.9774806 10
## [15106] {napkins,
## rolls/buns,
## soda} => {root_vegetables} 0.001016777 0.3448276 0.002948653 3.1636001 10
## [15107] {rolls/buns,
## root_vegetables,
## soda} => {napkins} 0.001016777 0.2083333 0.004880529 3.9785599 10
## [15108] {napkins,
## root_vegetables,
## soda} => {other_vegetables} 0.001626843 0.6400000 0.002541942 3.3076195 16
## [15109] {napkins,
## other_vegetables,
## root_vegetables} => {soda} 0.001626843 0.3555556 0.004575496 2.0390023 16
## [15110] {napkins,
## other_vegetables,
## soda} => {root_vegetables} 0.001626843 0.5333333 0.003050330 4.8930348 16
## [15111] {napkins,
## root_vegetables,
## soda} => {whole_milk} 0.001220132 0.4800000 0.002541942 1.8785515 12
## [15112] {napkins,
## root_vegetables,
## whole_milk} => {soda} 0.001220132 0.2500000 0.004880529 1.4336735 12
## [15113] {napkins,
## soda,
## whole_milk} => {root_vegetables} 0.001220132 0.2608696 0.004677173 2.3933323 12
## [15114] {napkins,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001321810 0.4814815 0.002745297 2.4883712 13
## [15115] {napkins,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001321810 0.2888889 0.004575496 2.0708617 13
## [15116] {napkins,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001321810 0.3333333 0.003965430 3.0581468 13
## [15117] {napkins,
## root_vegetables,
## yogurt} => {whole_milk} 0.001423488 0.5185185 0.002745297 2.0292995 14
## [15118] {napkins,
## root_vegetables,
## whole_milk} => {yogurt} 0.001423488 0.2916667 0.004880529 2.0907738 14
## [15119] {napkins,
## whole_milk,
## yogurt} => {root_vegetables} 0.001423488 0.2333333 0.006100661 2.1407027 14
## [15120] {napkins,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001423488 0.4827586 0.002948653 2.4949716 14
## [15121] {napkins,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001423488 0.3111111 0.004575496 1.6914194 14
## [15122] {napkins,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001423488 0.3414634 0.004168785 3.1327357 14
## [15123] {napkins,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001321810 0.4482759 0.002948653 1.7543944 13
## [15124] {napkins,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001321810 0.2708333 0.004880529 1.4724410 13
## [15125] {napkins,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001321810 0.2500000 0.005287239 2.2936101 13
## [15126] {napkins,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.002338587 0.5111111 0.004575496 2.0003095 23
## [15127] {napkins,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.002338587 0.4791667 0.004880529 2.4764079 23
## [15128] {napkins,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.002338587 0.3432836 0.006812405 3.1494347 23
## [15129] {napkins,
## soda,
## yogurt} => {rolls/buns} 0.001220132 0.3636364 0.003355363 1.9769838 12
## [15130] {napkins,
## rolls/buns,
## soda} => {yogurt} 0.001220132 0.4137931 0.002948653 2.9662210 12
## [15131] {napkins,
## rolls/buns,
## yogurt} => {soda} 0.001220132 0.3428571 0.003558719 1.9661808 12
## [15132] {napkins,
## soda,
## yogurt} => {other_vegetables} 0.001016777 0.3030303 0.003355363 1.5661077 10
## [15133] {napkins,
## other_vegetables,
## soda} => {yogurt} 0.001016777 0.3333333 0.003050330 2.3894558 10
## [15134] {napkins,
## other_vegetables,
## yogurt} => {soda} 0.001016777 0.2564103 0.003965430 1.4704343 10
## [15135] {napkins,
## soda,
## yogurt} => {whole_milk} 0.001220132 0.3636364 0.003355363 1.4231451 12
## [15136] {napkins,
## soda,
## whole_milk} => {yogurt} 0.001220132 0.2608696 0.004677173 1.8700089 12
## [15137] {napkins,
## whole_milk,
## yogurt} => {soda} 0.001220132 0.2000000 0.006100661 1.1469388 12
## [15138] {napkins,
## rolls/buns,
## soda} => {other_vegetables} 0.001321810 0.4482759 0.002948653 2.3167594 13
## [15139] {napkins,
## other_vegetables,
## soda} => {rolls/buns} 0.001321810 0.4333333 0.003050330 2.3559057 13
## [15140] {napkins,
## other_vegetables,
## rolls/buns} => {soda} 0.001321810 0.3170732 0.004168785 1.8183176 13
## [15141] {napkins,
## rolls/buns,
## soda} => {whole_milk} 0.001321810 0.4482759 0.002948653 1.7543944 13
## [15142] {napkins,
## soda,
## whole_milk} => {rolls/buns} 0.001321810 0.2826087 0.004677173 1.5364602 13
## [15143] {napkins,
## rolls/buns,
## whole_milk} => {soda} 0.001321810 0.2500000 0.005287239 1.4336735 13
## [15144] {napkins,
## other_vegetables,
## soda} => {whole_milk} 0.001728521 0.5666667 0.003050330 2.2177344 17
## [15145] {napkins,
## soda,
## whole_milk} => {other_vegetables} 0.001728521 0.3695652 0.004677173 1.9099705 17
## [15146] {napkins,
## other_vegetables,
## whole_milk} => {soda} 0.001728521 0.2537313 0.006812405 1.4550716 17
## [15147] {napkins,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001525165 0.4285714 0.003558719 2.2149238 15
## [15148] {napkins,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001525165 0.3846154 0.003965430 2.0910405 15
## [15149] {napkins,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001525165 0.3658537 0.004168785 2.6225734 15
## [15150] {napkins,
## rolls/buns,
## yogurt} => {whole_milk} 0.001728521 0.4857143 0.003558719 1.9009152 17
## [15151] {napkins,
## whole_milk,
## yogurt} => {rolls/buns} 0.001728521 0.2833333 0.006100661 1.5403999 17
## [15152] {napkins,
## rolls/buns,
## whole_milk} => {yogurt} 0.001728521 0.3269231 0.005287239 2.3435047 17
## [15153] {napkins,
## other_vegetables,
## yogurt} => {whole_milk} 0.002135231 0.5384615 0.003965430 2.1073495 21
## [15154] {napkins,
## whole_milk,
## yogurt} => {other_vegetables} 0.002135231 0.3500000 0.006100661 1.8088544 21
## [15155] {napkins,
## other_vegetables,
## whole_milk} => {yogurt} 0.002135231 0.3134328 0.006812405 2.2468017 21
## [15156] {napkins,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.002033554 0.4878049 0.004168785 1.9090971 20
## [15157] {napkins,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.002033554 0.3846154 0.005287239 1.9877521 20
## [15158] {napkins,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.002033554 0.2985075 0.006812405 1.6228971 20
## [15159] {frankfurter,
## pork,
## root_vegetables} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [15160] {frankfurter,
## other_vegetables,
## pork} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [15161] {frankfurter,
## other_vegetables,
## root_vegetables} => {pork} 0.001016777 0.2564103 0.003965430 4.4476100 10
## [15162] {frankfurter,
## pork,
## root_vegetables} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [15163] {frankfurter,
## pork,
## whole_milk} => {root_vegetables} 0.001321810 0.4642857 0.002846975 4.2595616 13
## [15164] {frankfurter,
## root_vegetables,
## whole_milk} => {pork} 0.001321810 0.2600000 0.005083884 4.5098765 13
## [15165] {frankfurter,
## pork,
## rolls/buns} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [15166] {frankfurter,
## other_vegetables,
## pork} => {rolls/buns} 0.001118454 0.4074074 0.002745297 2.2149540 11
## [15167] {other_vegetables,
## pork,
## rolls/buns} => {frankfurter} 0.001118454 0.2000000 0.005592272 3.3913793 11
## [15168] {frankfurter,
## other_vegetables,
## rolls/buns} => {pork} 0.001118454 0.2000000 0.005592272 3.4691358 11
## [15169] {frankfurter,
## pork,
## rolls/buns} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [15170] {frankfurter,
## pork,
## whole_milk} => {rolls/buns} 0.001016777 0.3571429 0.002846975 1.9416805 10
## [15171] {frankfurter,
## other_vegetables,
## pork} => {whole_milk} 0.001423488 0.5185185 0.002745297 2.0292995 14
## [15172] {frankfurter,
## pork,
## whole_milk} => {other_vegetables} 0.001423488 0.5000000 0.002846975 2.5840778 14
## [15173] {bottled_beer,
## pork,
## rolls/buns} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [15174] {bottled_beer,
## pork,
## whole_milk} => {rolls/buns} 0.001118454 0.4782609 0.002338587 2.6001634 11
## [15175] {bottled_beer,
## rolls/buns,
## whole_milk} => {pork} 0.001118454 0.2075472 0.005388917 3.6000466 11
## [15176] {bottled_beer,
## other_vegetables,
## pork} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [15177] {bottled_beer,
## pork,
## whole_milk} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [15178] {brown_bread,
## other_vegetables,
## pork} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [15179] {brown_bread,
## pork,
## whole_milk} => {other_vegetables} 0.001220132 0.4444444 0.002745297 2.2969580 12
## [15180] {margarine,
## other_vegetables,
## pork} => {whole_milk} 0.001321810 0.5416667 0.002440264 2.1198932 13
## [15181] {margarine,
## pork,
## whole_milk} => {other_vegetables} 0.001321810 0.4814815 0.002745297 2.4883712 13
## [15182] {butter,
## pork,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [15183] {butter,
## other_vegetables,
## pork} => {whipped/sour_cream} 0.001016777 0.3846154 0.002643620 5.3655210 10
## [15184] {other_vegetables,
## pork,
## whipped/sour_cream} => {butter} 0.001016777 0.2500000 0.004067107 4.5114679 10
## [15185] {butter,
## pork,
## whipped/sour_cream} => {whole_milk} 0.001423488 0.8750000 0.001626843 3.4244429 14
## [15186] {butter,
## pork,
## whole_milk} => {whipped/sour_cream} 0.001423488 0.3684211 0.003863752 5.1396043 14
## [15187] {pork,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001423488 0.3111111 0.004575496 5.6142712 14
## [15188] {butter,
## whipped/sour_cream,
## whole_milk} => {pork} 0.001423488 0.2121212 0.006710727 3.6793865 14
## [15189] {butter,
## pork,
## root_vegetables} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [15190] {butter,
## other_vegetables,
## pork} => {root_vegetables} 0.001118454 0.4230769 0.002643620 3.8814940 11
## [15191] {butter,
## pork,
## root_vegetables} => {whole_milk} 0.001423488 0.7777778 0.001830198 3.0439492 14
## [15192] {butter,
## pork,
## whole_milk} => {root_vegetables} 0.001423488 0.3684211 0.003863752 3.3800570 14
## [15193] {pork,
## root_vegetables,
## whole_milk} => {butter} 0.001423488 0.2089552 0.006812405 3.7707791 14
## [15194] {butter,
## pork,
## yogurt} => {whole_milk} 0.001423488 0.8235294 0.001728521 3.2230051 14
## [15195] {butter,
## pork,
## whole_milk} => {yogurt} 0.001423488 0.3684211 0.003863752 2.6409774 14
## [15196] {pork,
## whole_milk,
## yogurt} => {butter} 0.001423488 0.2916667 0.004880529 5.2633792 14
## [15197] {butter,
## pork,
## rolls/buns} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [15198] {butter,
## other_vegetables,
## pork} => {rolls/buns} 0.001016777 0.3846154 0.002643620 2.0910405 10
## [15199] {butter,
## pork,
## rolls/buns} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [15200] {butter,
## pork,
## whole_milk} => {rolls/buns} 0.001220132 0.3157895 0.003863752 1.7168543 12
## [15201] {butter,
## other_vegetables,
## pork} => {whole_milk} 0.002236909 0.8461538 0.002643620 3.3115492 22
## [15202] {butter,
## pork,
## whole_milk} => {other_vegetables} 0.002236909 0.5789474 0.003863752 2.9920901 22
## [15203] {other_vegetables,
## pork,
## whole_milk} => {butter} 0.002236909 0.2200000 0.010167768 3.9700917 22
## [15204] {newspapers,
## pork,
## root_vegetables} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [15205] {newspapers,
## other_vegetables,
## pork} => {root_vegetables} 0.001220132 0.4615385 0.002643620 4.2343571 12
## [15206] {newspapers,
## other_vegetables,
## root_vegetables} => {pork} 0.001220132 0.2033898 0.005998983 3.5279347 12
## [15207] {newspapers,
## pork,
## root_vegetables} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [15208] {newspapers,
## pork,
## whole_milk} => {root_vegetables} 0.001118454 0.3928571 0.002846975 3.6042444 11
## [15209] {newspapers,
## other_vegetables,
## pork} => {whole_milk} 0.001016777 0.3846154 0.002643620 1.5052496 10
## [15210] {newspapers,
## pork,
## whole_milk} => {other_vegetables} 0.001016777 0.3571429 0.002846975 1.8457698 10
## [15211] {domestic_eggs,
## pork,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [15212] {domestic_eggs,
## other_vegetables,
## pork} => {whipped/sour_cream} 0.001016777 0.3333333 0.003050330 4.6501182 10
## [15213] {other_vegetables,
## pork,
## whipped/sour_cream} => {domestic_eggs} 0.001016777 0.2500000 0.004067107 3.9403045 10
## [15214] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {pork} 0.001016777 0.2000000 0.005083884 3.4691358 10
## [15215] {domestic_eggs,
## pork,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [15216] {domestic_eggs,
## pork,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2941176 0.003457041 4.1030455 10
## [15217] {pork,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001016777 0.2222222 0.004575496 3.5024929 10
## [15218] {domestic_eggs,
## pork,
## root_vegetables} => {other_vegetables} 0.001321810 0.6842105 0.001931876 3.5361064 13
## [15219] {domestic_eggs,
## other_vegetables,
## pork} => {root_vegetables} 0.001321810 0.4333333 0.003050330 3.9755908 13
## [15220] {domestic_eggs,
## pork,
## root_vegetables} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [15221] {domestic_eggs,
## pork,
## whole_milk} => {root_vegetables} 0.001321810 0.3823529 0.003457041 3.5078742 13
## [15222] {domestic_eggs,
## pork,
## rolls/buns} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [15223] {domestic_eggs,
## other_vegetables,
## pork} => {rolls/buns} 0.001118454 0.3666667 0.003050330 1.9934586 11
## [15224] {other_vegetables,
## pork,
## rolls/buns} => {domestic_eggs} 0.001118454 0.2000000 0.005592272 3.1522436 11
## [15225] {domestic_eggs,
## other_vegetables,
## pork} => {whole_milk} 0.002033554 0.6666667 0.003050330 2.6090994 20
## [15226] {domestic_eggs,
## pork,
## whole_milk} => {other_vegetables} 0.002033554 0.5882353 0.003457041 3.0400915 20
## [15227] {other_vegetables,
## pork,
## whole_milk} => {domestic_eggs} 0.002033554 0.2000000 0.010167768 3.1522436 20
## [15228] {fruit/vegetable_juice,
## pork,
## tropical_fruit} => {yogurt} 0.001016777 0.8333333 0.001220132 5.9736395 10
## [15229] {fruit/vegetable_juice,
## pork,
## yogurt} => {tropical_fruit} 0.001016777 0.5555556 0.001830198 5.2944660 10
## [15230] {pork,
## tropical_fruit,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.3703704 0.002745297 5.1231963 10
## [15231] {fruit/vegetable_juice,
## tropical_fruit,
## yogurt} => {pork} 0.001016777 0.2083333 0.004880529 3.6136831 10
## [15232] {fruit/vegetable_juice,
## pork,
## root_vegetables} => {other_vegetables} 0.001525165 0.7500000 0.002033554 3.8761167 15
## [15233] {fruit/vegetable_juice,
## other_vegetables,
## pork} => {root_vegetables} 0.001525165 0.6000000 0.002541942 5.5046642 15
## [15234] {other_vegetables,
## pork,
## root_vegetables} => {fruit/vegetable_juice} 0.001525165 0.2173913 0.007015760 3.0070935 15
## [15235] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {pork} 0.001525165 0.2307692 0.006609049 4.0028490 15
## [15236] {fruit/vegetable_juice,
## pork,
## root_vegetables} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [15237] {fruit/vegetable_juice,
## pork,
## whole_milk} => {root_vegetables} 0.001220132 0.4615385 0.002643620 4.2343571 12
## [15238] {fruit/vegetable_juice,
## pork,
## yogurt} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [15239] {fruit/vegetable_juice,
## pork,
## whole_milk} => {yogurt} 0.001118454 0.4230769 0.002643620 3.0327708 11
## [15240] {pork,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.2291667 0.004880529 3.1699777 11
## [15241] {fruit/vegetable_juice,
## other_vegetables,
## pork} => {whole_milk} 0.001626843 0.6400000 0.002541942 2.5047354 16
## [15242] {fruit/vegetable_juice,
## pork,
## whole_milk} => {other_vegetables} 0.001626843 0.6153846 0.002643620 3.1804034 16
## [15243] {pip_fruit,
## pork,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [15244] {other_vegetables,
## pork,
## whipped/sour_cream} => {pip_fruit} 0.001016777 0.2500000 0.004067107 3.3047715 10
## [15245] {other_vegetables,
## pip_fruit,
## pork} => {whipped/sour_cream} 0.001016777 0.2702703 0.003762074 3.7703661 10
## [15246] {pork,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [15247] {other_vegetables,
## pork,
## whipped/sour_cream} => {tropical_fruit} 0.001016777 0.2500000 0.004067107 2.3825097 10
## [15248] {other_vegetables,
## pork,
## tropical_fruit} => {whipped/sour_cream} 0.001016777 0.2777778 0.003660397 3.8750985 10
## [15249] {pork,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [15250] {pork,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001423488 0.3111111 0.004575496 2.8542703 14
## [15251] {pork,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001423488 0.2089552 0.006812405 2.9149995 14
## [15252] {pork,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [15253] {pork,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001220132 0.2666667 0.004575496 1.9115646 12
## [15254] {pork,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001220132 0.2500000 0.004880529 3.4875887 12
## [15255] {pork,
## rolls/buns,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [15256] {other_vegetables,
## pork,
## whipped/sour_cream} => {rolls/buns} 0.001118454 0.2750000 0.004067107 1.4950940 11
## [15257] {other_vegetables,
## pork,
## rolls/buns} => {whipped/sour_cream} 0.001118454 0.2000000 0.005592272 2.7900709 11
## [15258] {pork,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [15259] {pork,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001016777 0.2222222 0.004575496 1.2081567 10
## [15260] {other_vegetables,
## pork,
## whipped/sour_cream} => {whole_milk} 0.002440264 0.6000000 0.004067107 2.3481894 24
## [15261] {pork,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.002440264 0.5333333 0.004575496 2.7563496 24
## [15262] {other_vegetables,
## pork,
## whole_milk} => {whipped/sour_cream} 0.002440264 0.2400000 0.010167768 3.3480851 24
## [15263] {pip_fruit,
## pork,
## root_vegetables} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [15264] {other_vegetables,
## pip_fruit,
## pork} => {root_vegetables} 0.001220132 0.3243243 0.003762074 2.9754942 12
## [15265] {pip_fruit,
## pork,
## root_vegetables} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [15266] {pip_fruit,
## pork,
## whole_milk} => {root_vegetables} 0.001321810 0.4193548 0.003152008 3.8473459 13
## [15267] {pip_fruit,
## pork,
## soda} => {other_vegetables} 0.001118454 0.8461538 0.001321810 4.3730547 11
## [15268] {other_vegetables,
## pip_fruit,
## pork} => {soda} 0.001118454 0.2972973 0.003762074 1.7049090 11
## [15269] {other_vegetables,
## pork,
## soda} => {pip_fruit} 0.001118454 0.2894737 0.003863752 3.8265775 11
## [15270] {other_vegetables,
## pip_fruit,
## soda} => {pork} 0.001118454 0.2391304 0.004677173 4.1478798 11
## [15271] {other_vegetables,
## pip_fruit,
## pork} => {whole_milk} 0.002338587 0.6216216 0.003762074 2.4328089 23
## [15272] {pip_fruit,
## pork,
## whole_milk} => {other_vegetables} 0.002338587 0.7419355 0.003152008 3.8344380 23
## [15273] {other_vegetables,
## pork,
## whole_milk} => {pip_fruit} 0.002338587 0.2300000 0.010167768 3.0403898 23
## [15274] {pastry,
## pork,
## root_vegetables} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [15275] {other_vegetables,
## pastry,
## pork} => {root_vegetables} 0.001016777 0.3571429 0.002846975 3.2765858 10
## [15276] {pastry,
## pork,
## soda} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [15277] {other_vegetables,
## pastry,
## pork} => {soda} 0.001016777 0.3571429 0.002846975 2.0481050 10
## [15278] {other_vegetables,
## pork,
## soda} => {pastry} 0.001016777 0.2631579 0.003863752 2.9578947 10
## [15279] {pastry,
## pork,
## rolls/buns} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [15280] {pastry,
## pork,
## whole_milk} => {rolls/buns} 0.001118454 0.3548387 0.003152008 1.9291535 11
## [15281] {other_vegetables,
## pastry,
## pork} => {whole_milk} 0.001525165 0.5357143 0.002846975 2.0965977 15
## [15282] {pastry,
## pork,
## whole_milk} => {other_vegetables} 0.001525165 0.4838710 0.003152008 2.5007204 15
## [15283] {citrus_fruit,
## pork,
## root_vegetables} => {other_vegetables} 0.001728521 0.6800000 0.002541942 3.5143458 17
## [15284] {citrus_fruit,
## other_vegetables,
## pork} => {root_vegetables} 0.001728521 0.5151515 0.003355363 4.7262268 17
## [15285] {other_vegetables,
## pork,
## root_vegetables} => {citrus_fruit} 0.001728521 0.2463768 0.007015760 2.9768009 17
## [15286] {citrus_fruit,
## pork,
## root_vegetables} => {whole_milk} 0.001626843 0.6400000 0.002541942 2.5047354 16
## [15287] {citrus_fruit,
## pork,
## whole_milk} => {root_vegetables} 0.001626843 0.5517241 0.002948653 5.0617602 16
## [15288] {pork,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001626843 0.2388060 0.006812405 2.8853277 16
## [15289] {citrus_fruit,
## other_vegetables,
## pork} => {whole_milk} 0.001728521 0.5151515 0.003355363 2.0161222 17
## [15290] {citrus_fruit,
## pork,
## whole_milk} => {other_vegetables} 0.001728521 0.5862069 0.002948653 3.0296084 17
## [15291] {pork,
## root_vegetables,
## shopping_bags} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [15292] {other_vegetables,
## pork,
## shopping_bags} => {root_vegetables} 0.001220132 0.4615385 0.002643620 4.2343571 12
## [15293] {pork,
## sausage,
## tropical_fruit} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [15294] {other_vegetables,
## pork,
## sausage} => {tropical_fruit} 0.001016777 0.3448276 0.002948653 3.2862203 10
## [15295] {other_vegetables,
## pork,
## tropical_fruit} => {sausage} 0.001016777 0.2777778 0.003660397 2.9566498 10
## [15296] {pork,
## sausage,
## tropical_fruit} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [15297] {pork,
## sausage,
## whole_milk} => {tropical_fruit} 0.001118454 0.3333333 0.003355363 3.1766796 11
## [15298] {pork,
## tropical_fruit,
## whole_milk} => {sausage} 0.001118454 0.2894737 0.003863752 3.0811404 11
## [15299] {pork,
## root_vegetables,
## sausage} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [15300] {pork,
## sausage,
## whole_milk} => {root_vegetables} 0.001220132 0.3636364 0.003355363 3.3361601 12
## [15301] {pork,
## sausage,
## yogurt} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [15302] {pork,
## sausage,
## whole_milk} => {yogurt} 0.001118454 0.3333333 0.003355363 2.3894558 11
## [15303] {pork,
## whole_milk,
## yogurt} => {sausage} 0.001118454 0.2291667 0.004880529 2.4392361 11
## [15304] {pork,
## rolls/buns,
## sausage} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [15305] {other_vegetables,
## pork,
## sausage} => {rolls/buns} 0.001016777 0.3448276 0.002948653 1.8747260 10
## [15306] {pork,
## rolls/buns,
## sausage} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [15307] {pork,
## sausage,
## whole_milk} => {rolls/buns} 0.001220132 0.3636364 0.003355363 1.9769838 12
## [15308] {other_vegetables,
## pork,
## sausage} => {whole_milk} 0.001423488 0.4827586 0.002948653 1.8893478 14
## [15309] {pork,
## sausage,
## whole_milk} => {other_vegetables} 0.001423488 0.4242424 0.003355363 2.1925508 14
## [15310] {bottled_water,
## pork,
## root_vegetables} => {whole_milk} 0.001016777 0.4166667 0.002440264 1.6306871 10
## [15311] {bottled_water,
## pork,
## whole_milk} => {root_vegetables} 0.001016777 0.3571429 0.002846975 3.2765858 10
## [15312] {bottled_water,
## pork,
## rolls/buns} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [15313] {bottled_water,
## other_vegetables,
## pork} => {rolls/buns} 0.001220132 0.4444444 0.002745297 2.4163135 12
## [15314] {other_vegetables,
## pork,
## rolls/buns} => {bottled_water} 0.001220132 0.2181818 0.005592272 1.9740738 12
## [15315] {bottled_water,
## pork,
## rolls/buns} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [15316] {bottled_water,
## pork,
## whole_milk} => {rolls/buns} 0.001016777 0.3571429 0.002846975 1.9416805 10
## [15317] {bottled_water,
## other_vegetables,
## pork} => {whole_milk} 0.001321810 0.4814815 0.002745297 1.8843495 13
## [15318] {bottled_water,
## pork,
## whole_milk} => {other_vegetables} 0.001321810 0.4642857 0.002846975 2.3995008 13
## [15319] {pork,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [15320] {pork,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [15321] {pork,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001016777 0.3448276 0.002948653 3.2862203 10
## [15322] {pork,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001525165 0.6000000 0.002541942 3.1008933 15
## [15323] {other_vegetables,
## pork,
## tropical_fruit} => {root_vegetables} 0.001525165 0.4166667 0.003660397 3.8226835 15
## [15324] {other_vegetables,
## pork,
## root_vegetables} => {tropical_fruit} 0.001525165 0.2173913 0.007015760 2.0717476 15
## [15325] {pork,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001321810 0.5200000 0.002541942 2.0350975 13
## [15326] {pork,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001321810 0.3421053 0.003863752 3.1386243 13
## [15327] {pork,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001626843 0.5925926 0.002745297 3.0626107 16
## [15328] {other_vegetables,
## pork,
## tropical_fruit} => {yogurt} 0.001626843 0.4444444 0.003660397 3.1859410 16
## [15329] {other_vegetables,
## pork,
## yogurt} => {tropical_fruit} 0.001626843 0.3478261 0.004677173 3.3147961 16
## [15330] {pork,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001525165 0.5555556 0.002745297 2.1742495 15
## [15331] {pork,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001525165 0.3947368 0.003863752 2.8296187 15
## [15332] {pork,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001525165 0.3125000 0.004880529 2.9781371 15
## [15333] {pork,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [15334] {pork,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001220132 0.3157895 0.003863752 1.7168543 12
## [15335] {other_vegetables,
## pork,
## tropical_fruit} => {whole_milk} 0.001626843 0.4444444 0.003660397 1.7393996 16
## [15336] {pork,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001626843 0.4210526 0.003863752 2.1760655 16
## [15337] {pork,
## root_vegetables,
## soda} => {other_vegetables} 0.001220132 0.4285714 0.002846975 2.2149238 12
## [15338] {other_vegetables,
## pork,
## soda} => {root_vegetables} 0.001220132 0.3157895 0.003863752 2.8971917 12
## [15339] {pork,
## root_vegetables,
## soda} => {whole_milk} 0.001626843 0.5714286 0.002846975 2.2363709 16
## [15340] {pork,
## root_vegetables,
## whole_milk} => {soda} 0.001626843 0.2388060 0.006812405 1.3694791 16
## [15341] {pork,
## soda,
## whole_milk} => {root_vegetables} 0.001626843 0.3809524 0.004270463 3.4950249 16
## [15342] {root_vegetables,
## soda,
## whole_milk} => {pork} 0.001626843 0.2000000 0.008134215 3.4691358 16
## [15343] {pork,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001728521 0.5862069 0.002948653 3.0296084 17
## [15344] {other_vegetables,
## pork,
## root_vegetables} => {yogurt} 0.001728521 0.2463768 0.007015760 1.7661195 17
## [15345] {other_vegetables,
## pork,
## yogurt} => {root_vegetables} 0.001728521 0.3695652 0.004677173 3.3905540 17
## [15346] {pork,
## root_vegetables,
## yogurt} => {whole_milk} 0.001830198 0.6206897 0.002948653 2.4291615 18
## [15347] {pork,
## root_vegetables,
## whole_milk} => {yogurt} 0.001830198 0.2686567 0.006812405 1.9258300 18
## [15348] {pork,
## whole_milk,
## yogurt} => {root_vegetables} 0.001830198 0.3750000 0.004880529 3.4404151 18
## [15349] {pork,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001728521 0.6071429 0.002846975 3.1378087 17
## [15350] {other_vegetables,
## pork,
## root_vegetables} => {rolls/buns} 0.001728521 0.2463768 0.007015760 1.3394781 17
## [15351] {other_vegetables,
## pork,
## rolls/buns} => {root_vegetables} 0.001728521 0.3090909 0.005592272 2.8357361 17
## [15352] {pork,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.002033554 0.7142857 0.002846975 2.7954636 20
## [15353] {pork,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.002033554 0.2985075 0.006812405 1.6228971 20
## [15354] {pork,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.002033554 0.3278689 0.006202339 3.0080132 20
## [15355] {other_vegetables,
## pork,
## root_vegetables} => {whole_milk} 0.003762074 0.5362319 0.007015760 2.0986234 37
## [15356] {pork,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.003762074 0.5522388 0.006812405 2.8540560 37
## [15357] {other_vegetables,
## pork,
## whole_milk} => {root_vegetables} 0.003762074 0.3700000 0.010167768 3.3945429 37
## [15358] {pork,
## soda,
## yogurt} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [15359] {other_vegetables,
## pork,
## soda} => {yogurt} 0.001016777 0.2631579 0.003863752 1.8864125 10
## [15360] {other_vegetables,
## pork,
## yogurt} => {soda} 0.001016777 0.2173913 0.004677173 1.2466726 10
## [15361] {pork,
## rolls/buns,
## soda} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [15362] {other_vegetables,
## pork,
## soda} => {rolls/buns} 0.001220132 0.3157895 0.003863752 1.7168543 12
## [15363] {other_vegetables,
## pork,
## rolls/buns} => {soda} 0.001220132 0.2181818 0.005592272 1.2512059 12
## [15364] {pork,
## rolls/buns,
## soda} => {whole_milk} 0.001220132 0.5217391 0.002338587 2.0419038 12
## [15365] {pork,
## soda,
## whole_milk} => {rolls/buns} 0.001220132 0.2857143 0.004270463 1.5533444 12
## [15366] {other_vegetables,
## pork,
## soda} => {whole_milk} 0.002135231 0.5526316 0.003863752 2.1628060 21
## [15367] {pork,
## soda,
## whole_milk} => {other_vegetables} 0.002135231 0.5000000 0.004270463 2.5840778 21
## [15368] {other_vegetables,
## pork,
## whole_milk} => {soda} 0.002135231 0.2100000 0.010167768 1.2042857 21
## [15369] {pork,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [15370] {other_vegetables,
## pork,
## yogurt} => {rolls/buns} 0.001220132 0.2608696 0.004677173 1.4182710 12
## [15371] {other_vegetables,
## pork,
## rolls/buns} => {yogurt} 0.001220132 0.2181818 0.005592272 1.5640074 12
## [15372] {pork,
## rolls/buns,
## yogurt} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [15373] {pork,
## whole_milk,
## yogurt} => {rolls/buns} 0.001321810 0.2708333 0.004880529 1.4724410 13
## [15374] {pork,
## rolls/buns,
## whole_milk} => {yogurt} 0.001321810 0.2131148 0.006202339 1.5276848 13
## [15375] {other_vegetables,
## pork,
## yogurt} => {whole_milk} 0.002338587 0.5000000 0.004677173 1.9568245 23
## [15376] {pork,
## whole_milk,
## yogurt} => {other_vegetables} 0.002338587 0.4791667 0.004880529 2.4764079 23
## [15377] {other_vegetables,
## pork,
## whole_milk} => {yogurt} 0.002338587 0.2300000 0.010167768 1.6487245 23
## [15378] {other_vegetables,
## pork,
## rolls/buns} => {whole_milk} 0.003253686 0.5818182 0.005592272 2.2770322 32
## [15379] {pork,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.003253686 0.5245902 0.006202339 2.7111636 32
## [15380] {other_vegetables,
## pork,
## whole_milk} => {rolls/buns} 0.003253686 0.3200000 0.010167768 1.7397457 32
## [15381] {bottled_beer,
## frankfurter,
## rolls/buns} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [15382] {bottled_beer,
## frankfurter,
## whole_milk} => {rolls/buns} 0.001016777 0.3703704 0.002745297 2.0135946 10
## [15383] {bottled_beer,
## frankfurter,
## other_vegetables} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [15384] {bottled_beer,
## frankfurter,
## whole_milk} => {other_vegetables} 0.001016777 0.3703704 0.002745297 1.9141317 10
## [15385] {brown_bread,
## frankfurter,
## root_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [15386] {brown_bread,
## frankfurter,
## whole_milk} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [15387] {frankfurter,
## root_vegetables,
## whole_milk} => {brown_bread} 0.001016777 0.2000000 0.005083884 3.0830721 10
## [15388] {brown_bread,
## frankfurter,
## yogurt} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [15389] {brown_bread,
## frankfurter,
## other_vegetables} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [15390] {frankfurter,
## other_vegetables,
## yogurt} => {brown_bread} 0.001016777 0.2083333 0.004880529 3.2115334 10
## [15391] {brown_bread,
## frankfurter,
## yogurt} => {whole_milk} 0.001525165 0.6818182 0.002236909 2.6683971 15
## [15392] {brown_bread,
## frankfurter,
## whole_milk} => {yogurt} 0.001525165 0.5555556 0.002745297 3.9824263 15
## [15393] {frankfurter,
## whole_milk,
## yogurt} => {brown_bread} 0.001525165 0.2459016 0.006202339 3.7906624 15
## [15394] {brown_bread,
## whole_milk,
## yogurt} => {frankfurter} 0.001525165 0.2142857 0.007117438 3.6336207 15
## [15395] {brown_bread,
## frankfurter,
## other_vegetables} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [15396] {brown_bread,
## frankfurter,
## whole_milk} => {other_vegetables} 0.001118454 0.4074074 0.002745297 2.1055449 11
## [15397] {butter,
## frankfurter,
## yogurt} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [15398] {butter,
## frankfurter,
## whole_milk} => {yogurt} 0.001321810 0.4814815 0.002745297 3.4514361 13
## [15399] {frankfurter,
## whole_milk,
## yogurt} => {butter} 0.001321810 0.2131148 0.006202339 3.8458415 13
## [15400] {butter,
## frankfurter,
## other_vegetables} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [15401] {butter,
## frankfurter,
## whole_milk} => {other_vegetables} 0.001321810 0.4814815 0.002745297 2.4883712 13
## [15402] {frankfurter,
## newspapers,
## rolls/buns} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [15403] {frankfurter,
## newspapers,
## whole_milk} => {rolls/buns} 0.001118454 0.5500000 0.002033554 2.9901879 11
## [15404] {domestic_eggs,
## frankfurter,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [15405] {domestic_eggs,
## frankfurter,
## other_vegetables} => {whipped/sour_cream} 0.001016777 0.3448276 0.002948653 4.8104671 10
## [15406] {frankfurter,
## other_vegetables,
## whipped/sour_cream} => {domestic_eggs} 0.001016777 0.3333333 0.003050330 5.2537393 10
## [15407] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {frankfurter} 0.001016777 0.2000000 0.005083884 3.3913793 10
## [15408] {domestic_eggs,
## frankfurter,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [15409] {domestic_eggs,
## frankfurter,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2941176 0.003457041 4.1030455 10
## [15410] {frankfurter,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001016777 0.3333333 0.003050330 5.2537393 10
## [15411] {domestic_eggs,
## frankfurter,
## pip_fruit} => {tropical_fruit} 0.001016777 0.6250000 0.001626843 5.9562742 10
## [15412] {domestic_eggs,
## frankfurter,
## tropical_fruit} => {pip_fruit} 0.001016777 0.6250000 0.001626843 8.2619288 10
## [15413] {frankfurter,
## pip_fruit,
## tropical_fruit} => {domestic_eggs} 0.001016777 0.4347826 0.002338587 6.8527035 10
## [15414] {domestic_eggs,
## pip_fruit,
## tropical_fruit} => {frankfurter} 0.001016777 0.4347826 0.002338587 7.3725637 10
## [15415] {domestic_eggs,
## frankfurter,
## root_vegetables} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [15416] {domestic_eggs,
## frankfurter,
## other_vegetables} => {root_vegetables} 0.001016777 0.3448276 0.002948653 3.1636001 10
## [15417] {frankfurter,
## other_vegetables,
## root_vegetables} => {domestic_eggs} 0.001016777 0.2564103 0.003965430 4.0413379 10
## [15418] {domestic_eggs,
## frankfurter,
## root_vegetables} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [15419] {domestic_eggs,
## frankfurter,
## whole_milk} => {root_vegetables} 0.001016777 0.2941176 0.003457041 2.6983648 10
## [15420] {frankfurter,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001016777 0.2000000 0.005083884 3.1522436 10
## [15421] {domestic_eggs,
## frankfurter,
## yogurt} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [15422] {domestic_eggs,
## frankfurter,
## whole_milk} => {yogurt} 0.001321810 0.3823529 0.003457041 2.7408463 13
## [15423] {frankfurter,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001321810 0.2131148 0.006202339 3.3589481 13
## [15424] {domestic_eggs,
## frankfurter,
## rolls/buns} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [15425] {domestic_eggs,
## frankfurter,
## other_vegetables} => {rolls/buns} 0.001016777 0.3448276 0.002948653 1.8747260 10
## [15426] {domestic_eggs,
## frankfurter,
## other_vegetables} => {whole_milk} 0.001830198 0.6206897 0.002948653 2.4291615 18
## [15427] {domestic_eggs,
## frankfurter,
## whole_milk} => {other_vegetables} 0.001830198 0.5294118 0.003457041 2.7360823 18
## [15428] {frankfurter,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.001830198 0.2400000 0.007625826 3.7826923 18
## [15429] {frankfurter,
## fruit/vegetable_juice,
## pastry} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [15430] {frankfurter,
## fruit/vegetable_juice,
## whole_milk} => {pastry} 0.001016777 0.3571429 0.002846975 4.0142857 10
## [15431] {frankfurter,
## pastry,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.2564103 0.003965430 3.5468282 10
## [15432] {fruit/vegetable_juice,
## pastry,
## whole_milk} => {frankfurter} 0.001016777 0.2380952 0.004270463 4.0373563 10
## [15433] {frankfurter,
## fruit/vegetable_juice,
## tropical_fruit} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [15434] {frankfurter,
## fruit/vegetable_juice,
## other_vegetables} => {tropical_fruit} 0.001016777 0.6250000 0.001626843 5.9562742 10
## [15435] {frankfurter,
## other_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.001016777 0.2564103 0.003965430 3.5468282 10
## [15436] {frankfurter,
## fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [15437] {frankfurter,
## fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [15438] {frankfurter,
## fruit/vegetable_juice,
## other_vegetables} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [15439] {frankfurter,
## fruit/vegetable_juice,
## whole_milk} => {other_vegetables} 0.001016777 0.3571429 0.002846975 1.8457698 10
## [15440] {citrus_fruit,
## frankfurter,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [15441] {frankfurter,
## other_vegetables,
## whipped/sour_cream} => {citrus_fruit} 0.001016777 0.3333333 0.003050330 4.0274365 10
## [15442] {citrus_fruit,
## frankfurter,
## other_vegetables} => {whipped/sour_cream} 0.001016777 0.3448276 0.002948653 4.8104671 10
## [15443] {frankfurter,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001321810 0.5909091 0.002236909 4.2358534 13
## [15444] {frankfurter,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001321810 0.5652174 0.002338587 5.3865436 13
## [15445] {frankfurter,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001321810 0.4482759 0.002948653 6.2536072 13
## [15446] {tropical_fruit,
## whipped/sour_cream,
## yogurt} => {frankfurter} 0.001321810 0.2131148 0.006202339 3.6137648 13
## [15447] {frankfurter,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.6363636 0.002236909 3.2888263 14
## [15448] {frankfurter,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001423488 0.4666667 0.003050330 4.4473514 14
## [15449] {frankfurter,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001423488 0.3589744 0.003965430 5.0078196 14
## [15450] {frankfurter,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001423488 0.6363636 0.002236909 2.4905039 14
## [15451] {frankfurter,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001423488 0.4666667 0.003050330 4.4473514 14
## [15452] {frankfurter,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001423488 0.2745098 0.005185562 3.8295091 14
## [15453] {frankfurter,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [15454] {frankfurter,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001016777 0.3333333 0.003050330 3.0581468 10
## [15455] {frankfurter,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2000000 0.005083884 2.7900709 10
## [15456] {frankfurter,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001423488 0.6086957 0.002338587 3.1458338 14
## [15457] {frankfurter,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001423488 0.4666667 0.003050330 3.3452381 14
## [15458] {frankfurter,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001423488 0.2916667 0.004880529 4.0688534 14
## [15459] {frankfurter,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [15460] {frankfurter,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001321810 0.4333333 0.003050330 3.1062925 13
## [15461] {frankfurter,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001321810 0.2131148 0.006202339 2.9730264 13
## [15462] {frankfurter,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001728521 0.5666667 0.003050330 2.2177344 17
## [15463] {frankfurter,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001728521 0.5666667 0.003050330 2.9286215 17
## [15464] {frankfurter,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001728521 0.2266667 0.007625826 3.1620804 17
## [15465] {frankfurter,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001220132 0.5217391 0.002338587 3.7400177 12
## [15466] {frankfurter,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001220132 0.4800000 0.002541942 4.5744186 12
## [15467] {frankfurter,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001220132 0.4137931 0.002948653 5.4699666 12
## [15468] {frankfurter,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001423488 0.6086957 0.002338587 3.1458338 14
## [15469] {frankfurter,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001423488 0.3888889 0.003660397 3.7061262 14
## [15470] {frankfurter,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001423488 0.3589744 0.003965430 4.7453129 14
## [15471] {frankfurter,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [15472] {frankfurter,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001423488 0.4242424 0.003355363 4.0430467 14
## [15473] {frankfurter,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001423488 0.2745098 0.005185562 3.6287687 14
## [15474] {frankfurter,
## pip_fruit,
## root_vegetables} => {other_vegetables} 0.001220132 0.7500000 0.001626843 3.8761167 12
## [15475] {frankfurter,
## other_vegetables,
## pip_fruit} => {root_vegetables} 0.001220132 0.3333333 0.003660397 3.0581468 12
## [15476] {frankfurter,
## other_vegetables,
## root_vegetables} => {pip_fruit} 0.001220132 0.3076923 0.003965430 4.0674111 12
## [15477] {frankfurter,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [15478] {frankfurter,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001220132 0.3636364 0.003355363 3.3361601 12
## [15479] {frankfurter,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001220132 0.2400000 0.005083884 3.1725806 12
## [15480] {frankfurter,
## pip_fruit,
## soda} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [15481] {frankfurter,
## other_vegetables,
## pip_fruit} => {soda} 0.001016777 0.2777778 0.003660397 1.5929705 10
## [15482] {frankfurter,
## other_vegetables,
## soda} => {pip_fruit} 0.001016777 0.3125000 0.003253686 4.1309644 10
## [15483] {other_vegetables,
## pip_fruit,
## soda} => {frankfurter} 0.001016777 0.2173913 0.004677173 3.6862819 10
## [15484] {frankfurter,
## pip_fruit,
## yogurt} => {other_vegetables} 0.001626843 0.6400000 0.002541942 3.3076195 16
## [15485] {frankfurter,
## other_vegetables,
## pip_fruit} => {yogurt} 0.001626843 0.4444444 0.003660397 3.1859410 16
## [15486] {frankfurter,
## other_vegetables,
## yogurt} => {pip_fruit} 0.001626843 0.3333333 0.004880529 4.4063620 16
## [15487] {other_vegetables,
## pip_fruit,
## yogurt} => {frankfurter} 0.001626843 0.2000000 0.008134215 3.3913793 16
## [15488] {frankfurter,
## pip_fruit,
## yogurt} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [15489] {frankfurter,
## pip_fruit,
## whole_milk} => {yogurt} 0.001525165 0.4545455 0.003355363 3.2583488 15
## [15490] {frankfurter,
## whole_milk,
## yogurt} => {pip_fruit} 0.001525165 0.2459016 0.006202339 3.2505949 15
## [15491] {frankfurter,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.002338587 0.6388889 0.003660397 2.5003869 23
## [15492] {frankfurter,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.002338587 0.6969697 0.003355363 3.6020478 23
## [15493] {frankfurter,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.002338587 0.3066667 0.007625826 4.0538530 23
## [15494] {frankfurter,
## pastry,
## sausage} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [15495] {frankfurter,
## pastry,
## whole_milk} => {sausage} 0.001016777 0.2564103 0.003965430 2.7292152 10
## [15496] {frankfurter,
## sausage,
## whole_milk} => {pastry} 0.001016777 0.2857143 0.003558719 3.2114286 10
## [15497] {frankfurter,
## pastry,
## soda} => {other_vegetables} 0.001118454 0.4400000 0.002541942 2.2739884 11
## [15498] {frankfurter,
## other_vegetables,
## pastry} => {soda} 0.001118454 0.3793103 0.002948653 2.1752287 11
## [15499] {frankfurter,
## other_vegetables,
## soda} => {pastry} 0.001118454 0.3437500 0.003253686 3.8637500 11
## [15500] {other_vegetables,
## pastry,
## soda} => {frankfurter} 0.001118454 0.2037037 0.005490595 3.4541826 11
## [15501] {frankfurter,
## pastry,
## soda} => {whole_milk} 0.001220132 0.4800000 0.002541942 1.8785515 12
## [15502] {frankfurter,
## pastry,
## whole_milk} => {soda} 0.001220132 0.3076923 0.003965430 1.7645212 12
## [15503] {frankfurter,
## soda,
## whole_milk} => {pastry} 0.001220132 0.3636364 0.003355363 4.0872727 12
## [15504] {frankfurter,
## pastry,
## yogurt} => {rolls/buns} 0.001118454 0.4074074 0.002745297 2.2149540 11
## [15505] {frankfurter,
## pastry,
## rolls/buns} => {yogurt} 0.001118454 0.3928571 0.002846975 2.8161443 11
## [15506] {frankfurter,
## rolls/buns,
## yogurt} => {pastry} 0.001118454 0.2682927 0.004168785 3.0156098 11
## [15507] {frankfurter,
## pastry,
## yogurt} => {other_vegetables} 0.001220132 0.4444444 0.002745297 2.2969580 12
## [15508] {frankfurter,
## other_vegetables,
## pastry} => {yogurt} 0.001220132 0.4137931 0.002948653 2.9662210 12
## [15509] {frankfurter,
## other_vegetables,
## yogurt} => {pastry} 0.001220132 0.2500000 0.004880529 2.8100000 12
## [15510] {frankfurter,
## pastry,
## yogurt} => {whole_milk} 0.001728521 0.6296296 0.002745297 2.4641494 17
## [15511] {frankfurter,
## pastry,
## whole_milk} => {yogurt} 0.001728521 0.4358974 0.003965430 3.1246729 17
## [15512] {frankfurter,
## whole_milk,
## yogurt} => {pastry} 0.001728521 0.2786885 0.006202339 3.1324590 17
## [15513] {frankfurter,
## pastry,
## rolls/buns} => {other_vegetables} 0.001220132 0.4285714 0.002846975 2.2149238 12
## [15514] {frankfurter,
## other_vegetables,
## pastry} => {rolls/buns} 0.001220132 0.4137931 0.002948653 2.2496712 12
## [15515] {frankfurter,
## other_vegetables,
## rolls/buns} => {pastry} 0.001220132 0.2181818 0.005592272 2.4523636 12
## [15516] {other_vegetables,
## pastry,
## rolls/buns} => {frankfurter} 0.001220132 0.2000000 0.006100661 3.3913793 12
## [15517] {frankfurter,
## pastry,
## rolls/buns} => {whole_milk} 0.001321810 0.4642857 0.002846975 1.8170513 13
## [15518] {frankfurter,
## pastry,
## whole_milk} => {rolls/buns} 0.001321810 0.3333333 0.003965430 1.8122351 13
## [15519] {frankfurter,
## rolls/buns,
## whole_milk} => {pastry} 0.001321810 0.2203390 0.005998983 2.4766102 13
## [15520] {frankfurter,
## other_vegetables,
## pastry} => {whole_milk} 0.001423488 0.4827586 0.002948653 1.8893478 14
## [15521] {frankfurter,
## pastry,
## whole_milk} => {other_vegetables} 0.001423488 0.3589744 0.003965430 1.8552353 14
## [15522] {citrus_fruit,
## frankfurter,
## tropical_fruit} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [15523] {citrus_fruit,
## frankfurter,
## whole_milk} => {tropical_fruit} 0.001016777 0.3225806 0.003152008 3.0742061 10
## [15524] {citrus_fruit,
## frankfurter,
## root_vegetables} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [15525] {citrus_fruit,
## frankfurter,
## other_vegetables} => {root_vegetables} 0.001220132 0.4137931 0.002948653 3.7963201 12
## [15526] {frankfurter,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001220132 0.3076923 0.003965430 3.7176337 12
## [15527] {citrus_fruit,
## frankfurter,
## root_vegetables} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [15528] {citrus_fruit,
## frankfurter,
## whole_milk} => {root_vegetables} 0.001016777 0.3225806 0.003152008 2.9594969 10
## [15529] {frankfurter,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001016777 0.2000000 0.005083884 2.4164619 10
## [15530] {citrus_fruit,
## frankfurter,
## yogurt} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [15531] {citrus_fruit,
## frankfurter,
## other_vegetables} => {yogurt} 0.001016777 0.3448276 0.002948653 2.4718508 10
## [15532] {frankfurter,
## other_vegetables,
## yogurt} => {citrus_fruit} 0.001016777 0.2083333 0.004880529 2.5171478 10
## [15533] {citrus_fruit,
## frankfurter,
## yogurt} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [15534] {citrus_fruit,
## frankfurter,
## whole_milk} => {yogurt} 0.001220132 0.3870968 0.003152008 2.7748519 12
## [15535] {citrus_fruit,
## frankfurter,
## rolls/buns} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [15536] {citrus_fruit,
## frankfurter,
## whole_milk} => {rolls/buns} 0.001118454 0.3548387 0.003152008 1.9291535 11
## [15537] {citrus_fruit,
## frankfurter,
## other_vegetables} => {whole_milk} 0.001728521 0.5862069 0.002948653 2.2942080 17
## [15538] {citrus_fruit,
## frankfurter,
## whole_milk} => {other_vegetables} 0.001728521 0.5483871 0.003152008 2.8341498 17
## [15539] {frankfurter,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001728521 0.2266667 0.007625826 2.7386568 17
## [15540] {frankfurter,
## root_vegetables,
## shopping_bags} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [15541] {frankfurter,
## shopping_bags,
## whole_milk} => {root_vegetables} 0.001016777 0.3846154 0.002643620 3.5286309 10
## [15542] {frankfurter,
## root_vegetables,
## whole_milk} => {shopping_bags} 0.001016777 0.2000000 0.005083884 2.0299278 10
## [15543] {frankfurter,
## shopping_bags,
## soda} => {rolls/buns} 0.001016777 0.4166667 0.002440264 2.2652939 10
## [15544] {frankfurter,
## rolls/buns,
## shopping_bags} => {soda} 0.001016777 0.3225806 0.003152008 1.8499013 10
## [15545] {frankfurter,
## rolls/buns,
## soda} => {shopping_bags} 0.001016777 0.2631579 0.003863752 2.6709576 10
## [15546] {frankfurter,
## other_vegetables,
## shopping_bags} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [15547] {frankfurter,
## shopping_bags,
## whole_milk} => {other_vegetables} 0.001118454 0.4230769 0.002643620 2.1865273 11
## [15548] {frankfurter,
## sausage,
## tropical_fruit} => {root_vegetables} 0.001016777 0.5000000 0.002033554 4.5872201 10
## [15549] {frankfurter,
## root_vegetables,
## sausage} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [15550] {frankfurter,
## root_vegetables,
## tropical_fruit} => {sausage} 0.001016777 0.3703704 0.002745297 3.9421998 10
## [15551] {root_vegetables,
## sausage,
## tropical_fruit} => {frankfurter} 0.001016777 0.2857143 0.003558719 4.8448276 10
## [15552] {frankfurter,
## sausage,
## tropical_fruit} => {whole_milk} 0.001423488 0.7000000 0.002033554 2.7395543 14
## [15553] {frankfurter,
## sausage,
## whole_milk} => {tropical_fruit} 0.001423488 0.4000000 0.003558719 3.8120155 14
## [15554] {frankfurter,
## tropical_fruit,
## whole_milk} => {sausage} 0.001423488 0.2745098 0.005185562 2.9218657 14
## [15555] {frankfurter,
## root_vegetables,
## sausage} => {yogurt} 0.001321810 0.5200000 0.002541942 3.7275510 13
## [15556] {frankfurter,
## sausage,
## yogurt} => {root_vegetables} 0.001321810 0.5416667 0.002440264 4.9694885 13
## [15557] {frankfurter,
## root_vegetables,
## yogurt} => {sausage} 0.001321810 0.4062500 0.003253686 4.3241004 13
## [15558] {root_vegetables,
## sausage,
## yogurt} => {frankfurter} 0.001321810 0.2549020 0.005185562 4.3223462 13
## [15559] {frankfurter,
## root_vegetables,
## sausage} => {rolls/buns} 0.001423488 0.5600000 0.002541942 3.0445550 14
## [15560] {frankfurter,
## rolls/buns,
## sausage} => {root_vegetables} 0.001423488 0.3684211 0.003863752 3.3800570 14
## [15561] {frankfurter,
## rolls/buns,
## root_vegetables} => {sausage} 0.001423488 0.4117647 0.003457041 4.3827986 14
## [15562] {rolls/buns,
## root_vegetables,
## sausage} => {frankfurter} 0.001423488 0.2857143 0.004982206 4.8448276 14
## [15563] {frankfurter,
## root_vegetables,
## sausage} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [15564] {frankfurter,
## sausage,
## whole_milk} => {root_vegetables} 0.001423488 0.4000000 0.003558719 3.6697761 14
## [15565] {frankfurter,
## root_vegetables,
## whole_milk} => {sausage} 0.001423488 0.2800000 0.005083884 2.9803030 14
## [15566] {frankfurter,
## sausage,
## yogurt} => {rolls/buns} 0.001118454 0.4583333 0.002440264 2.4918233 11
## [15567] {frankfurter,
## rolls/buns,
## sausage} => {yogurt} 0.001118454 0.2894737 0.003863752 2.0750537 11
## [15568] {frankfurter,
## rolls/buns,
## yogurt} => {sausage} 0.001118454 0.2682927 0.004168785 2.8556911 11
## [15569] {frankfurter,
## sausage,
## yogurt} => {whole_milk} 0.001525165 0.6250000 0.002440264 2.4460306 15
## [15570] {frankfurter,
## sausage,
## whole_milk} => {yogurt} 0.001525165 0.4285714 0.003558719 3.0721574 15
## [15571] {frankfurter,
## whole_milk,
## yogurt} => {sausage} 0.001525165 0.2459016 0.006202339 2.6173621 15
## [15572] {frankfurter,
## rolls/buns,
## sausage} => {other_vegetables} 0.001525165 0.3947368 0.003863752 2.0400614 15
## [15573] {frankfurter,
## other_vegetables,
## sausage} => {rolls/buns} 0.001525165 0.4838710 0.003152008 2.6306639 15
## [15574] {frankfurter,
## other_vegetables,
## rolls/buns} => {sausage} 0.001525165 0.2727273 0.005592272 2.9028926 15
## [15575] {frankfurter,
## rolls/buns,
## sausage} => {whole_milk} 0.001321810 0.3421053 0.003863752 1.3388799 13
## [15576] {frankfurter,
## sausage,
## whole_milk} => {rolls/buns} 0.001321810 0.3714286 0.003558719 2.0193477 13
## [15577] {frankfurter,
## rolls/buns,
## whole_milk} => {sausage} 0.001321810 0.2203390 0.005998983 2.3452748 13
## [15578] {frankfurter,
## other_vegetables,
## sausage} => {whole_milk} 0.001118454 0.3548387 0.003152008 1.3887142 11
## [15579] {frankfurter,
## sausage,
## whole_milk} => {other_vegetables} 0.001118454 0.3142857 0.003558719 1.6242775 11
## [15580] {bottled_water,
## frankfurter,
## soda} => {yogurt} 0.001321810 0.5652174 0.002338587 4.0516859 13
## [15581] {bottled_water,
## frankfurter,
## yogurt} => {soda} 0.001321810 0.5909091 0.002236909 3.3886827 13
## [15582] {frankfurter,
## soda,
## yogurt} => {bottled_water} 0.001321810 0.4642857 0.002846975 4.2007820 13
## [15583] {bottled_water,
## frankfurter,
## soda} => {rolls/buns} 0.001118454 0.4782609 0.002338587 2.6001634 11
## [15584] {bottled_water,
## frankfurter,
## rolls/buns} => {soda} 0.001118454 0.3666667 0.003050330 2.1027211 11
## [15585] {frankfurter,
## rolls/buns,
## soda} => {bottled_water} 0.001118454 0.2894737 0.003863752 2.6191110 11
## [15586] {bottled_water,
## frankfurter,
## rolls/buns} => {other_vegetables} 0.001016777 0.3333333 0.003050330 1.7227185 10
## [15587] {bottled_water,
## frankfurter,
## other_vegetables} => {rolls/buns} 0.001016777 0.5555556 0.001830198 3.0203919 10
## [15588] {bottled_water,
## frankfurter,
## rolls/buns} => {whole_milk} 0.001016777 0.3333333 0.003050330 1.3045497 10
## [15589] {bottled_water,
## frankfurter,
## whole_milk} => {rolls/buns} 0.001016777 0.3846154 0.002643620 2.0910405 10
## [15590] {frankfurter,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001321810 0.4814815 0.002745297 3.4514361 13
## [15591] {frankfurter,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001321810 0.4482759 0.002948653 4.1126801 13
## [15592] {frankfurter,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001321810 0.4062500 0.003253686 3.8715782 13
## [15593] {frankfurter,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001321810 0.4814815 0.002745297 2.4883712 13
## [15594] {frankfurter,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001321810 0.3333333 0.003965430 3.0581468 13
## [15595] {frankfurter,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001321810 0.3333333 0.003965430 3.1766796 13
## [15596] {frankfurter,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.002033554 0.7407407 0.002745297 2.8989993 20
## [15597] {frankfurter,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.002033554 0.3921569 0.005185562 3.5978197 20
## [15598] {frankfurter,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.002033554 0.4000000 0.005083884 3.8120155 20
## [15599] {frankfurter,
## soda,
## tropical_fruit} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [15600] {frankfurter,
## other_vegetables,
## tropical_fruit} => {soda} 0.001016777 0.2564103 0.003965430 1.4704343 10
## [15601] {frankfurter,
## other_vegetables,
## soda} => {tropical_fruit} 0.001016777 0.3125000 0.003253686 2.9781371 10
## [15602] {frankfurter,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001016777 0.3448276 0.002948653 1.8747260 10
## [15603] {frankfurter,
## rolls/buns,
## tropical_fruit} => {yogurt} 0.001016777 0.3448276 0.002948653 2.4718508 10
## [15604] {frankfurter,
## rolls/buns,
## yogurt} => {tropical_fruit} 0.001016777 0.2439024 0.004168785 2.3243997 10
## [15605] {frankfurter,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001728521 0.5862069 0.002948653 3.0296084 17
## [15606] {frankfurter,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001728521 0.4358974 0.003965430 3.1246729 17
## [15607] {frankfurter,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001728521 0.3541667 0.004880529 3.3752221 17
## [15608] {frankfurter,
## tropical_fruit,
## yogurt} => {whole_milk} 0.002135231 0.7241379 0.002948653 2.8340217 21
## [15609] {frankfurter,
## tropical_fruit,
## whole_milk} => {yogurt} 0.002135231 0.4117647 0.005185562 2.9516807 21
## [15610] {frankfurter,
## whole_milk,
## yogurt} => {tropical_fruit} 0.002135231 0.3442623 0.006202339 3.2808330 21
## [15611] {frankfurter,
## rolls/buns,
## tropical_fruit} => {other_vegetables} 0.001220132 0.4137931 0.002948653 2.1385471 12
## [15612] {frankfurter,
## other_vegetables,
## tropical_fruit} => {rolls/buns} 0.001220132 0.3076923 0.003965430 1.6728324 12
## [15613] {frankfurter,
## other_vegetables,
## rolls/buns} => {tropical_fruit} 0.001220132 0.2181818 0.005592272 2.0792812 12
## [15614] {frankfurter,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001321810 0.4482759 0.002948653 1.7543944 13
## [15615] {frankfurter,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001321810 0.2549020 0.005185562 1.3858269 13
## [15616] {frankfurter,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001321810 0.2203390 0.005998983 2.0998390 13
## [15617] {frankfurter,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.002541942 0.6410256 0.003965430 2.5087494 25
## [15618] {frankfurter,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.002541942 0.4901961 0.005185562 2.5334096 25
## [15619] {frankfurter,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.002541942 0.3333333 0.007625826 3.1766796 25
## [15620] {frankfurter,
## root_vegetables,
## soda} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [15621] {frankfurter,
## root_vegetables,
## whole_milk} => {soda} 0.001016777 0.2000000 0.005083884 1.1469388 10
## [15622] {frankfurter,
## soda,
## whole_milk} => {root_vegetables} 0.001016777 0.3030303 0.003355363 2.7801334 10
## [15623] {frankfurter,
## root_vegetables,
## yogurt} => {rolls/buns} 0.001525165 0.4687500 0.003253686 2.5484556 15
## [15624] {frankfurter,
## rolls/buns,
## root_vegetables} => {yogurt} 0.001525165 0.4411765 0.003457041 3.1625150 15
## [15625] {frankfurter,
## rolls/buns,
## yogurt} => {root_vegetables} 0.001525165 0.3658537 0.004168785 3.3565025 15
## [15626] {rolls/buns,
## root_vegetables,
## yogurt} => {frankfurter} 0.001525165 0.2112676 0.007219115 3.5824429 15
## [15627] {frankfurter,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001728521 0.5312500 0.003253686 2.7455826 17
## [15628] {frankfurter,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001728521 0.4358974 0.003965430 3.1246729 17
## [15629] {frankfurter,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001728521 0.3541667 0.004880529 3.2492809 17
## [15630] {frankfurter,
## root_vegetables,
## yogurt} => {whole_milk} 0.002338587 0.7187500 0.003253686 2.8129352 23
## [15631] {frankfurter,
## root_vegetables,
## whole_milk} => {yogurt} 0.002338587 0.4600000 0.005083884 3.2974490 23
## [15632] {frankfurter,
## whole_milk,
## yogurt} => {root_vegetables} 0.002338587 0.3770492 0.006202339 3.4592152 23
## [15633] {frankfurter,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001321810 0.3823529 0.003457041 1.9760595 13
## [15634] {frankfurter,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001321810 0.3333333 0.003965430 1.8122351 13
## [15635] {frankfurter,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001321810 0.2363636 0.005592272 2.1685041 13
## [15636] {frankfurter,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001525165 0.4411765 0.003457041 1.7266099 15
## [15637] {frankfurter,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001525165 0.3000000 0.005083884 1.6310116 15
## [15638] {frankfurter,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001525165 0.2542373 0.005998983 2.3324848 15
## [15639] {frankfurter,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.002236909 0.5641026 0.003965430 2.2076995 22
## [15640] {frankfurter,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.002236909 0.4400000 0.005083884 2.2739884 22
## [15641] {frankfurter,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.002236909 0.2933333 0.007625826 2.6911692 22
## [15642] {frankfurter,
## soda,
## yogurt} => {rolls/buns} 0.001118454 0.3928571 0.002846975 2.1358485 11
## [15643] {frankfurter,
## rolls/buns,
## soda} => {yogurt} 0.001118454 0.2894737 0.003863752 2.0750537 11
## [15644] {frankfurter,
## rolls/buns,
## yogurt} => {soda} 0.001118454 0.2682927 0.004168785 1.5385764 11
## [15645] {frankfurter,
## soda,
## yogurt} => {whole_milk} 0.001525165 0.5357143 0.002846975 2.0965977 15
## [15646] {frankfurter,
## soda,
## whole_milk} => {yogurt} 0.001525165 0.4545455 0.003355363 3.2583488 15
## [15647] {frankfurter,
## whole_milk,
## yogurt} => {soda} 0.001525165 0.2459016 0.006202339 1.4101706 15
## [15648] {frankfurter,
## rolls/buns,
## soda} => {other_vegetables} 0.001321810 0.3421053 0.003863752 1.7680532 13
## [15649] {frankfurter,
## other_vegetables,
## soda} => {rolls/buns} 0.001321810 0.4062500 0.003253686 2.2086616 13
## [15650] {frankfurter,
## other_vegetables,
## rolls/buns} => {soda} 0.001321810 0.2363636 0.005592272 1.3554731 13
## [15651] {frankfurter,
## rolls/buns,
## soda} => {whole_milk} 0.001016777 0.2631579 0.003863752 1.0299076 10
## [15652] {frankfurter,
## soda,
## whole_milk} => {rolls/buns} 0.001016777 0.3030303 0.003355363 1.6474865 10
## [15653] {frankfurter,
## other_vegetables,
## soda} => {whole_milk} 0.001321810 0.4062500 0.003253686 1.5899199 13
## [15654] {frankfurter,
## soda,
## whole_milk} => {other_vegetables} 0.001321810 0.3939394 0.003355363 2.0359401 13
## [15655] {frankfurter,
## rolls/buns,
## yogurt} => {other_vegetables} 0.002236909 0.5365854 0.004168785 2.7731566 22
## [15656] {frankfurter,
## other_vegetables,
## yogurt} => {rolls/buns} 0.002236909 0.4583333 0.004880529 2.4918233 22
## [15657] {frankfurter,
## other_vegetables,
## rolls/buns} => {yogurt} 0.002236909 0.4000000 0.005592272 2.8673469 22
## [15658] {frankfurter,
## rolls/buns,
## yogurt} => {whole_milk} 0.002338587 0.5609756 0.004168785 2.1954616 23
## [15659] {frankfurter,
## whole_milk,
## yogurt} => {rolls/buns} 0.002338587 0.3770492 0.006202339 2.0499053 23
## [15660] {frankfurter,
## rolls/buns,
## whole_milk} => {yogurt} 0.002338587 0.3898305 0.005998983 2.7944483 23
## [15661] {frankfurter,
## other_vegetables,
## yogurt} => {whole_milk} 0.002846975 0.5833333 0.004880529 2.2829619 28
## [15662] {frankfurter,
## whole_milk,
## yogurt} => {other_vegetables} 0.002846975 0.4590164 0.006202339 2.3722681 28
## [15663] {frankfurter,
## other_vegetables,
## whole_milk} => {yogurt} 0.002846975 0.3733333 0.007625826 2.6761905 28
## [15664] {frankfurter,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.002440264 0.4363636 0.005592272 1.7077741 24
## [15665] {frankfurter,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.002440264 0.4067797 0.005998983 2.1023006 24
## [15666] {frankfurter,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.002440264 0.3200000 0.007625826 1.7397457 24
## [15667] {bottled_beer,
## domestic_eggs,
## margarine} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [15668] {bottled_beer,
## margarine,
## whole_milk} => {domestic_eggs} 0.001016777 0.3333333 0.003050330 5.2537393 10
## [15669] {bottled_beer,
## domestic_eggs,
## whole_milk} => {margarine} 0.001016777 0.3448276 0.002948653 5.8878113 10
## [15670] {bottled_beer,
## bottled_water,
## margarine} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [15671] {bottled_beer,
## margarine,
## whole_milk} => {bottled_water} 0.001016777 0.3333333 0.003050330 3.0159460 10
## [15672] {bottled_water,
## margarine,
## whole_milk} => {bottled_beer} 0.001016777 0.2040816 0.004982206 2.5342713 10
## [15673] {bottled_beer,
## margarine,
## rolls/buns} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [15674] {bottled_beer,
## margarine,
## whole_milk} => {rolls/buns} 0.001016777 0.3333333 0.003050330 1.8122351 10
## [15675] {bottled_beer,
## margarine,
## other_vegetables} => {whole_milk} 0.001728521 0.6296296 0.002745297 2.4641494 17
## [15676] {bottled_beer,
## margarine,
## whole_milk} => {other_vegetables} 0.001728521 0.5666667 0.003050330 2.9286215 17
## [15677] {bottled_beer,
## other_vegetables,
## whole_milk} => {margarine} 0.001728521 0.2266667 0.007625826 3.8702546 17
## [15678] {bottled_beer,
## bottled_water,
## butter} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [15679] {bottled_beer,
## butter,
## whole_milk} => {bottled_water} 0.001321810 0.4062500 0.003253686 3.6756842 13
## [15680] {bottled_beer,
## bottled_water,
## whole_milk} => {butter} 0.001321810 0.2166667 0.006100661 3.9099388 13
## [15681] {bottled_water,
## butter,
## whole_milk} => {bottled_beer} 0.001321810 0.2452830 0.005388917 3.0459072 13
## [15682] {bottled_beer,
## butter,
## root_vegetables} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [15683] {bottled_beer,
## butter,
## whole_milk} => {root_vegetables} 0.001016777 0.3125000 0.003253686 2.8670126 10
## [15684] {bottled_beer,
## root_vegetables,
## whole_milk} => {butter} 0.001016777 0.2564103 0.003965430 4.6271466 10
## [15685] {bottled_beer,
## butter,
## yogurt} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [15686] {bottled_beer,
## butter,
## whole_milk} => {yogurt} 0.001118454 0.3437500 0.003253686 2.4641263 11
## [15687] {bottled_beer,
## whole_milk,
## yogurt} => {butter} 0.001118454 0.2156863 0.005185562 3.8922468 11
## [15688] {bottled_beer,
## butter,
## rolls/buns} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [15689] {bottled_beer,
## butter,
## whole_milk} => {rolls/buns} 0.001321810 0.4062500 0.003253686 2.2086616 13
## [15690] {bottled_beer,
## rolls/buns,
## whole_milk} => {butter} 0.001321810 0.2452830 0.005388917 4.4263459 13
## [15691] {butter,
## rolls/buns,
## whole_milk} => {bottled_beer} 0.001321810 0.2000000 0.006609049 2.4835859 13
## [15692] {bottled_beer,
## butter,
## other_vegetables} => {whole_milk} 0.001728521 0.7727273 0.002236909 3.0241833 17
## [15693] {bottled_beer,
## butter,
## whole_milk} => {other_vegetables} 0.001728521 0.5312500 0.003253686 2.7455826 17
## [15694] {bottled_beer,
## other_vegetables,
## whole_milk} => {butter} 0.001728521 0.2266667 0.007625826 4.0903976 17
## [15695] {bottled_beer,
## newspapers,
## other_vegetables} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [15696] {bottled_beer,
## newspapers,
## whole_milk} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [15697] {bottled_beer,
## bottled_water,
## domestic_eggs} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [15698] {bottled_beer,
## domestic_eggs,
## other_vegetables} => {bottled_water} 0.001220132 0.4615385 0.002643620 4.1759253 12
## [15699] {bottled_beer,
## bottled_water,
## other_vegetables} => {domestic_eggs} 0.001220132 0.2926829 0.004168785 4.6130394 12
## [15700] {bottled_water,
## domestic_eggs,
## other_vegetables} => {bottled_beer} 0.001220132 0.3000000 0.004067107 3.7253788 12
## [15701] {bottled_beer,
## bottled_water,
## domestic_eggs} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [15702] {bottled_beer,
## domestic_eggs,
## whole_milk} => {bottled_water} 0.001118454 0.3793103 0.002948653 3.4319386 11
## [15703] {bottled_water,
## domestic_eggs,
## whole_milk} => {bottled_beer} 0.001118454 0.2291667 0.004880529 2.8457755 11
## [15704] {bottled_beer,
## domestic_eggs,
## yogurt} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [15705] {bottled_beer,
## domestic_eggs,
## other_vegetables} => {yogurt} 0.001016777 0.3846154 0.002643620 2.7570644 10
## [15706] {bottled_beer,
## other_vegetables,
## yogurt} => {domestic_eggs} 0.001016777 0.2777778 0.003660397 4.3781161 10
## [15707] {bottled_beer,
## domestic_eggs,
## other_vegetables} => {whole_milk} 0.002033554 0.7692308 0.002643620 3.0104993 20
## [15708] {bottled_beer,
## domestic_eggs,
## whole_milk} => {other_vegetables} 0.002033554 0.6896552 0.002948653 3.5642452 20
## [15709] {bottled_beer,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.002033554 0.2666667 0.007625826 4.2029915 20
## [15710] {bottled_beer,
## bottled_water,
## fruit/vegetable_juice} => {soda} 0.001118454 0.4400000 0.002541942 2.5232653 11
## [15711] {bottled_beer,
## fruit/vegetable_juice,
## soda} => {bottled_water} 0.001118454 0.4074074 0.002745297 3.6861563 11
## [15712] {bottled_beer,
## bottled_water,
## soda} => {fruit/vegetable_juice} 0.001118454 0.2200000 0.005083884 3.0431786 11
## [15713] {bottled_water,
## fruit/vegetable_juice,
## soda} => {bottled_beer} 0.001118454 0.2156863 0.005185562 2.6783769 11
## [15714] {bottled_beer,
## fruit/vegetable_juice,
## yogurt} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [15715] {bottled_beer,
## fruit/vegetable_juice,
## other_vegetables} => {yogurt} 0.001118454 0.4400000 0.002541942 3.1540816 11
## [15716] {bottled_beer,
## other_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.3055556 0.003660397 4.2266370 11
## [15717] {bottled_beer,
## fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [15718] {bottled_beer,
## fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.001220132 0.4137931 0.002948653 2.9662210 12
## [15719] {bottled_beer,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001220132 0.2352941 0.005185562 3.2547365 12
## [15720] {bottled_beer,
## fruit/vegetable_juice,
## other_vegetables} => {whole_milk} 0.001728521 0.6800000 0.002541942 2.6612813 17
## [15721] {bottled_beer,
## fruit/vegetable_juice,
## whole_milk} => {other_vegetables} 0.001728521 0.5862069 0.002948653 3.0296084 17
## [15722] {bottled_beer,
## other_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001728521 0.2266667 0.007625826 3.1353962 17
## [15723] {bottled_beer,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [15724] {bottled_beer,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001118454 0.5238095 0.002135231 3.7548591 11
## [15725] {bottled_beer,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3055556 0.003660397 4.2626084 11
## [15726] {bottled_beer,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [15727] {bottled_beer,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [15728] {bottled_beer,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [15729] {bottled_beer,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001016777 0.5263158 0.001931876 5.0158099 10
## [15730] {bottled_beer,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001016777 0.3125000 0.003253686 4.1309644 10
## [15731] {bottled_beer,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [15732] {bottled_beer,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001118454 0.4583333 0.002440264 4.2049518 11
## [15733] {bottled_beer,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001118454 0.2820513 0.003965430 3.7284602 11
## [15734] {bottled_beer,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [15735] {bottled_beer,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [15736] {bottled_beer,
## bottled_water,
## citrus_fruit} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [15737] {bottled_beer,
## citrus_fruit,
## other_vegetables} => {bottled_water} 0.001016777 0.4000000 0.002541942 3.6191352 10
## [15738] {bottled_beer,
## bottled_water,
## other_vegetables} => {citrus_fruit} 0.001016777 0.2439024 0.004168785 2.9469048 10
## [15739] {bottled_water,
## citrus_fruit,
## other_vegetables} => {bottled_beer} 0.001016777 0.2000000 0.005083884 2.4835859 10
## [15740] {bottled_beer,
## bottled_water,
## citrus_fruit} => {whole_milk} 0.001626843 0.7272727 0.002236909 2.8462902 16
## [15741] {bottled_beer,
## citrus_fruit,
## whole_milk} => {bottled_water} 0.001626843 0.4705882 0.003457041 4.2578062 16
## [15742] {bottled_beer,
## bottled_water,
## whole_milk} => {citrus_fruit} 0.001626843 0.2666667 0.006100661 3.2219492 16
## [15743] {bottled_water,
## citrus_fruit,
## whole_milk} => {bottled_beer} 0.001626843 0.2758621 0.005897306 3.4256357 16
## [15744] {bottled_beer,
## citrus_fruit,
## root_vegetables} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [15745] {bottled_beer,
## citrus_fruit,
## other_vegetables} => {root_vegetables} 0.001118454 0.4400000 0.002541942 4.0367537 11
## [15746] {bottled_beer,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001118454 0.2619048 0.004270463 3.1644144 11
## [15747] {bottled_beer,
## citrus_fruit,
## root_vegetables} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [15748] {bottled_beer,
## citrus_fruit,
## whole_milk} => {root_vegetables} 0.001118454 0.3235294 0.003457041 2.9682013 11
## [15749] {bottled_beer,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001118454 0.2820513 0.003965430 3.4078309 11
## [15750] {bottled_beer,
## citrus_fruit,
## rolls/buns} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [15751] {bottled_beer,
## citrus_fruit,
## whole_milk} => {rolls/buns} 0.001220132 0.3529412 0.003457041 1.9188372 12
## [15752] {bottled_beer,
## rolls/buns,
## whole_milk} => {citrus_fruit} 0.001220132 0.2264151 0.005388917 2.7356173 12
## [15753] {bottled_beer,
## citrus_fruit,
## other_vegetables} => {whole_milk} 0.001728521 0.6800000 0.002541942 2.6612813 17
## [15754] {bottled_beer,
## citrus_fruit,
## whole_milk} => {other_vegetables} 0.001728521 0.5000000 0.003457041 2.5840778 17
## [15755] {bottled_beer,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001728521 0.2266667 0.007625826 2.7386568 17
## [15756] {bottled_beer,
## bottled_water,
## sausage} => {soda} 0.001118454 0.7333333 0.001525165 4.2054422 11
## [15757] {bottled_beer,
## sausage,
## soda} => {bottled_water} 0.001118454 0.5000000 0.002236909 4.5239190 11
## [15758] {bottled_beer,
## bottled_water,
## soda} => {sausage} 0.001118454 0.2200000 0.005083884 2.3416667 11
## [15759] {bottled_water,
## sausage,
## soda} => {bottled_beer} 0.001118454 0.2750000 0.004067107 3.4149306 11
## [15760] {bottled_beer,
## bottled_water,
## tropical_fruit} => {soda} 0.001118454 0.4230769 0.002643620 2.4262166 11
## [15761] {bottled_beer,
## bottled_water,
## soda} => {tropical_fruit} 0.001118454 0.2200000 0.005083884 2.0966085 11
## [15762] {bottled_beer,
## soda,
## tropical_fruit} => {bottled_water} 0.001118454 0.4074074 0.002745297 3.6861563 11
## [15763] {bottled_water,
## soda,
## tropical_fruit} => {bottled_beer} 0.001118454 0.2156863 0.005185562 2.6783769 11
## [15764] {bottled_beer,
## bottled_water,
## root_vegetables} => {other_vegetables} 0.001321810 0.5200000 0.002541942 2.6874409 13
## [15765] {bottled_beer,
## bottled_water,
## other_vegetables} => {root_vegetables} 0.001321810 0.3170732 0.004168785 2.9089689 13
## [15766] {bottled_beer,
## other_vegetables,
## root_vegetables} => {bottled_water} 0.001321810 0.3095238 0.004270463 2.8005213 13
## [15767] {bottled_beer,
## bottled_water,
## root_vegetables} => {whole_milk} 0.001118454 0.4400000 0.002541942 1.7220056 11
## [15768] {bottled_beer,
## root_vegetables,
## whole_milk} => {bottled_water} 0.001118454 0.2820513 0.003965430 2.5519543 11
## [15769] {bottled_beer,
## bottled_water,
## soda} => {rolls/buns} 0.001016777 0.2000000 0.005083884 1.0873411 10
## [15770] {bottled_beer,
## bottled_water,
## rolls/buns} => {soda} 0.001016777 0.3448276 0.002948653 1.9774806 10
## [15771] {bottled_beer,
## rolls/buns,
## soda} => {bottled_water} 0.001016777 0.3448276 0.002948653 3.1199442 10
## [15772] {bottled_beer,
## bottled_water,
## soda} => {other_vegetables} 0.001016777 0.2000000 0.005083884 1.0336311 10
## [15773] {bottled_beer,
## bottled_water,
## other_vegetables} => {soda} 0.001016777 0.2439024 0.004168785 1.3987058 10
## [15774] {bottled_beer,
## other_vegetables,
## soda} => {bottled_water} 0.001016777 0.2500000 0.004067107 2.2619595 10
## [15775] {bottled_beer,
## bottled_water,
## soda} => {whole_milk} 0.001118454 0.2200000 0.005083884 0.8610028 11
## [15776] {bottled_beer,
## soda,
## whole_milk} => {bottled_water} 0.001118454 0.3055556 0.003660397 2.7646172 11
## [15777] {bottled_beer,
## bottled_water,
## yogurt} => {other_vegetables} 0.001016777 0.3571429 0.002846975 1.8457698 10
## [15778] {bottled_beer,
## bottled_water,
## other_vegetables} => {yogurt} 0.001016777 0.2439024 0.004168785 1.7483823 10
## [15779] {bottled_beer,
## other_vegetables,
## yogurt} => {bottled_water} 0.001016777 0.2777778 0.003660397 2.5132884 10
## [15780] {bottled_beer,
## bottled_water,
## yogurt} => {whole_milk} 0.001626843 0.5714286 0.002846975 2.2363709 16
## [15781] {bottled_beer,
## bottled_water,
## whole_milk} => {yogurt} 0.001626843 0.2666667 0.006100661 1.9115646 16
## [15782] {bottled_beer,
## whole_milk,
## yogurt} => {bottled_water} 0.001626843 0.3137255 0.005185562 2.8385374 16
## [15783] {bottled_beer,
## bottled_water,
## rolls/buns} => {other_vegetables} 0.001220132 0.4137931 0.002948653 2.1385471 12
## [15784] {bottled_beer,
## bottled_water,
## other_vegetables} => {rolls/buns} 0.001220132 0.2926829 0.004168785 1.5912308 12
## [15785] {bottled_beer,
## other_vegetables,
## rolls/buns} => {bottled_water} 0.001220132 0.3000000 0.004067107 2.7143514 12
## [15786] {bottled_beer,
## bottled_water,
## rolls/buns} => {whole_milk} 0.001525165 0.5172414 0.002948653 2.0243012 15
## [15787] {bottled_beer,
## bottled_water,
## whole_milk} => {rolls/buns} 0.001525165 0.2500000 0.006100661 1.3591763 15
## [15788] {bottled_beer,
## rolls/buns,
## whole_milk} => {bottled_water} 0.001525165 0.2830189 0.005388917 2.5607089 15
## [15789] {bottled_beer,
## bottled_water,
## other_vegetables} => {whole_milk} 0.002440264 0.5853659 0.004168785 2.2909165 24
## [15790] {bottled_beer,
## bottled_water,
## whole_milk} => {other_vegetables} 0.002440264 0.4000000 0.006100661 2.0672622 24
## [15791] {bottled_beer,
## other_vegetables,
## whole_milk} => {bottled_water} 0.002440264 0.3200000 0.007625826 2.8953082 24
## [15792] {bottled_water,
## other_vegetables,
## whole_milk} => {bottled_beer} 0.002440264 0.2264151 0.010777834 2.8116066 24
## [15793] {bottled_beer,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001321810 0.6500000 0.002033554 3.3593011 13
## [15794] {bottled_beer,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001321810 0.4062500 0.003253686 3.7271164 13
## [15795] {bottled_beer,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001321810 0.3095238 0.004270463 2.9497739 13
## [15796] {bottled_beer,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [15797] {bottled_beer,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001220132 0.3870968 0.003152008 3.5513962 12
## [15798] {bottled_beer,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001220132 0.3076923 0.003965430 2.9323196 12
## [15799] {bottled_beer,
## soda,
## tropical_fruit} => {other_vegetables} 0.001016777 0.3703704 0.002745297 1.9141317 10
## [15800] {bottled_beer,
## other_vegetables,
## tropical_fruit} => {soda} 0.001016777 0.3125000 0.003253686 1.7920918 10
## [15801] {bottled_beer,
## other_vegetables,
## soda} => {tropical_fruit} 0.001016777 0.2500000 0.004067107 2.3825097 10
## [15802] {bottled_beer,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001423488 0.6086957 0.002338587 3.1458338 14
## [15803] {bottled_beer,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001423488 0.4375000 0.003253686 3.1361607 14
## [15804] {bottled_beer,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001423488 0.3888889 0.003660397 3.7061262 14
## [15805] {bottled_beer,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001525165 0.6521739 0.002338587 2.5523798 15
## [15806] {bottled_beer,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001525165 0.4838710 0.003152008 3.4685648 15
## [15807] {bottled_beer,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001525165 0.2941176 0.005185562 2.8029526 15
## [15808] {bottled_beer,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [15809] {bottled_beer,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001220132 0.3870968 0.003152008 2.1045311 12
## [15810] {bottled_beer,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001220132 0.2264151 0.005388917 2.1577446 12
## [15811] {bottled_beer,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001728521 0.5312500 0.003253686 2.0791260 17
## [15812] {bottled_beer,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001728521 0.5483871 0.003152008 2.8341498 17
## [15813] {bottled_beer,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001728521 0.2266667 0.007625826 2.1601421 17
## [15814] {bottled_beer,
## root_vegetables,
## yogurt} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [15815] {bottled_beer,
## root_vegetables,
## whole_milk} => {yogurt} 0.001220132 0.3076923 0.003965430 2.2056515 12
## [15816] {bottled_beer,
## whole_milk,
## yogurt} => {root_vegetables} 0.001220132 0.2352941 0.005185562 2.1586918 12
## [15817] {bottled_beer,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001423488 0.5833333 0.002440264 3.0147574 14
## [15818] {bottled_beer,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001423488 0.3333333 0.004270463 1.8122351 14
## [15819] {bottled_beer,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001423488 0.3500000 0.004067107 3.2110541 14
## [15820] {bottled_beer,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [15821] {bottled_beer,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001118454 0.2820513 0.003965430 1.5334297 11
## [15822] {bottled_beer,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001118454 0.2075472 0.005388917 1.9041291 11
## [15823] {bottled_beer,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.002440264 0.5714286 0.004270463 2.2363709 24
## [15824] {bottled_beer,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.002440264 0.6153846 0.003965430 3.1804034 24
## [15825] {bottled_beer,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.002440264 0.3200000 0.007625826 2.9358209 24
## [15826] {bottled_beer,
## rolls/buns,
## soda} => {other_vegetables} 0.001220132 0.4137931 0.002948653 2.1385471 12
## [15827] {bottled_beer,
## other_vegetables,
## soda} => {rolls/buns} 0.001220132 0.3000000 0.004067107 1.6310116 12
## [15828] {bottled_beer,
## other_vegetables,
## rolls/buns} => {soda} 0.001220132 0.3000000 0.004067107 1.7204082 12
## [15829] {bottled_beer,
## rolls/buns,
## soda} => {whole_milk} 0.001118454 0.3793103 0.002948653 1.4844876 11
## [15830] {bottled_beer,
## soda,
## whole_milk} => {rolls/buns} 0.001118454 0.3055556 0.003660397 1.6612155 11
## [15831] {bottled_beer,
## rolls/buns,
## whole_milk} => {soda} 0.001118454 0.2075472 0.005388917 1.1902195 11
## [15832] {bottled_beer,
## other_vegetables,
## soda} => {whole_milk} 0.001626843 0.4000000 0.004067107 1.5654596 16
## [15833] {bottled_beer,
## soda,
## whole_milk} => {other_vegetables} 0.001626843 0.4444444 0.003660397 2.2969580 16
## [15834] {bottled_beer,
## other_vegetables,
## whole_milk} => {soda} 0.001626843 0.2133333 0.007625826 1.2234014 16
## [15835] {bottled_beer,
## rolls/buns,
## yogurt} => {whole_milk} 0.001728521 0.7391304 0.002338587 2.8926971 17
## [15836] {bottled_beer,
## whole_milk,
## yogurt} => {rolls/buns} 0.001728521 0.3333333 0.005185562 1.8122351 17
## [15837] {bottled_beer,
## rolls/buns,
## whole_milk} => {yogurt} 0.001728521 0.3207547 0.005388917 2.2992876 17
## [15838] {bottled_beer,
## other_vegetables,
## yogurt} => {whole_milk} 0.002643620 0.7222222 0.003660397 2.8265243 26
## [15839] {bottled_beer,
## whole_milk,
## yogurt} => {other_vegetables} 0.002643620 0.5098039 0.005185562 2.6347460 26
## [15840] {bottled_beer,
## other_vegetables,
## whole_milk} => {yogurt} 0.002643620 0.3466667 0.007625826 2.4850340 26
## [15841] {bottled_beer,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.002033554 0.5000000 0.004067107 1.9568245 20
## [15842] {bottled_beer,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.002033554 0.3773585 0.005388917 1.9502474 20
## [15843] {bottled_beer,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.002033554 0.2666667 0.007625826 1.4497881 20
## [15844] {brown_bread,
## margarine,
## rolls/buns} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [15845] {brown_bread,
## margarine,
## whole_milk} => {rolls/buns} 0.001016777 0.3333333 0.003050330 1.8122351 10
## [15846] {brown_bread,
## butter,
## sausage} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [15847] {brown_bread,
## butter,
## yogurt} => {sausage} 0.001016777 0.5555556 0.001830198 5.9132997 10
## [15848] {brown_bread,
## sausage,
## yogurt} => {butter} 0.001016777 0.2631579 0.003863752 4.7489136 10
## [15849] {butter,
## sausage,
## yogurt} => {brown_bread} 0.001016777 0.4000000 0.002541942 6.1661442 10
## [15850] {brown_bread,
## butter,
## sausage} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [15851] {brown_bread,
## butter,
## other_vegetables} => {sausage} 0.001118454 0.4782609 0.002338587 5.0905797 11
## [15852] {brown_bread,
## other_vegetables,
## sausage} => {butter} 0.001118454 0.2500000 0.004473818 4.5114679 11
## [15853] {butter,
## other_vegetables,
## sausage} => {brown_bread} 0.001118454 0.2894737 0.003863752 4.4623412 11
## [15854] {brown_bread,
## butter,
## yogurt} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [15855] {brown_bread,
## butter,
## whole_milk} => {yogurt} 0.001118454 0.3793103 0.002948653 2.7190359 11
## [15856] {brown_bread,
## butter,
## rolls/buns} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [15857] {brown_bread,
## butter,
## whole_milk} => {rolls/buns} 0.001016777 0.3448276 0.002948653 1.8747260 10
## [15858] {brown_bread,
## butter,
## other_vegetables} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [15859] {brown_bread,
## butter,
## whole_milk} => {other_vegetables} 0.001321810 0.4482759 0.002948653 2.3167594 13
## [15860] {brown_bread,
## newspapers,
## pastry} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [15861] {brown_bread,
## newspapers,
## whole_milk} => {pastry} 0.001118454 0.2750000 0.004067107 3.0910000 11
## [15862] {brown_bread,
## pastry,
## whole_milk} => {newspapers} 0.001118454 0.2340426 0.004778851 2.9322401 11
## [15863] {newspapers,
## pastry,
## whole_milk} => {brown_bread} 0.001118454 0.2894737 0.003863752 4.4623412 11
## [15864] {brown_bread,
## newspapers,
## yogurt} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [15865] {brown_bread,
## newspapers,
## whole_milk} => {yogurt} 0.001118454 0.2750000 0.004067107 1.9713010 11
## [15866] {brown_bread,
## newspapers,
## rolls/buns} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [15867] {brown_bread,
## newspapers,
## whole_milk} => {rolls/buns} 0.001016777 0.2500000 0.004067107 1.3591763 10
## [15868] {brown_bread,
## newspapers,
## other_vegetables} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [15869] {brown_bread,
## newspapers,
## whole_milk} => {other_vegetables} 0.001321810 0.3250000 0.004067107 1.6796506 13
## [15870] {brown_bread,
## domestic_eggs,
## root_vegetables} => {whole_milk} 0.001525165 0.8333333 0.001830198 3.2613742 15
## [15871] {brown_bread,
## domestic_eggs,
## whole_milk} => {root_vegetables} 0.001525165 0.3750000 0.004067107 3.4404151 15
## [15872] {brown_bread,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001525165 0.2678571 0.005693950 4.2217548 15
## [15873] {brown_bread,
## domestic_eggs,
## soda} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [15874] {brown_bread,
## domestic_eggs,
## other_vegetables} => {soda} 0.001016777 0.4000000 0.002541942 2.2938776 10
## [15875] {brown_bread,
## other_vegetables,
## soda} => {domestic_eggs} 0.001016777 0.2439024 0.004168785 3.8441995 10
## [15876] {domestic_eggs,
## other_vegetables,
## soda} => {brown_bread} 0.001016777 0.2000000 0.005083884 3.0830721 10
## [15877] {brown_bread,
## domestic_eggs,
## soda} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [15878] {brown_bread,
## domestic_eggs,
## whole_milk} => {soda} 0.001118454 0.2750000 0.004067107 1.5770408 11
## [15879] {brown_bread,
## soda,
## whole_milk} => {domestic_eggs} 0.001118454 0.2200000 0.005083884 3.4674679 11
## [15880] {domestic_eggs,
## soda,
## whole_milk} => {brown_bread} 0.001118454 0.2156863 0.005185562 3.3248817 11
## [15881] {brown_bread,
## domestic_eggs,
## rolls/buns} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [15882] {brown_bread,
## domestic_eggs,
## whole_milk} => {rolls/buns} 0.001016777 0.2500000 0.004067107 1.3591763 10
## [15883] {brown_bread,
## domestic_eggs,
## other_vegetables} => {whole_milk} 0.001728521 0.6800000 0.002541942 2.6612813 17
## [15884] {brown_bread,
## domestic_eggs,
## whole_milk} => {other_vegetables} 0.001728521 0.4250000 0.004067107 2.1964661 17
## [15885] {brown_bread,
## fruit/vegetable_juice,
## pip_fruit} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [15886] {brown_bread,
## fruit/vegetable_juice,
## other_vegetables} => {pip_fruit} 0.001016777 0.2941176 0.003457041 3.8879665 10
## [15887] {brown_bread,
## other_vegetables,
## pip_fruit} => {fruit/vegetable_juice} 0.001016777 0.2702703 0.003762074 3.7385487 10
## [15888] {fruit/vegetable_juice,
## other_vegetables,
## pip_fruit} => {brown_bread} 0.001016777 0.2325581 0.004372140 3.5849676 10
## [15889] {brown_bread,
## citrus_fruit,
## fruit/vegetable_juice} => {tropical_fruit} 0.001016777 0.6250000 0.001626843 5.9562742 10
## [15890] {brown_bread,
## fruit/vegetable_juice,
## tropical_fruit} => {citrus_fruit} 0.001016777 0.4000000 0.002541942 4.8329238 10
## [15891] {brown_bread,
## citrus_fruit,
## tropical_fruit} => {fruit/vegetable_juice} 0.001016777 0.4000000 0.002541942 5.5330520 10
## [15892] {citrus_fruit,
## fruit/vegetable_juice,
## tropical_fruit} => {brown_bread} 0.001016777 0.2564103 0.003965430 3.9526565 10
## [15893] {brown_bread,
## citrus_fruit,
## fruit/vegetable_juice} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [15894] {brown_bread,
## fruit/vegetable_juice,
## other_vegetables} => {citrus_fruit} 0.001016777 0.2941176 0.003457041 3.5536205 10
## [15895] {brown_bread,
## citrus_fruit,
## other_vegetables} => {fruit/vegetable_juice} 0.001016777 0.2941176 0.003457041 4.0684206 10
## [15896] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables} => {brown_bread} 0.001016777 0.2127660 0.004778851 3.2798639 10
## [15897] {brown_bread,
## fruit/vegetable_juice,
## sausage} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [15898] {brown_bread,
## fruit/vegetable_juice,
## yogurt} => {sausage} 0.001016777 0.3448276 0.002948653 3.6703239 10
## [15899] {brown_bread,
## sausage,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.2631579 0.003863752 3.6401658 10
## [15900] {fruit/vegetable_juice,
## sausage,
## yogurt} => {brown_bread} 0.001016777 0.3571429 0.002846975 5.5054859 10
## [15901] {brown_bread,
## fruit/vegetable_juice,
## tropical_fruit} => {root_vegetables} 0.001118454 0.4400000 0.002541942 4.0367537 11
## [15902] {brown_bread,
## fruit/vegetable_juice,
## root_vegetables} => {tropical_fruit} 0.001118454 0.5000000 0.002236909 4.7650194 11
## [15903] {brown_bread,
## root_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.001118454 0.4230769 0.002643620 5.8522666 11
## [15904] {fruit/vegetable_juice,
## root_vegetables,
## tropical_fruit} => {brown_bread} 0.001118454 0.3437500 0.003253686 5.2990302 11
## [15905] {brown_bread,
## fruit/vegetable_juice,
## tropical_fruit} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [15906] {brown_bread,
## fruit/vegetable_juice,
## yogurt} => {tropical_fruit} 0.001016777 0.3448276 0.002948653 3.2862203 10
## [15907] {brown_bread,
## tropical_fruit,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.2564103 0.003965430 3.5468282 10
## [15908] {fruit/vegetable_juice,
## tropical_fruit,
## yogurt} => {brown_bread} 0.001016777 0.2083333 0.004880529 3.2115334 10
## [15909] {brown_bread,
## fruit/vegetable_juice,
## tropical_fruit} => {other_vegetables} 0.001525165 0.6000000 0.002541942 3.1008933 15
## [15910] {brown_bread,
## fruit/vegetable_juice,
## other_vegetables} => {tropical_fruit} 0.001525165 0.4411765 0.003457041 4.2044289 15
## [15911] {brown_bread,
## other_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.001525165 0.3658537 0.004168785 5.0607183 15
## [15912] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit} => {brown_bread} 0.001525165 0.2307692 0.006609049 3.5573909 15
## [15913] {brown_bread,
## fruit/vegetable_juice,
## tropical_fruit} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [15914] {brown_bread,
## fruit/vegetable_juice,
## whole_milk} => {tropical_fruit} 0.001423488 0.3684211 0.003863752 3.5110669 14
## [15915] {brown_bread,
## tropical_fruit,
## whole_milk} => {fruit/vegetable_juice} 0.001423488 0.2500000 0.005693950 3.4581575 14
## [15916] {fruit/vegetable_juice,
## tropical_fruit,
## whole_milk} => {brown_bread} 0.001423488 0.2372881 0.005998983 3.6578822 14
## [15917] {brown_bread,
## fruit/vegetable_juice,
## root_vegetables} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [15918] {brown_bread,
## fruit/vegetable_juice,
## other_vegetables} => {root_vegetables} 0.001220132 0.3529412 0.003457041 3.2380378 12
## [15919] {brown_bread,
## other_vegetables,
## root_vegetables} => {fruit/vegetable_juice} 0.001220132 0.3000000 0.004067107 4.1497890 12
## [15920] {brown_bread,
## fruit/vegetable_juice,
## root_vegetables} => {whole_milk} 0.001525165 0.6818182 0.002236909 2.6683971 15
## [15921] {brown_bread,
## fruit/vegetable_juice,
## whole_milk} => {root_vegetables} 0.001525165 0.3947368 0.003863752 3.6214896 15
## [15922] {brown_bread,
## root_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001525165 0.2678571 0.005693950 3.7051688 15
## [15923] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {brown_bread} 0.001525165 0.2343750 0.006507372 3.6129751 15
## [15924] {brown_bread,
## fruit/vegetable_juice,
## soda} => {yogurt} 0.001118454 0.4583333 0.002440264 3.2855017 11
## [15925] {brown_bread,
## fruit/vegetable_juice,
## yogurt} => {soda} 0.001118454 0.3793103 0.002948653 2.1752287 11
## [15926] {brown_bread,
## soda,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.3548387 0.003152008 4.9083526 11
## [15927] {fruit/vegetable_juice,
## soda,
## yogurt} => {brown_bread} 0.001118454 0.2200000 0.005083884 3.3913793 11
## [15928] {brown_bread,
## fruit/vegetable_juice,
## soda} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [15929] {brown_bread,
## fruit/vegetable_juice,
## other_vegetables} => {soda} 0.001118454 0.3235294 0.003457041 1.8553421 11
## [15930] {brown_bread,
## other_vegetables,
## soda} => {fruit/vegetable_juice} 0.001118454 0.2682927 0.004168785 3.7111934 11
## [15931] {fruit/vegetable_juice,
## other_vegetables,
## soda} => {brown_bread} 0.001118454 0.2500000 0.004473818 3.8538401 11
## [15932] {brown_bread,
## fruit/vegetable_juice,
## soda} => {whole_milk} 0.001321810 0.5416667 0.002440264 2.1198932 13
## [15933] {brown_bread,
## fruit/vegetable_juice,
## whole_milk} => {soda} 0.001321810 0.3421053 0.003863752 1.9618690 13
## [15934] {brown_bread,
## soda,
## whole_milk} => {fruit/vegetable_juice} 0.001321810 0.2600000 0.005083884 3.5964838 13
## [15935] {fruit/vegetable_juice,
## soda,
## whole_milk} => {brown_bread} 0.001321810 0.2166667 0.006100661 3.3399948 13
## [15936] {brown_bread,
## fruit/vegetable_juice,
## yogurt} => {other_vegetables} 0.001525165 0.5172414 0.002948653 2.6731839 15
## [15937] {brown_bread,
## fruit/vegetable_juice,
## other_vegetables} => {yogurt} 0.001525165 0.4411765 0.003457041 3.1625150 15
## [15938] {brown_bread,
## other_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.001525165 0.2941176 0.005185562 4.0684206 15
## [15939] {brown_bread,
## fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.001830198 0.6206897 0.002948653 2.4291615 18
## [15940] {brown_bread,
## fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.001830198 0.4736842 0.003863752 3.3955424 18
## [15941] {brown_bread,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001830198 0.2571429 0.007117438 3.5569620 18
## [15942] {brown_bread,
## fruit/vegetable_juice,
## other_vegetables} => {whole_milk} 0.001626843 0.4705882 0.003457041 1.8417172 16
## [15943] {brown_bread,
## fruit/vegetable_juice,
## whole_milk} => {other_vegetables} 0.001626843 0.4210526 0.003863752 2.1760655 16
## [15944] {brown_bread,
## pip_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001118454 1.0000000 0.001118454 5.1681555 11
## [15945] {brown_bread,
## other_vegetables,
## whipped/sour_cream} => {pip_fruit} 0.001118454 0.3666667 0.003050330 4.8469982 11
## [15946] {brown_bread,
## other_vegetables,
## pip_fruit} => {whipped/sour_cream} 0.001118454 0.2972973 0.003762074 4.1474027 11
## [15947] {other_vegetables,
## pip_fruit,
## whipped/sour_cream} => {brown_bread} 0.001118454 0.2000000 0.005592272 3.0830721 11
## [15948] {brown_bread,
## sausage,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [15949] {brown_bread,
## other_vegetables,
## whipped/sour_cream} => {sausage} 0.001016777 0.3333333 0.003050330 3.5479798 10
## [15950] {brown_bread,
## other_vegetables,
## sausage} => {whipped/sour_cream} 0.001016777 0.2272727 0.004473818 3.1705351 10
## [15951] {other_vegetables,
## sausage,
## whipped/sour_cream} => {brown_bread} 0.001016777 0.2083333 0.004880529 3.2115334 10
## [15952] {brown_bread,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001321810 0.6842105 0.001931876 3.5361064 13
## [15953] {brown_bread,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001321810 0.4333333 0.003050330 3.1062925 13
## [15954] {brown_bread,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001321810 0.2549020 0.005185562 3.5559727 13
## [15955] {brown_bread,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.5000000 0.003050330 1.9568245 15
## [15956] {brown_bread,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001525165 0.6521739 0.002338587 3.3705362 15
## [15957] {brown_bread,
## citrus_fruit,
## pip_fruit} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [15958] {brown_bread,
## other_vegetables,
## pip_fruit} => {citrus_fruit} 0.001016777 0.2702703 0.003762074 3.2654891 10
## [15959] {brown_bread,
## citrus_fruit,
## other_vegetables} => {pip_fruit} 0.001016777 0.2941176 0.003457041 3.8879665 10
## [15960] {brown_bread,
## citrus_fruit,
## pip_fruit} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [15961] {brown_bread,
## pip_fruit,
## whole_milk} => {citrus_fruit} 0.001118454 0.3055556 0.003660397 3.6918168 11
## [15962] {brown_bread,
## citrus_fruit,
## whole_milk} => {pip_fruit} 0.001118454 0.3055556 0.003660397 4.0391652 11
## [15963] {citrus_fruit,
## pip_fruit,
## whole_milk} => {brown_bread} 0.001118454 0.2156863 0.005185562 3.3248817 11
## [15964] {brown_bread,
## pip_fruit,
## sausage} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [15965] {brown_bread,
## pip_fruit,
## yogurt} => {sausage} 0.001016777 0.3846154 0.002643620 4.0938228 10
## [15966] {brown_bread,
## sausage,
## yogurt} => {pip_fruit} 0.001016777 0.2631579 0.003863752 3.4787068 10
## [15967] {pip_fruit,
## sausage,
## yogurt} => {brown_bread} 0.001016777 0.2564103 0.003965430 3.9526565 10
## [15968] {brown_bread,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001321810 0.5416667 0.002440264 3.8828656 13
## [15969] {brown_bread,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001321810 0.5000000 0.002643620 4.7650194 13
## [15970] {brown_bread,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001321810 0.3333333 0.003965430 4.4063620 13
## [15971] {pip_fruit,
## tropical_fruit,
## yogurt} => {brown_bread} 0.001321810 0.2063492 0.006405694 3.1809474 13
## [15972] {brown_bread,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001931876 0.7916667 0.002440264 4.0914565 19
## [15973] {brown_bread,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001931876 0.5135135 0.003762074 4.8938037 19
## [15974] {brown_bread,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001931876 0.4634146 0.004168785 6.1259179 19
## [15975] {other_vegetables,
## pip_fruit,
## tropical_fruit} => {brown_bread} 0.001931876 0.2043011 0.009456024 3.1493747 19
## [15976] {brown_bread,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001728521 0.7083333 0.002440264 2.7721681 17
## [15977] {brown_bread,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001728521 0.4722222 0.003660397 4.5002961 17
## [15978] {brown_bread,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001728521 0.3035714 0.005693950 4.0129368 17
## [15979] {pip_fruit,
## tropical_fruit,
## whole_milk} => {brown_bread} 0.001728521 0.2048193 0.008439248 3.1573630 17
## [15980] {brown_bread,
## pip_fruit,
## root_vegetables} => {other_vegetables} 0.001321810 0.8125000 0.001626843 4.1991264 13
## [15981] {brown_bread,
## other_vegetables,
## pip_fruit} => {root_vegetables} 0.001321810 0.3513514 0.003762074 3.2234520 13
## [15982] {brown_bread,
## other_vegetables,
## root_vegetables} => {pip_fruit} 0.001321810 0.3250000 0.004067107 4.2962030 13
## [15983] {brown_bread,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001423488 0.8750000 0.001626843 3.4244429 14
## [15984] {brown_bread,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001423488 0.3888889 0.003660397 3.5678379 14
## [15985] {brown_bread,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001423488 0.2500000 0.005693950 3.3047715 14
## [15986] {brown_bread,
## pip_fruit,
## yogurt} => {other_vegetables} 0.001626843 0.6153846 0.002643620 3.1804034 16
## [15987] {brown_bread,
## other_vegetables,
## pip_fruit} => {yogurt} 0.001626843 0.4324324 0.003762074 3.0998345 16
## [15988] {brown_bread,
## other_vegetables,
## yogurt} => {pip_fruit} 0.001626843 0.3137255 0.005185562 4.1471642 16
## [15989] {other_vegetables,
## pip_fruit,
## yogurt} => {brown_bread} 0.001626843 0.2000000 0.008134215 3.0830721 16
## [15990] {brown_bread,
## pip_fruit,
## yogurt} => {whole_milk} 0.001626843 0.6153846 0.002643620 2.4083994 16
## [15991] {brown_bread,
## pip_fruit,
## whole_milk} => {yogurt} 0.001626843 0.4444444 0.003660397 3.1859410 16
## [15992] {brown_bread,
## whole_milk,
## yogurt} => {pip_fruit} 0.001626843 0.2285714 0.007117438 3.0215054 16
## [15993] {brown_bread,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.002135231 0.5675676 0.003762074 2.2212603 21
## [15994] {brown_bread,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.002135231 0.5833333 0.003660397 3.0147574 21
## [15995] {brown_bread,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.002135231 0.2282609 0.009354347 3.0174001 21
## [15996] {brown_bread,
## pastry,
## tropical_fruit} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [15997] {brown_bread,
## other_vegetables,
## pastry} => {tropical_fruit} 0.001016777 0.3030303 0.003355363 2.8878905 10
## [15998] {brown_bread,
## other_vegetables,
## tropical_fruit} => {pastry} 0.001016777 0.2439024 0.004168785 2.7414634 10
## [15999] {other_vegetables,
## pastry,
## tropical_fruit} => {brown_bread} 0.001016777 0.2000000 0.005083884 3.0830721 10
## [16000] {brown_bread,
## pastry,
## tropical_fruit} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [16001] {brown_bread,
## pastry,
## whole_milk} => {tropical_fruit} 0.001016777 0.2127660 0.004778851 2.0276678 10
## [16002] {brown_bread,
## pastry,
## soda} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [16003] {brown_bread,
## pastry,
## whole_milk} => {soda} 0.001423488 0.2978723 0.004778851 1.7082067 14
## [16004] {brown_bread,
## soda,
## whole_milk} => {pastry} 0.001423488 0.2800000 0.005083884 3.1472000 14
## [16005] {brown_bread,
## pastry,
## yogurt} => {other_vegetables} 0.001220132 0.4000000 0.003050330 2.0672622 12
## [16006] {brown_bread,
## other_vegetables,
## pastry} => {yogurt} 0.001220132 0.3636364 0.003355363 2.6066790 12
## [16007] {brown_bread,
## other_vegetables,
## yogurt} => {pastry} 0.001220132 0.2352941 0.005185562 2.6447059 12
## [16008] {brown_bread,
## pastry,
## yogurt} => {whole_milk} 0.001626843 0.5333333 0.003050330 2.0872795 16
## [16009] {brown_bread,
## pastry,
## whole_milk} => {yogurt} 0.001626843 0.3404255 0.004778851 2.4402953 16
## [16010] {brown_bread,
## whole_milk,
## yogurt} => {pastry} 0.001626843 0.2285714 0.007117438 2.5691429 16
## [16011] {brown_bread,
## other_vegetables,
## pastry} => {whole_milk} 0.001728521 0.5151515 0.003355363 2.0161222 17
## [16012] {brown_bread,
## pastry,
## whole_milk} => {other_vegetables} 0.001728521 0.3617021 0.004778851 1.8693329 17
## [16013] {brown_bread,
## citrus_fruit,
## sausage} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [16014] {brown_bread,
## citrus_fruit,
## whole_milk} => {sausage} 0.001016777 0.2777778 0.003660397 2.9566498 10
## [16015] {brown_bread,
## sausage,
## whole_milk} => {citrus_fruit} 0.001016777 0.2272727 0.004473818 2.7459795 10
## [16016] {citrus_fruit,
## sausage,
## whole_milk} => {brown_bread} 0.001016777 0.2040816 0.004982206 3.1459919 10
## [16017] {brown_bread,
## citrus_fruit,
## tropical_fruit} => {root_vegetables} 0.001118454 0.4400000 0.002541942 4.0367537 11
## [16018] {brown_bread,
## citrus_fruit,
## root_vegetables} => {tropical_fruit} 0.001118454 0.4400000 0.002541942 4.1932171 11
## [16019] {brown_bread,
## root_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001118454 0.4230769 0.002643620 5.1117464 11
## [16020] {brown_bread,
## citrus_fruit,
## tropical_fruit} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [16021] {brown_bread,
## citrus_fruit,
## yogurt} => {tropical_fruit} 0.001016777 0.3448276 0.002948653 3.2862203 10
## [16022] {brown_bread,
## tropical_fruit,
## yogurt} => {citrus_fruit} 0.001016777 0.2564103 0.003965430 3.0980281 10
## [16023] {brown_bread,
## citrus_fruit,
## tropical_fruit} => {other_vegetables} 0.001220132 0.4800000 0.002541942 2.4807147 12
## [16024] {brown_bread,
## citrus_fruit,
## other_vegetables} => {tropical_fruit} 0.001220132 0.3529412 0.003457041 3.3635431 12
## [16025] {brown_bread,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001220132 0.2926829 0.004168785 3.5362857 12
## [16026] {brown_bread,
## citrus_fruit,
## tropical_fruit} => {whole_milk} 0.001728521 0.6800000 0.002541942 2.6612813 17
## [16027] {brown_bread,
## citrus_fruit,
## whole_milk} => {tropical_fruit} 0.001728521 0.4722222 0.003660397 4.5002961 17
## [16028] {brown_bread,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001728521 0.3035714 0.005693950 3.6678440 17
## [16029] {brown_bread,
## citrus_fruit,
## root_vegetables} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [16030] {brown_bread,
## citrus_fruit,
## yogurt} => {root_vegetables} 0.001016777 0.3448276 0.002948653 3.1636001 10
## [16031] {brown_bread,
## root_vegetables,
## yogurt} => {citrus_fruit} 0.001016777 0.3125000 0.003253686 3.7757217 10
## [16032] {citrus_fruit,
## root_vegetables,
## yogurt} => {brown_bread} 0.001016777 0.2083333 0.004880529 3.2115334 10
## [16033] {brown_bread,
## citrus_fruit,
## root_vegetables} => {other_vegetables} 0.001423488 0.5600000 0.002541942 2.8941671 14
## [16034] {brown_bread,
## citrus_fruit,
## other_vegetables} => {root_vegetables} 0.001423488 0.4117647 0.003457041 3.7777107 14
## [16035] {brown_bread,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001423488 0.3500000 0.004067107 4.2288084 14
## [16036] {brown_bread,
## citrus_fruit,
## root_vegetables} => {whole_milk} 0.001626843 0.6400000 0.002541942 2.5047354 16
## [16037] {brown_bread,
## citrus_fruit,
## whole_milk} => {root_vegetables} 0.001626843 0.4444444 0.003660397 4.0775290 16
## [16038] {brown_bread,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001626843 0.2857143 0.005693950 3.4520885 16
## [16039] {brown_bread,
## citrus_fruit,
## yogurt} => {other_vegetables} 0.001016777 0.3448276 0.002948653 1.7821226 10
## [16040] {brown_bread,
## citrus_fruit,
## other_vegetables} => {yogurt} 0.001016777 0.2941176 0.003457041 2.1083433 10
## [16041] {brown_bread,
## citrus_fruit,
## yogurt} => {whole_milk} 0.001626843 0.5517241 0.002948653 2.1592546 16
## [16042] {brown_bread,
## citrus_fruit,
## whole_milk} => {yogurt} 0.001626843 0.4444444 0.003660397 3.1859410 16
## [16043] {brown_bread,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001626843 0.2285714 0.007117438 2.7616708 16
## [16044] {brown_bread,
## citrus_fruit,
## other_vegetables} => {whole_milk} 0.001931876 0.5588235 0.003457041 2.1870392 19
## [16045] {brown_bread,
## citrus_fruit,
## whole_milk} => {other_vegetables} 0.001931876 0.5277778 0.003660397 2.7276376 19
## [16046] {brown_bread,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001931876 0.2065217 0.009354347 2.4952596 19
## [16047] {brown_bread,
## shopping_bags,
## soda} => {other_vegetables} 0.001016777 0.3333333 0.003050330 1.7227185 10
## [16048] {brown_bread,
## other_vegetables,
## shopping_bags} => {soda} 0.001016777 0.3333333 0.003050330 1.9115646 10
## [16049] {brown_bread,
## other_vegetables,
## soda} => {shopping_bags} 0.001016777 0.2439024 0.004168785 2.4755217 10
## [16050] {brown_bread,
## shopping_bags,
## soda} => {whole_milk} 0.001118454 0.3666667 0.003050330 1.4350046 11
## [16051] {brown_bread,
## shopping_bags,
## whole_milk} => {soda} 0.001118454 0.3142857 0.003558719 1.8023324 11
## [16052] {brown_bread,
## soda,
## whole_milk} => {shopping_bags} 0.001118454 0.2200000 0.005083884 2.2329205 11
## [16053] {brown_bread,
## shopping_bags,
## yogurt} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [16054] {brown_bread,
## shopping_bags,
## whole_milk} => {yogurt} 0.001118454 0.3142857 0.003558719 2.2529155 11
## [16055] {shopping_bags,
## whole_milk,
## yogurt} => {brown_bread} 0.001118454 0.2115385 0.005287239 3.2609416 11
## [16056] {brown_bread,
## other_vegetables,
## shopping_bags} => {whole_milk} 0.001525165 0.5000000 0.003050330 1.9568245 15
## [16057] {brown_bread,
## shopping_bags,
## whole_milk} => {other_vegetables} 0.001525165 0.4285714 0.003558719 2.2149238 15
## [16058] {other_vegetables,
## shopping_bags,
## whole_milk} => {brown_bread} 0.001525165 0.2000000 0.007625826 3.0830721 15
## [16059] {brown_bread,
## sausage,
## tropical_fruit} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [16060] {brown_bread,
## sausage,
## yogurt} => {tropical_fruit} 0.001016777 0.2631579 0.003863752 2.5079049 10
## [16061] {brown_bread,
## tropical_fruit,
## yogurt} => {sausage} 0.001016777 0.2564103 0.003965430 2.7292152 10
## [16062] {sausage,
## tropical_fruit,
## yogurt} => {brown_bread} 0.001016777 0.2173913 0.004677173 3.3511653 10
## [16063] {brown_bread,
## sausage,
## tropical_fruit} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [16064] {brown_bread,
## other_vegetables,
## sausage} => {tropical_fruit} 0.001220132 0.2727273 0.004473818 2.5991015 12
## [16065] {brown_bread,
## other_vegetables,
## tropical_fruit} => {sausage} 0.001220132 0.2926829 0.004168785 3.1152993 12
## [16066] {other_vegetables,
## sausage,
## tropical_fruit} => {brown_bread} 0.001220132 0.2033898 0.005998983 3.1353276 12
## [16067] {brown_bread,
## sausage,
## tropical_fruit} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [16068] {brown_bread,
## sausage,
## whole_milk} => {tropical_fruit} 0.001118454 0.2500000 0.004473818 2.3825097 11
## [16069] {brown_bread,
## root_vegetables,
## sausage} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [16070] {brown_bread,
## sausage,
## whole_milk} => {root_vegetables} 0.001220132 0.2727273 0.004473818 2.5021201 12
## [16071] {brown_bread,
## root_vegetables,
## whole_milk} => {sausage} 0.001220132 0.2142857 0.005693950 2.2808442 12
## [16072] {brown_bread,
## sausage,
## soda} => {yogurt} 0.001016777 0.3846154 0.002643620 2.7570644 10
## [16073] {brown_bread,
## sausage,
## yogurt} => {soda} 0.001016777 0.2631579 0.003863752 1.5091300 10
## [16074] {brown_bread,
## soda,
## yogurt} => {sausage} 0.001016777 0.3225806 0.003152008 3.4335288 10
## [16075] {brown_bread,
## sausage,
## soda} => {whole_milk} 0.001321810 0.5000000 0.002643620 1.9568245 13
## [16076] {brown_bread,
## sausage,
## whole_milk} => {soda} 0.001321810 0.2954545 0.004473818 1.6943414 13
## [16077] {brown_bread,
## soda,
## whole_milk} => {sausage} 0.001321810 0.2600000 0.005083884 2.7674242 13
## [16078] {brown_bread,
## sausage,
## yogurt} => {rolls/buns} 0.001016777 0.2631579 0.003863752 1.4307119 10
## [16079] {brown_bread,
## rolls/buns,
## sausage} => {yogurt} 0.001016777 0.3703704 0.002745297 2.6549509 10
## [16080] {brown_bread,
## rolls/buns,
## yogurt} => {sausage} 0.001016777 0.3225806 0.003152008 3.4335288 10
## [16081] {brown_bread,
## sausage,
## yogurt} => {other_vegetables} 0.001931876 0.5000000 0.003863752 2.5840778 19
## [16082] {brown_bread,
## other_vegetables,
## sausage} => {yogurt} 0.001931876 0.4318182 0.004473818 3.0954314 19
## [16083] {brown_bread,
## other_vegetables,
## yogurt} => {sausage} 0.001931876 0.3725490 0.005185562 3.9653892 19
## [16084] {other_vegetables,
## sausage,
## yogurt} => {brown_bread} 0.001931876 0.2375000 0.008134215 3.6611481 19
## [16085] {brown_bread,
## sausage,
## yogurt} => {whole_milk} 0.001830198 0.4736842 0.003863752 1.8538337 18
## [16086] {brown_bread,
## sausage,
## whole_milk} => {yogurt} 0.001830198 0.4090909 0.004473818 2.9325139 18
## [16087] {brown_bread,
## whole_milk,
## yogurt} => {sausage} 0.001830198 0.2571429 0.007117438 2.7370130 18
## [16088] {sausage,
## whole_milk,
## yogurt} => {brown_bread} 0.001830198 0.2093023 0.008744281 3.2264708 18
## [16089] {brown_bread,
## rolls/buns,
## sausage} => {other_vegetables} 0.001321810 0.4814815 0.002745297 2.4883712 13
## [16090] {brown_bread,
## other_vegetables,
## sausage} => {rolls/buns} 0.001321810 0.2954545 0.004473818 1.6062993 13
## [16091] {brown_bread,
## other_vegetables,
## rolls/buns} => {sausage} 0.001321810 0.3250000 0.004067107 3.4592803 13
## [16092] {brown_bread,
## rolls/buns,
## sausage} => {whole_milk} 0.001016777 0.3703704 0.002745297 1.4494996 10
## [16093] {brown_bread,
## sausage,
## whole_milk} => {rolls/buns} 0.001016777 0.2272727 0.004473818 1.2356149 10
## [16094] {brown_bread,
## other_vegetables,
## sausage} => {whole_milk} 0.001931876 0.4318182 0.004473818 1.6899848 19
## [16095] {brown_bread,
## sausage,
## whole_milk} => {other_vegetables} 0.001931876 0.4318182 0.004473818 2.2317035 19
## [16096] {brown_bread,
## other_vegetables,
## whole_milk} => {sausage} 0.001931876 0.2065217 0.009354347 2.1982049 19
## [16097] {bottled_water,
## brown_bread,
## soda} => {yogurt} 0.001016777 0.3703704 0.002745297 2.6549509 10
## [16098] {bottled_water,
## brown_bread,
## yogurt} => {soda} 0.001016777 0.4545455 0.002236909 2.6066790 10
## [16099] {brown_bread,
## soda,
## yogurt} => {bottled_water} 0.001016777 0.3225806 0.003152008 2.9186574 10
## [16100] {bottled_water,
## brown_bread,
## yogurt} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [16101] {bottled_water,
## brown_bread,
## whole_milk} => {yogurt} 0.001118454 0.4074074 0.002745297 2.9204460 11
## [16102] {bottled_water,
## brown_bread,
## other_vegetables} => {whole_milk} 0.001016777 0.3846154 0.002643620 1.5052496 10
## [16103] {bottled_water,
## brown_bread,
## whole_milk} => {other_vegetables} 0.001016777 0.3703704 0.002745297 1.9141317 10
## [16104] {brown_bread,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001220132 0.4615385 0.002643620 3.3084772 12
## [16105] {brown_bread,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001220132 0.3076923 0.003965430 2.8229047 12
## [16106] {brown_bread,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001220132 0.3750000 0.003253686 3.5737645 12
## [16107] {brown_bread,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001728521 0.6538462 0.002643620 3.3791786 17
## [16108] {brown_bread,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001728521 0.4146341 0.004168785 3.8040362 17
## [16109] {brown_bread,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001728521 0.4250000 0.004067107 4.0502665 17
## [16110] {brown_bread,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001728521 0.6538462 0.002643620 2.5589244 17
## [16111] {brown_bread,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001728521 0.3035714 0.005693950 2.7850979 17
## [16112] {brown_bread,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001728521 0.3035714 0.005693950 2.8930475 17
## [16113] {brown_bread,
## soda,
## tropical_fruit} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [16114] {brown_bread,
## soda,
## whole_milk} => {tropical_fruit} 0.001118454 0.2200000 0.005083884 2.0966085 11
## [16115] {brown_bread,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001728521 0.4358974 0.003965430 2.2527857 17
## [16116] {brown_bread,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001728521 0.4146341 0.004168785 2.9722499 17
## [16117] {brown_bread,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001728521 0.3333333 0.005185562 3.1766796 17
## [16118] {brown_bread,
## tropical_fruit,
## yogurt} => {whole_milk} 0.002135231 0.5384615 0.003965430 2.1073495 21
## [16119] {brown_bread,
## tropical_fruit,
## whole_milk} => {yogurt} 0.002135231 0.3750000 0.005693950 2.6881378 21
## [16120] {brown_bread,
## whole_milk,
## yogurt} => {tropical_fruit} 0.002135231 0.3000000 0.007117438 2.8590116 21
## [16121] {brown_bread,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [16122] {brown_bread,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.002643620 0.6341463 0.004168785 2.4818262 26
## [16123] {brown_bread,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.002643620 0.4642857 0.005693950 2.3995008 26
## [16124] {brown_bread,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.002643620 0.2826087 0.009354347 2.6932718 26
## [16125] {brown_bread,
## root_vegetables,
## soda} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [16126] {brown_bread,
## root_vegetables,
## whole_milk} => {soda} 0.001220132 0.2142857 0.005693950 1.2288630 12
## [16127] {brown_bread,
## soda,
## whole_milk} => {root_vegetables} 0.001220132 0.2400000 0.005083884 2.2018657 12
## [16128] {brown_bread,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001220132 0.3750000 0.003253686 1.9380583 12
## [16129] {brown_bread,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001220132 0.3000000 0.004067107 2.1505102 12
## [16130] {brown_bread,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001220132 0.2352941 0.005185562 2.1586918 12
## [16131] {brown_bread,
## root_vegetables,
## yogurt} => {whole_milk} 0.001728521 0.5312500 0.003253686 2.0791260 17
## [16132] {brown_bread,
## root_vegetables,
## whole_milk} => {yogurt} 0.001728521 0.3035714 0.005693950 2.1761115 17
## [16133] {brown_bread,
## whole_milk,
## yogurt} => {root_vegetables} 0.001728521 0.2428571 0.007117438 2.2280784 17
## [16134] {brown_bread,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [16135] {brown_bread,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001118454 0.2750000 0.004067107 1.4950940 11
## [16136] {brown_bread,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001118454 0.2750000 0.004067107 2.5229711 11
## [16137] {brown_bread,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [16138] {brown_bread,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001423488 0.2500000 0.005693950 1.3591763 14
## [16139] {brown_bread,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001423488 0.2692308 0.005287239 2.4700416 14
## [16140] {brown_bread,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.003152008 0.7750000 0.004067107 3.0330780 31
## [16141] {brown_bread,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.003152008 0.5535714 0.005693950 2.8609432 31
## [16142] {brown_bread,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.003152008 0.3369565 0.009354347 3.0913875 31
## [16143] {brown_bread,
## soda,
## yogurt} => {other_vegetables} 0.001321810 0.4193548 0.003152008 2.1672910 13
## [16144] {brown_bread,
## other_vegetables,
## soda} => {yogurt} 0.001321810 0.3170732 0.004168785 2.2728970 13
## [16145] {brown_bread,
## other_vegetables,
## yogurt} => {soda} 0.001321810 0.2549020 0.005185562 1.4617847 13
## [16146] {brown_bread,
## soda,
## yogurt} => {whole_milk} 0.002033554 0.6451613 0.003152008 2.5249349 20
## [16147] {brown_bread,
## soda,
## whole_milk} => {yogurt} 0.002033554 0.4000000 0.005083884 2.8673469 20
## [16148] {brown_bread,
## whole_milk,
## yogurt} => {soda} 0.002033554 0.2857143 0.007117438 1.6384840 20
## [16149] {brown_bread,
## rolls/buns,
## soda} => {other_vegetables} 0.001321810 0.4482759 0.002948653 2.3167594 13
## [16150] {brown_bread,
## other_vegetables,
## soda} => {rolls/buns} 0.001321810 0.3170732 0.004168785 1.7238334 13
## [16151] {brown_bread,
## other_vegetables,
## rolls/buns} => {soda} 0.001321810 0.3250000 0.004067107 1.8637755 13
## [16152] {brown_bread,
## rolls/buns,
## soda} => {whole_milk} 0.001321810 0.4482759 0.002948653 1.7543944 13
## [16153] {brown_bread,
## soda,
## whole_milk} => {rolls/buns} 0.001321810 0.2600000 0.005083884 1.4135434 13
## [16154] {brown_bread,
## rolls/buns,
## whole_milk} => {soda} 0.001321810 0.2500000 0.005287239 1.4336735 13
## [16155] {brown_bread,
## other_vegetables,
## soda} => {whole_milk} 0.002541942 0.6097561 0.004168785 2.3863714 25
## [16156] {brown_bread,
## soda,
## whole_milk} => {other_vegetables} 0.002541942 0.5000000 0.005083884 2.5840778 25
## [16157] {brown_bread,
## other_vegetables,
## whole_milk} => {soda} 0.002541942 0.2717391 0.009354347 1.5583407 25
## [16158] {brown_bread,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001118454 0.3548387 0.003152008 1.8338616 11
## [16159] {brown_bread,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001118454 0.2156863 0.005185562 1.1726227 11
## [16160] {brown_bread,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001118454 0.2750000 0.004067107 1.9713010 11
## [16161] {brown_bread,
## rolls/buns,
## yogurt} => {whole_milk} 0.001423488 0.4516129 0.003152008 1.7674544 14
## [16162] {brown_bread,
## whole_milk,
## yogurt} => {rolls/buns} 0.001423488 0.2000000 0.007117438 1.0873411 14
## [16163] {brown_bread,
## rolls/buns,
## whole_milk} => {yogurt} 0.001423488 0.2692308 0.005287239 1.9299451 14
## [16164] {brown_bread,
## other_vegetables,
## yogurt} => {whole_milk} 0.002846975 0.5490196 0.005185562 2.1486701 28
## [16165] {brown_bread,
## whole_milk,
## yogurt} => {other_vegetables} 0.002846975 0.4000000 0.007117438 2.0672622 28
## [16166] {brown_bread,
## other_vegetables,
## whole_milk} => {yogurt} 0.002846975 0.3043478 0.009354347 2.1816770 28
## [16167] {brown_bread,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.002338587 0.5750000 0.004067107 2.2503482 23
## [16168] {brown_bread,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.002338587 0.4423077 0.005287239 2.2859150 23
## [16169] {brown_bread,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.002338587 0.2500000 0.009354347 1.3591763 23
## [16170] {butter,
## margarine,
## whipped/sour_cream} => {yogurt} 0.001016777 0.6666667 0.001525165 4.7789116 10
## [16171] {butter,
## margarine,
## yogurt} => {whipped/sour_cream} 0.001016777 0.4166667 0.002440264 5.8126478 10
## [16172] {margarine,
## whipped/sour_cream,
## yogurt} => {butter} 0.001016777 0.3225806 0.003152008 5.8212489 10
## [16173] {butter,
## whipped/sour_cream,
## yogurt} => {margarine} 0.001016777 0.2631579 0.003863752 4.4933297 10
## [16174] {butter,
## margarine,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [16175] {butter,
## margarine,
## other_vegetables} => {whipped/sour_cream} 0.001118454 0.3142857 0.003558719 4.3843972 11
## [16176] {margarine,
## other_vegetables,
## whipped/sour_cream} => {butter} 0.001118454 0.3235294 0.003457041 5.8383702 11
## [16177] {butter,
## margarine,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [16178] {butter,
## margarine,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.3333333 0.003050330 4.6501182 10
## [16179] {margarine,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001016777 0.2500000 0.004067107 4.5114679 10
## [16180] {butter,
## margarine,
## pip_fruit} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [16181] {butter,
## margarine,
## other_vegetables} => {pip_fruit} 0.001016777 0.2857143 0.003558719 3.7768817 10
## [16182] {margarine,
## other_vegetables,
## pip_fruit} => {butter} 0.001016777 0.2857143 0.003558719 5.1559633 10
## [16183] {butter,
## other_vegetables,
## pip_fruit} => {margarine} 0.001016777 0.2500000 0.004067107 4.2686632 10
## [16184] {butter,
## margarine,
## tropical_fruit} => {yogurt} 0.001118454 0.8461538 0.001321810 6.0655416 11
## [16185] {butter,
## margarine,
## yogurt} => {tropical_fruit} 0.001118454 0.4583333 0.002440264 4.3679344 11
## [16186] {margarine,
## tropical_fruit,
## yogurt} => {butter} 0.001118454 0.2750000 0.004067107 4.9626147 11
## [16187] {butter,
## tropical_fruit,
## yogurt} => {margarine} 0.001118454 0.2444444 0.004575496 4.1738040 11
## [16188] {butter,
## margarine,
## tropical_fruit} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [16189] {butter,
## margarine,
## other_vegetables} => {tropical_fruit} 0.001016777 0.2857143 0.003558719 2.7228682 10
## [16190] {margarine,
## other_vegetables,
## tropical_fruit} => {butter} 0.001016777 0.2564103 0.003965430 4.6271466 10
## [16191] {butter,
## margarine,
## root_vegetables} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [16192] {butter,
## margarine,
## other_vegetables} => {root_vegetables} 0.001016777 0.2857143 0.003558719 2.6212687 10
## [16193] {butter,
## margarine,
## root_vegetables} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [16194] {butter,
## margarine,
## whole_milk} => {root_vegetables} 0.001016777 0.3333333 0.003050330 3.0581468 10
## [16195] {margarine,
## root_vegetables,
## whole_milk} => {butter} 0.001016777 0.2040816 0.004982206 3.6828309 10
## [16196] {butter,
## margarine,
## yogurt} => {other_vegetables} 0.001525165 0.6250000 0.002440264 3.2300972 15
## [16197] {butter,
## margarine,
## other_vegetables} => {yogurt} 0.001525165 0.4285714 0.003558719 3.0721574 15
## [16198] {margarine,
## other_vegetables,
## yogurt} => {butter} 0.001525165 0.2678571 0.005693950 4.8337156 15
## [16199] {butter,
## other_vegetables,
## yogurt} => {margarine} 0.001525165 0.2380952 0.006405694 4.0653935 15
## [16200] {butter,
## margarine,
## yogurt} => {whole_milk} 0.001525165 0.6250000 0.002440264 2.4460306 15
## [16201] {butter,
## margarine,
## whole_milk} => {yogurt} 0.001525165 0.5000000 0.003050330 3.5841837 15
## [16202] {margarine,
## whole_milk,
## yogurt} => {butter} 0.001525165 0.2173913 0.007015760 3.9230156 15
## [16203] {butter,
## margarine,
## rolls/buns} => {other_vegetables} 0.001321810 0.6500000 0.002033554 3.3593011 13
## [16204] {butter,
## margarine,
## other_vegetables} => {rolls/buns} 0.001321810 0.3714286 0.003558719 2.0193477 13
## [16205] {margarine,
## other_vegetables,
## rolls/buns} => {butter} 0.001321810 0.2549020 0.005185562 4.5999280 13
## [16206] {butter,
## other_vegetables,
## rolls/buns} => {margarine} 0.001321810 0.2321429 0.005693950 3.9637587 13
## [16207] {butter,
## margarine,
## rolls/buns} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [16208] {butter,
## margarine,
## whole_milk} => {rolls/buns} 0.001220132 0.4000000 0.003050330 2.1746821 12
## [16209] {butter,
## margarine,
## other_vegetables} => {whole_milk} 0.002033554 0.5714286 0.003558719 2.2363709 20
## [16210] {butter,
## margarine,
## whole_milk} => {other_vegetables} 0.002033554 0.6666667 0.003050330 3.4454370 20
## [16211] {margarine,
## other_vegetables,
## whole_milk} => {butter} 0.002033554 0.2197802 0.009252669 3.9661256 20
## [16212] {margarine,
## newspapers,
## rolls/buns} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [16213] {margarine,
## newspapers,
## whole_milk} => {rolls/buns} 0.001220132 0.3870968 0.003152008 2.1045311 12
## [16214] {margarine,
## newspapers,
## other_vegetables} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [16215] {margarine,
## newspapers,
## whole_milk} => {other_vegetables} 0.001220132 0.3870968 0.003152008 2.0005763 12
## [16216] {domestic_eggs,
## fruit/vegetable_juice,
## margarine} => {whole_milk} 0.001118454 0.9166667 0.001220132 3.5875116 11
## [16217] {domestic_eggs,
## margarine,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.2156863 0.005185562 2.9835085 11
## [16218] {fruit/vegetable_juice,
## margarine,
## whole_milk} => {domestic_eggs} 0.001118454 0.3333333 0.003355363 5.2537393 11
## [16219] {domestic_eggs,
## fruit/vegetable_juice,
## whole_milk} => {margarine} 0.001118454 0.2340426 0.004778851 3.9961953 11
## [16220] {domestic_eggs,
## margarine,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.8000000 0.001525165 3.1309192 12
## [16221] {domestic_eggs,
## margarine,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.2352941 0.005185562 3.2824364 12
## [16222] {margarine,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001220132 0.3000000 0.004067107 4.7283654 12
## [16223] {domestic_eggs,
## whipped/sour_cream,
## whole_milk} => {margarine} 0.001220132 0.2142857 0.005693950 3.6588542 12
## [16224] {domestic_eggs,
## margarine,
## pip_fruit} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [16225] {domestic_eggs,
## margarine,
## other_vegetables} => {pip_fruit} 0.001016777 0.2564103 0.003965430 3.3895092 10
## [16226] {margarine,
## other_vegetables,
## pip_fruit} => {domestic_eggs} 0.001016777 0.2857143 0.003558719 4.5032051 10
## [16227] {domestic_eggs,
## other_vegetables,
## pip_fruit} => {margarine} 0.001016777 0.2564103 0.003965430 4.3781161 10
## [16228] {domestic_eggs,
## margarine,
## pip_fruit} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [16229] {margarine,
## pip_fruit,
## whole_milk} => {domestic_eggs} 0.001016777 0.2564103 0.003965430 4.0413379 10
## [16230] {domestic_eggs,
## margarine,
## sausage} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [16231] {margarine,
## sausage,
## whole_milk} => {domestic_eggs} 0.001016777 0.3030303 0.003355363 4.7761267 10
## [16232] {domestic_eggs,
## sausage,
## whole_milk} => {margarine} 0.001016777 0.2272727 0.004473818 3.8806029 10
## [16233] {bottled_water,
## domestic_eggs,
## margarine} => {tropical_fruit} 0.001016777 0.4761905 0.002135231 4.5381137 10
## [16234] {domestic_eggs,
## margarine,
## tropical_fruit} => {bottled_water} 0.001016777 0.4545455 0.002236909 4.1126537 10
## [16235] {bottled_water,
## margarine,
## tropical_fruit} => {domestic_eggs} 0.001016777 0.4347826 0.002338587 6.8527035 10
## [16236] {bottled_water,
## domestic_eggs,
## tropical_fruit} => {margarine} 0.001016777 0.4545455 0.002236909 7.7612058 10
## [16237] {bottled_water,
## domestic_eggs,
## margarine} => {rolls/buns} 0.001118454 0.5238095 0.002135231 2.8477980 11
## [16238] {domestic_eggs,
## margarine,
## rolls/buns} => {bottled_water} 0.001118454 0.4583333 0.002440264 4.1469258 11
## [16239] {bottled_water,
## margarine,
## rolls/buns} => {domestic_eggs} 0.001118454 0.3142857 0.003558719 4.9535256 11
## [16240] {bottled_water,
## domestic_eggs,
## rolls/buns} => {margarine} 0.001118454 0.3548387 0.003152008 6.0587478 11
## [16241] {bottled_water,
## domestic_eggs,
## margarine} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [16242] {domestic_eggs,
## margarine,
## other_vegetables} => {bottled_water} 0.001118454 0.2820513 0.003965430 2.5519543 11
## [16243] {bottled_water,
## margarine,
## other_vegetables} => {domestic_eggs} 0.001118454 0.3235294 0.003457041 5.0992176 11
## [16244] {bottled_water,
## domestic_eggs,
## other_vegetables} => {margarine} 0.001118454 0.2750000 0.004067107 4.6955295 11
## [16245] {bottled_water,
## domestic_eggs,
## margarine} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [16246] {domestic_eggs,
## margarine,
## whole_milk} => {bottled_water} 0.001525165 0.2941176 0.005185562 2.6611288 15
## [16247] {bottled_water,
## margarine,
## whole_milk} => {domestic_eggs} 0.001525165 0.3061224 0.004982206 4.8248626 15
## [16248] {bottled_water,
## domestic_eggs,
## whole_milk} => {margarine} 0.001525165 0.3125000 0.004880529 5.3358290 15
## [16249] {domestic_eggs,
## margarine,
## tropical_fruit} => {yogurt} 0.001118454 0.5000000 0.002236909 3.5841837 11
## [16250] {domestic_eggs,
## margarine,
## yogurt} => {tropical_fruit} 0.001118454 0.5000000 0.002236909 4.7650194 11
## [16251] {margarine,
## tropical_fruit,
## yogurt} => {domestic_eggs} 0.001118454 0.2750000 0.004067107 4.3343349 11
## [16252] {domestic_eggs,
## tropical_fruit,
## yogurt} => {margarine} 0.001118454 0.2619048 0.004270463 4.4719329 11
## [16253] {domestic_eggs,
## margarine,
## tropical_fruit} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [16254] {domestic_eggs,
## margarine,
## other_vegetables} => {tropical_fruit} 0.001118454 0.2820513 0.003965430 2.6879597 11
## [16255] {margarine,
## other_vegetables,
## tropical_fruit} => {domestic_eggs} 0.001118454 0.2820513 0.003965430 4.4454717 11
## [16256] {domestic_eggs,
## other_vegetables,
## tropical_fruit} => {margarine} 0.001118454 0.2340426 0.004778851 3.9961953 11
## [16257] {domestic_eggs,
## margarine,
## tropical_fruit} => {whole_milk} 0.001728521 0.7727273 0.002236909 3.0241833 17
## [16258] {domestic_eggs,
## margarine,
## whole_milk} => {tropical_fruit} 0.001728521 0.3333333 0.005185562 3.1766796 17
## [16259] {margarine,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.001728521 0.3863636 0.004473818 6.0895615 17
## [16260] {domestic_eggs,
## tropical_fruit,
## whole_milk} => {margarine} 0.001728521 0.2500000 0.006914082 4.2686632 17
## [16261] {domestic_eggs,
## margarine,
## root_vegetables} => {other_vegetables} 0.001423488 0.5600000 0.002541942 2.8941671 14
## [16262] {domestic_eggs,
## margarine,
## other_vegetables} => {root_vegetables} 0.001423488 0.3589744 0.003965430 3.2933888 14
## [16263] {margarine,
## other_vegetables,
## root_vegetables} => {domestic_eggs} 0.001423488 0.2413793 0.005897306 3.8044319 14
## [16264] {domestic_eggs,
## margarine,
## root_vegetables} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [16265] {domestic_eggs,
## margarine,
## whole_milk} => {root_vegetables} 0.001525165 0.2941176 0.005185562 2.6983648 15
## [16266] {margarine,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001525165 0.3061224 0.004982206 4.8248626 15
## [16267] {domestic_eggs,
## margarine,
## yogurt} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [16268] {domestic_eggs,
## margarine,
## other_vegetables} => {yogurt} 0.001321810 0.3333333 0.003965430 2.3894558 13
## [16269] {margarine,
## other_vegetables,
## yogurt} => {domestic_eggs} 0.001321810 0.2321429 0.005693950 3.6588542 13
## [16270] {domestic_eggs,
## other_vegetables,
## yogurt} => {margarine} 0.001321810 0.2280702 0.005795628 3.8942191 13
## [16271] {domestic_eggs,
## margarine,
## yogurt} => {whole_milk} 0.001626843 0.7272727 0.002236909 2.8462902 16
## [16272] {domestic_eggs,
## margarine,
## whole_milk} => {yogurt} 0.001626843 0.3137255 0.005185562 2.2488996 16
## [16273] {margarine,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001626843 0.2318841 0.007015760 3.6547752 16
## [16274] {domestic_eggs,
## whole_milk,
## yogurt} => {margarine} 0.001626843 0.2105263 0.007727504 3.5946637 16
## [16275] {domestic_eggs,
## margarine,
## rolls/buns} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [16276] {domestic_eggs,
## margarine,
## other_vegetables} => {rolls/buns} 0.001118454 0.2820513 0.003965430 1.5334297 11
## [16277] {margarine,
## other_vegetables,
## rolls/buns} => {domestic_eggs} 0.001118454 0.2156863 0.005185562 3.3994784 11
## [16278] {domestic_eggs,
## margarine,
## rolls/buns} => {whole_milk} 0.001626843 0.6666667 0.002440264 2.6090994 16
## [16279] {domestic_eggs,
## margarine,
## whole_milk} => {rolls/buns} 0.001626843 0.3137255 0.005185562 1.7056331 16
## [16280] {margarine,
## rolls/buns,
## whole_milk} => {domestic_eggs} 0.001626843 0.2051282 0.007930859 3.2330703 16
## [16281] {domestic_eggs,
## rolls/buns,
## whole_milk} => {margarine} 0.001626843 0.2461538 0.006609049 4.2029915 16
## [16282] {domestic_eggs,
## margarine,
## other_vegetables} => {whole_milk} 0.002440264 0.6153846 0.003965430 2.4083994 24
## [16283] {domestic_eggs,
## margarine,
## whole_milk} => {other_vegetables} 0.002440264 0.4705882 0.005185562 2.4320732 24
## [16284] {margarine,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.002440264 0.2637363 0.009252669 4.1568047 24
## [16285] {bottled_water,
## fruit/vegetable_juice,
## margarine} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [16286] {fruit/vegetable_juice,
## margarine,
## whole_milk} => {bottled_water} 0.001016777 0.3030303 0.003355363 2.7417691 10
## [16287] {bottled_water,
## margarine,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.2040816 0.004982206 2.8229857 10
## [16288] {fruit/vegetable_juice,
## margarine,
## yogurt} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [16289] {fruit/vegetable_juice,
## margarine,
## other_vegetables} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [16290] {fruit/vegetable_juice,
## margarine,
## yogurt} => {whole_milk} 0.001525165 0.6521739 0.002338587 2.5523798 15
## [16291] {fruit/vegetable_juice,
## margarine,
## whole_milk} => {yogurt} 0.001525165 0.4545455 0.003355363 3.2583488 15
## [16292] {margarine,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001525165 0.2173913 0.007015760 3.0070935 15
## [16293] {fruit/vegetable_juice,
## margarine,
## other_vegetables} => {whole_milk} 0.001220132 0.4800000 0.002541942 1.8785515 12
## [16294] {fruit/vegetable_juice,
## margarine,
## whole_milk} => {other_vegetables} 0.001220132 0.3636364 0.003355363 1.8793293 12
## [16295] {bottled_water,
## margarine,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [16296] {margarine,
## whipped/sour_cream,
## whole_milk} => {bottled_water} 0.001016777 0.2500000 0.004067107 2.2619595 10
## [16297] {bottled_water,
## margarine,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2040816 0.004982206 2.8470111 10
## [16298] {bottled_water,
## whipped/sour_cream,
## whole_milk} => {margarine} 0.001016777 0.2325581 0.004372140 3.9708495 10
## [16299] {margarine,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001525165 0.7142857 0.002135231 5.1202624 15
## [16300] {margarine,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001525165 0.4838710 0.003152008 4.6113091 15
## [16301] {margarine,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001525165 0.3750000 0.004067107 5.2313830 15
## [16302] {tropical_fruit,
## whipped/sour_cream,
## yogurt} => {margarine} 0.001525165 0.2459016 0.006202339 4.1986851 15
## [16303] {margarine,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [16304] {margarine,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001321810 0.3823529 0.003457041 3.6438383 13
## [16305] {margarine,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001321810 0.3333333 0.003965430 4.6501182 13
## [16306] {margarine,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [16307] {margarine,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001423488 0.3500000 0.004067107 3.3355136 14
## [16308] {margarine,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001423488 0.3181818 0.004473818 4.4387492 14
## [16309] {margarine,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001220132 0.5454545 0.002236909 3.9100186 12
## [16310] {margarine,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001220132 0.3870968 0.003152008 3.5513962 12
## [16311] {margarine,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001220132 0.3529412 0.003457041 4.9236546 12
## [16312] {margarine,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001525165 0.6818182 0.002236909 3.5237424 15
## [16313] {margarine,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001525165 0.4411765 0.003457041 4.0475472 15
## [16314] {margarine,
## other_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.001525165 0.2586207 0.005897306 3.6078503 15
## [16315] {margarine,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.6818182 0.002236909 2.6683971 15
## [16316] {margarine,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001525165 0.3750000 0.004067107 3.4404151 15
## [16317] {margarine,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001525165 0.3061224 0.004982206 4.2705167 15
## [16318] {margarine,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001728521 0.5483871 0.003152008 2.8341498 17
## [16319] {margarine,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001728521 0.5000000 0.003457041 3.5841837 17
## [16320] {margarine,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001728521 0.3035714 0.005693950 4.2349291 17
## [16321] {margarine,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001931876 0.6129032 0.003152008 2.3986881 19
## [16322] {margarine,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001931876 0.4750000 0.004067107 3.4049745 19
## [16323] {margarine,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001931876 0.2753623 0.007015760 3.8414020 19
## [16324] {margarine,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.001626843 0.8888889 0.001830198 3.4787991 16
## [16325] {margarine,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001626843 0.4000000 0.004067107 2.1746821 16
## [16326] {margarine,
## rolls/buns,
## whole_milk} => {whipped/sour_cream} 0.001626843 0.2051282 0.007930859 2.8616112 16
## [16327] {rolls/buns,
## whipped/sour_cream,
## whole_milk} => {margarine} 0.001626843 0.2077922 0.007829181 3.5479798 16
## [16328] {margarine,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.002135231 0.6176471 0.003457041 2.4172538 21
## [16329] {margarine,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.002135231 0.5250000 0.004067107 2.7132817 21
## [16330] {margarine,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.002135231 0.2307692 0.009252669 3.2193126 21
## [16331] {bottled_water,
## margarine,
## pip_fruit} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [16332] {margarine,
## pip_fruit,
## whole_milk} => {bottled_water} 0.001016777 0.2564103 0.003965430 2.3199585 10
## [16333] {bottled_water,
## margarine,
## whole_milk} => {pip_fruit} 0.001016777 0.2040816 0.004982206 2.6977727 10
## [16334] {bottled_water,
## pip_fruit,
## whole_milk} => {margarine} 0.001016777 0.2222222 0.004575496 3.7943673 10
## [16335] {margarine,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001220132 0.5217391 0.002338587 3.7400177 12
## [16336] {margarine,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001220132 0.4615385 0.002643620 4.3984794 12
## [16337] {margarine,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001220132 0.3000000 0.004067107 3.9657258 12
## [16338] {margarine,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [16339] {margarine,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001220132 0.3428571 0.003558719 3.2674419 12
## [16340] {margarine,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001220132 0.3076923 0.003965430 4.0674111 12
## [16341] {margarine,
## pip_fruit,
## root_vegetables} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [16342] {margarine,
## pip_fruit,
## yogurt} => {root_vegetables} 0.001016777 0.3846154 0.002643620 3.5286309 10
## [16343] {margarine,
## root_vegetables,
## yogurt} => {pip_fruit} 0.001016777 0.2941176 0.003457041 3.8879665 10
## [16344] {margarine,
## pip_fruit,
## root_vegetables} => {other_vegetables} 0.001525165 0.5357143 0.002846975 2.7686548 15
## [16345] {margarine,
## other_vegetables,
## pip_fruit} => {root_vegetables} 0.001525165 0.4285714 0.003558719 3.9319030 15
## [16346] {margarine,
## other_vegetables,
## root_vegetables} => {pip_fruit} 0.001525165 0.2586207 0.005897306 3.4187291 15
## [16347] {margarine,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001118454 0.3928571 0.002846975 1.5375050 11
## [16348] {margarine,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001118454 0.2820513 0.003965430 2.5876626 11
## [16349] {margarine,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001118454 0.2244898 0.004982206 2.9675499 11
## [16350] {margarine,
## pip_fruit,
## yogurt} => {whole_milk} 0.001423488 0.5384615 0.002643620 2.1073495 14
## [16351] {margarine,
## pip_fruit,
## whole_milk} => {yogurt} 0.001423488 0.3589744 0.003965430 2.5732601 14
## [16352] {margarine,
## whole_milk,
## yogurt} => {pip_fruit} 0.001423488 0.2028986 0.007015760 2.6821334 14
## [16353] {margarine,
## pip_fruit,
## rolls/buns} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [16354] {margarine,
## pip_fruit,
## whole_milk} => {rolls/buns} 0.001118454 0.2820513 0.003965430 1.5334297 11
## [16355] {margarine,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.001423488 0.4000000 0.003558719 1.5654596 14
## [16356] {margarine,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.001423488 0.3589744 0.003965430 1.8552353 14
## [16357] {bottled_water,
## margarine,
## pastry} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [16358] {margarine,
## pastry,
## whole_milk} => {bottled_water} 0.001016777 0.2857143 0.003558719 2.5850966 10
## [16359] {bottled_water,
## margarine,
## whole_milk} => {pastry} 0.001016777 0.2040816 0.004982206 2.2938776 10
## [16360] {bottled_water,
## pastry,
## whole_milk} => {margarine} 0.001016777 0.2500000 0.004067107 4.2686632 10
## [16361] {margarine,
## pastry,
## tropical_fruit} => {yogurt} 0.001016777 0.5882353 0.001728521 4.2166867 10
## [16362] {margarine,
## pastry,
## yogurt} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [16363] {margarine,
## tropical_fruit,
## yogurt} => {pastry} 0.001016777 0.2500000 0.004067107 2.8100000 10
## [16364] {pastry,
## tropical_fruit,
## yogurt} => {margarine} 0.001016777 0.2173913 0.004677173 3.7118810 10
## [16365] {margarine,
## pastry,
## tropical_fruit} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [16366] {margarine,
## pastry,
## whole_milk} => {tropical_fruit} 0.001016777 0.2857143 0.003558719 2.7228682 10
## [16367] {margarine,
## tropical_fruit,
## whole_milk} => {pastry} 0.001016777 0.2272727 0.004473818 2.5545455 10
## [16368] {margarine,
## pastry,
## yogurt} => {rolls/buns} 0.001220132 0.4800000 0.002541942 2.6096186 12
## [16369] {margarine,
## pastry,
## rolls/buns} => {yogurt} 0.001220132 0.6315789 0.001931876 4.5273899 12
## [16370] {margarine,
## rolls/buns,
## yogurt} => {pastry} 0.001220132 0.2666667 0.004575496 2.9973333 12
## [16371] {pastry,
## rolls/buns,
## yogurt} => {margarine} 0.001220132 0.2105263 0.005795628 3.5946637 12
## [16372] {margarine,
## pastry,
## yogurt} => {other_vegetables} 0.001220132 0.4800000 0.002541942 2.4807147 12
## [16373] {margarine,
## other_vegetables,
## pastry} => {yogurt} 0.001220132 0.5000000 0.002440264 3.5841837 12
## [16374] {margarine,
## other_vegetables,
## yogurt} => {pastry} 0.001220132 0.2142857 0.005693950 2.4085714 12
## [16375] {margarine,
## pastry,
## yogurt} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [16376] {margarine,
## pastry,
## whole_milk} => {yogurt} 0.001525165 0.4285714 0.003558719 3.0721574 15
## [16377] {margarine,
## whole_milk,
## yogurt} => {pastry} 0.001525165 0.2173913 0.007015760 2.4434783 15
## [16378] {margarine,
## pastry,
## rolls/buns} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [16379] {margarine,
## pastry,
## whole_milk} => {rolls/buns} 0.001220132 0.3428571 0.003558719 1.8640133 12
## [16380] {margarine,
## other_vegetables,
## pastry} => {whole_milk} 0.001525165 0.6250000 0.002440264 2.4460306 15
## [16381] {margarine,
## pastry,
## whole_milk} => {other_vegetables} 0.001525165 0.4285714 0.003558719 2.2149238 15
## [16382] {citrus_fruit,
## margarine,
## tropical_fruit} => {yogurt} 0.001016777 0.5882353 0.001728521 4.2166867 10
## [16383] {citrus_fruit,
## margarine,
## yogurt} => {tropical_fruit} 0.001016777 0.3846154 0.002643620 3.6653995 10
## [16384] {margarine,
## tropical_fruit,
## yogurt} => {citrus_fruit} 0.001016777 0.2500000 0.004067107 3.0205774 10
## [16385] {citrus_fruit,
## margarine,
## root_vegetables} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [16386] {citrus_fruit,
## margarine,
## other_vegetables} => {root_vegetables} 0.001220132 0.4800000 0.002541942 4.4037313 12
## [16387] {margarine,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001220132 0.2068966 0.005897306 2.4997882 12
## [16388] {citrus_fruit,
## margarine,
## root_vegetables} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [16389] {citrus_fruit,
## margarine,
## whole_milk} => {root_vegetables} 0.001118454 0.3793103 0.002948653 3.4799601 11
## [16390] {margarine,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001118454 0.2244898 0.004982206 2.7123552 11
## [16391] {citrus_fruit,
## margarine,
## yogurt} => {whole_milk} 0.001423488 0.5384615 0.002643620 2.1073495 14
## [16392] {citrus_fruit,
## margarine,
## whole_milk} => {yogurt} 0.001423488 0.4827586 0.002948653 3.4605911 14
## [16393] {margarine,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001423488 0.2028986 0.007015760 2.4514831 14
## [16394] {citrus_fruit,
## margarine,
## other_vegetables} => {whole_milk} 0.001321810 0.5200000 0.002541942 2.0350975 13
## [16395] {citrus_fruit,
## margarine,
## whole_milk} => {other_vegetables} 0.001321810 0.4482759 0.002948653 2.3167594 13
## [16396] {margarine,
## root_vegetables,
## sausage} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [16397] {margarine,
## sausage,
## whole_milk} => {root_vegetables} 0.001220132 0.3636364 0.003355363 3.3361601 12
## [16398] {margarine,
## root_vegetables,
## whole_milk} => {sausage} 0.001220132 0.2448980 0.004982206 2.6066790 12
## [16399] {margarine,
## sausage,
## yogurt} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [16400] {margarine,
## sausage,
## whole_milk} => {yogurt} 0.001118454 0.3333333 0.003355363 2.3894558 11
## [16401] {margarine,
## rolls/buns,
## sausage} => {whole_milk} 0.001626843 0.5714286 0.002846975 2.2363709 16
## [16402] {margarine,
## sausage,
## whole_milk} => {rolls/buns} 0.001626843 0.4848485 0.003355363 2.6359784 16
## [16403] {margarine,
## rolls/buns,
## whole_milk} => {sausage} 0.001626843 0.2051282 0.007930859 2.1833722 16
## [16404] {margarine,
## other_vegetables,
## sausage} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [16405] {margarine,
## sausage,
## whole_milk} => {other_vegetables} 0.001118454 0.3333333 0.003355363 1.7227185 11
## [16406] {bottled_water,
## margarine,
## tropical_fruit} => {root_vegetables} 0.001118454 0.4782609 0.002338587 4.3877758 11
## [16407] {bottled_water,
## margarine,
## root_vegetables} => {tropical_fruit} 0.001118454 0.3928571 0.002846975 3.7439438 11
## [16408] {margarine,
## root_vegetables,
## tropical_fruit} => {bottled_water} 0.001118454 0.4782609 0.002338587 4.3272269 11
## [16409] {bottled_water,
## root_vegetables,
## tropical_fruit} => {margarine} 0.001118454 0.2444444 0.004575496 4.1738040 11
## [16410] {bottled_water,
## margarine,
## tropical_fruit} => {yogurt} 0.001626843 0.6956522 0.002338587 4.9866903 16
## [16411] {bottled_water,
## margarine,
## yogurt} => {tropical_fruit} 0.001626843 0.4571429 0.003558719 4.3565891 16
## [16412] {margarine,
## tropical_fruit,
## yogurt} => {bottled_water} 0.001626843 0.4000000 0.004067107 3.6191352 16
## [16413] {bottled_water,
## tropical_fruit,
## yogurt} => {margarine} 0.001626843 0.2285714 0.007117438 3.9027778 16
## [16414] {bottled_water,
## margarine,
## tropical_fruit} => {rolls/buns} 0.001016777 0.4347826 0.002338587 2.3637849 10
## [16415] {bottled_water,
## margarine,
## rolls/buns} => {tropical_fruit} 0.001016777 0.2857143 0.003558719 2.7228682 10
## [16416] {margarine,
## rolls/buns,
## tropical_fruit} => {bottled_water} 0.001016777 0.3448276 0.002948653 3.1199442 10
## [16417] {bottled_water,
## margarine,
## tropical_fruit} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [16418] {bottled_water,
## margarine,
## whole_milk} => {tropical_fruit} 0.001118454 0.2244898 0.004982206 2.1393965 11
## [16419] {margarine,
## tropical_fruit,
## whole_milk} => {bottled_water} 0.001118454 0.2500000 0.004473818 2.2619595 11
## [16420] {bottled_water,
## margarine,
## root_vegetables} => {yogurt} 0.001220132 0.4285714 0.002846975 3.0721574 12
## [16421] {bottled_water,
## margarine,
## yogurt} => {root_vegetables} 0.001220132 0.3428571 0.003558719 3.1455224 12
## [16422] {margarine,
## root_vegetables,
## yogurt} => {bottled_water} 0.001220132 0.3529412 0.003457041 3.1933546 12
## [16423] {bottled_water,
## root_vegetables,
## yogurt} => {margarine} 0.001220132 0.3157895 0.003863752 5.3919956 12
## [16424] {bottled_water,
## margarine,
## root_vegetables} => {other_vegetables} 0.001220132 0.4285714 0.002846975 2.2149238 12
## [16425] {bottled_water,
## margarine,
## other_vegetables} => {root_vegetables} 0.001220132 0.3529412 0.003457041 3.2380378 12
## [16426] {margarine,
## other_vegetables,
## root_vegetables} => {bottled_water} 0.001220132 0.2068966 0.005897306 1.8719665 12
## [16427] {bottled_water,
## margarine,
## root_vegetables} => {whole_milk} 0.001321810 0.4642857 0.002846975 1.8170513 13
## [16428] {bottled_water,
## margarine,
## whole_milk} => {root_vegetables} 0.001321810 0.2653061 0.004982206 2.4340352 13
## [16429] {margarine,
## root_vegetables,
## whole_milk} => {bottled_water} 0.001321810 0.2653061 0.004982206 2.4004468 13
## [16430] {bottled_water,
## margarine,
## soda} => {yogurt} 0.001118454 0.4583333 0.002440264 3.2855017 11
## [16431] {bottled_water,
## margarine,
## yogurt} => {soda} 0.001118454 0.3142857 0.003558719 1.8023324 11
## [16432] {margarine,
## soda,
## yogurt} => {bottled_water} 0.001118454 0.3928571 0.002846975 3.5545078 11
## [16433] {bottled_water,
## margarine,
## yogurt} => {rolls/buns} 0.001423488 0.4000000 0.003558719 2.1746821 14
## [16434] {bottled_water,
## margarine,
## rolls/buns} => {yogurt} 0.001423488 0.4000000 0.003558719 2.8673469 14
## [16435] {margarine,
## rolls/buns,
## yogurt} => {bottled_water} 0.001423488 0.3111111 0.004575496 2.8148830 14
## [16436] {bottled_water,
## rolls/buns,
## yogurt} => {margarine} 0.001423488 0.2000000 0.007117438 3.4149306 14
## [16437] {bottled_water,
## margarine,
## yogurt} => {other_vegetables} 0.001321810 0.3714286 0.003558719 1.9196006 13
## [16438] {bottled_water,
## margarine,
## other_vegetables} => {yogurt} 0.001321810 0.3823529 0.003457041 2.7408463 13
## [16439] {margarine,
## other_vegetables,
## yogurt} => {bottled_water} 0.001321810 0.2321429 0.005693950 2.1003910 13
## [16440] {bottled_water,
## margarine,
## yogurt} => {whole_milk} 0.001626843 0.4571429 0.003558719 1.7890967 16
## [16441] {bottled_water,
## margarine,
## whole_milk} => {yogurt} 0.001626843 0.3265306 0.004982206 2.3406914 16
## [16442] {margarine,
## whole_milk,
## yogurt} => {bottled_water} 0.001626843 0.2318841 0.007015760 2.0980494 16
## [16443] {bottled_water,
## margarine,
## rolls/buns} => {other_vegetables} 0.001321810 0.3714286 0.003558719 1.9196006 13
## [16444] {bottled_water,
## margarine,
## other_vegetables} => {rolls/buns} 0.001321810 0.3823529 0.003457041 2.0787403 13
## [16445] {margarine,
## other_vegetables,
## rolls/buns} => {bottled_water} 0.001321810 0.2549020 0.005185562 2.3063117 13
## [16446] {bottled_water,
## margarine,
## rolls/buns} => {whole_milk} 0.001931876 0.5428571 0.003558719 2.1245523 19
## [16447] {bottled_water,
## margarine,
## whole_milk} => {rolls/buns} 0.001931876 0.3877551 0.004982206 2.1081102 19
## [16448] {margarine,
## rolls/buns,
## whole_milk} => {bottled_water} 0.001931876 0.2435897 0.007930859 2.2039606 19
## [16449] {bottled_water,
## rolls/buns,
## whole_milk} => {margarine} 0.001931876 0.2209302 0.008744281 3.7723070 19
## [16450] {bottled_water,
## margarine,
## other_vegetables} => {whole_milk} 0.002033554 0.5882353 0.003457041 2.3021465 20
## [16451] {bottled_water,
## margarine,
## whole_milk} => {other_vegetables} 0.002033554 0.4081633 0.004982206 2.1094512 20
## [16452] {margarine,
## other_vegetables,
## whole_milk} => {bottled_water} 0.002033554 0.2197802 0.009252669 1.9885358 20
## [16453] {margarine,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001626843 0.6956522 0.002338587 4.9866903 16
## [16454] {margarine,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001626843 0.4000000 0.004067107 3.6697761 16
## [16455] {margarine,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001626843 0.4705882 0.003457041 4.4847241 16
## [16456] {root_vegetables,
## tropical_fruit,
## yogurt} => {margarine} 0.001626843 0.2000000 0.008134215 3.4149306 16
## [16457] {margarine,
## root_vegetables,
## tropical_fruit} => {rolls/buns} 0.001016777 0.4347826 0.002338587 2.3637849 10
## [16458] {margarine,
## rolls/buns,
## tropical_fruit} => {root_vegetables} 0.001016777 0.3448276 0.002948653 3.1636001 10
## [16459] {margarine,
## rolls/buns,
## root_vegetables} => {tropical_fruit} 0.001016777 0.3571429 0.002846975 3.4035853 10
## [16460] {margarine,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001321810 0.5652174 0.002338587 2.9211314 13
## [16461] {margarine,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001321810 0.3333333 0.003965430 3.0581468 13
## [16462] {margarine,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001321810 0.2241379 0.005897306 2.1360432 13
## [16463] {margarine,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001220132 0.5217391 0.002338587 2.0419038 12
## [16464] {margarine,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001220132 0.2727273 0.004473818 2.5021201 12
## [16465] {margarine,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001220132 0.2448980 0.004982206 2.3338870 12
## [16466] {margarine,
## soda,
## tropical_fruit} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [16467] {margarine,
## tropical_fruit,
## yogurt} => {soda} 0.001016777 0.2500000 0.004067107 1.4336735 10
## [16468] {margarine,
## soda,
## yogurt} => {tropical_fruit} 0.001016777 0.3571429 0.002846975 3.4035853 10
## [16469] {margarine,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001525165 0.3750000 0.004067107 2.0387645 15
## [16470] {margarine,
## rolls/buns,
## tropical_fruit} => {yogurt} 0.001525165 0.5172414 0.002948653 3.7077762 15
## [16471] {margarine,
## rolls/buns,
## yogurt} => {tropical_fruit} 0.001525165 0.3333333 0.004575496 3.1766796 15
## [16472] {margarine,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.002236909 0.5500000 0.004067107 2.8424855 22
## [16473] {margarine,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.002236909 0.5641026 0.003965430 4.0436944 22
## [16474] {margarine,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.002236909 0.3928571 0.005693950 3.7439438 22
## [16475] {margarine,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001931876 0.4750000 0.004067107 1.8589833 19
## [16476] {margarine,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001931876 0.4318182 0.004473818 3.0954314 19
## [16477] {margarine,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001931876 0.2753623 0.007015760 2.6242136 19
## [16478] {margarine,
## rolls/buns,
## tropical_fruit} => {other_vegetables} 0.001118454 0.3793103 0.002948653 1.9603349 11
## [16479] {margarine,
## other_vegetables,
## tropical_fruit} => {rolls/buns} 0.001118454 0.2820513 0.003965430 1.5334297 11
## [16480] {margarine,
## other_vegetables,
## rolls/buns} => {tropical_fruit} 0.001118454 0.2156863 0.005185562 2.0554986 11
## [16481] {margarine,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001728521 0.5862069 0.002948653 2.2942080 17
## [16482] {margarine,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001728521 0.3863636 0.004473818 2.1005453 17
## [16483] {margarine,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001728521 0.2179487 0.007930859 2.0770597 17
## [16484] {margarine,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001626843 0.4102564 0.003965430 1.6055996 16
## [16485] {margarine,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001626843 0.3636364 0.004473818 1.8793293 16
## [16486] {margarine,
## root_vegetables,
## yogurt} => {rolls/buns} 0.001321810 0.3823529 0.003457041 2.0787403 13
## [16487] {margarine,
## rolls/buns,
## root_vegetables} => {yogurt} 0.001321810 0.4642857 0.002846975 3.3281706 13
## [16488] {margarine,
## rolls/buns,
## yogurt} => {root_vegetables} 0.001321810 0.2888889 0.004575496 2.6503939 13
## [16489] {margarine,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001931876 0.5588235 0.003457041 2.8880869 19
## [16490] {margarine,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001931876 0.3275862 0.005897306 2.3482583 19
## [16491] {margarine,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001931876 0.3392857 0.005693950 3.1127565 19
## [16492] {margarine,
## root_vegetables,
## yogurt} => {whole_milk} 0.002135231 0.6176471 0.003457041 2.4172538 21
## [16493] {margarine,
## root_vegetables,
## whole_milk} => {yogurt} 0.002135231 0.4285714 0.004982206 3.0721574 21
## [16494] {margarine,
## whole_milk,
## yogurt} => {root_vegetables} 0.002135231 0.3043478 0.007015760 2.7922210 21
## [16495] {margarine,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001321810 0.4642857 0.002846975 2.3995008 13
## [16496] {margarine,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001321810 0.2241379 0.005897306 1.2185719 13
## [16497] {margarine,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001321810 0.2549020 0.005185562 2.3385828 13
## [16498] {margarine,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.002033554 0.7142857 0.002846975 2.7954636 20
## [16499] {margarine,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.002033554 0.4081633 0.004982206 2.2190634 20
## [16500] {margarine,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.002033554 0.2564103 0.007930859 2.3524206 20
## [16501] {margarine,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.003253686 0.5517241 0.005897306 2.1592546 32
## [16502] {margarine,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.003253686 0.6530612 0.004982206 3.3751220 32
## [16503] {margarine,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.003253686 0.3516484 0.009252669 3.2261768 32
## [16504] {margarine,
## soda,
## yogurt} => {rolls/buns} 0.001016777 0.3571429 0.002846975 1.9416805 10
## [16505] {margarine,
## rolls/buns,
## soda} => {yogurt} 0.001016777 0.3225806 0.003152008 2.3123766 10
## [16506] {margarine,
## rolls/buns,
## yogurt} => {soda} 0.001016777 0.2222222 0.004575496 1.2743764 10
## [16507] {margarine,
## rolls/buns,
## soda} => {other_vegetables} 0.001423488 0.4516129 0.003152008 2.3340057 14
## [16508] {margarine,
## other_vegetables,
## soda} => {rolls/buns} 0.001423488 0.5384615 0.002643620 2.9274567 14
## [16509] {margarine,
## other_vegetables,
## rolls/buns} => {soda} 0.001423488 0.2745098 0.005185562 1.5742297 14
## [16510] {margarine,
## rolls/buns,
## soda} => {whole_milk} 0.001220132 0.3870968 0.003152008 1.5149609 12
## [16511] {margarine,
## soda,
## whole_milk} => {rolls/buns} 0.001220132 0.3243243 0.003762074 1.7632558 12
## [16512] {margarine,
## other_vegetables,
## soda} => {whole_milk} 0.001118454 0.4230769 0.002643620 1.6557746 11
## [16513] {margarine,
## soda,
## whole_milk} => {other_vegetables} 0.001118454 0.2972973 0.003762074 1.5364787 11
## [16514] {margarine,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001931876 0.4222222 0.004575496 2.1821101 19
## [16515] {margarine,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001931876 0.3392857 0.005693950 1.8445965 19
## [16516] {margarine,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001931876 0.3725490 0.005185562 2.6705682 19
## [16517] {margarine,
## rolls/buns,
## yogurt} => {whole_milk} 0.002643620 0.5777778 0.004575496 2.2612194 26
## [16518] {margarine,
## whole_milk,
## yogurt} => {rolls/buns} 0.002643620 0.3768116 0.007015760 2.0486136 26
## [16519] {margarine,
## rolls/buns,
## whole_milk} => {yogurt} 0.002643620 0.3333333 0.007930859 2.3894558 26
## [16520] {margarine,
## other_vegetables,
## yogurt} => {whole_milk} 0.003152008 0.5535714 0.005693950 2.1664843 31
## [16521] {margarine,
## whole_milk,
## yogurt} => {other_vegetables} 0.003152008 0.4492754 0.007015760 2.3219250 31
## [16522] {margarine,
## other_vegetables,
## whole_milk} => {yogurt} 0.003152008 0.3406593 0.009252669 2.4419713 31
## [16523] {margarine,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.003152008 0.6078431 0.005185562 2.3788847 31
## [16524] {margarine,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.003152008 0.3974359 0.007930859 2.0540105 31
## [16525] {margarine,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.003152008 0.3406593 0.009252669 1.8520645 31
## [16526] {butter,
## newspapers,
## root_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [16527] {butter,
## newspapers,
## whole_milk} => {root_vegetables} 0.001016777 0.3225806 0.003152008 2.9594969 10
## [16528] {butter,
## newspapers,
## yogurt} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [16529] {butter,
## newspapers,
## whole_milk} => {yogurt} 0.001016777 0.3225806 0.003152008 2.3123766 10
## [16530] {butter,
## newspapers,
## other_vegetables} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [16531] {butter,
## newspapers,
## whole_milk} => {other_vegetables} 0.001321810 0.4193548 0.003152008 2.1672910 13
## [16532] {butter,
## domestic_eggs,
## whipped/sour_cream} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [16533] {butter,
## domestic_eggs,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3448276 0.002948653 4.8104671 10
## [16534] {butter,
## whipped/sour_cream,
## yogurt} => {domestic_eggs} 0.001016777 0.2631579 0.003863752 4.1476889 10
## [16535] {domestic_eggs,
## whipped/sour_cream,
## yogurt} => {butter} 0.001016777 0.2857143 0.003558719 5.1559633 10
## [16536] {butter,
## domestic_eggs,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [16537] {butter,
## domestic_eggs,
## other_vegetables} => {whipped/sour_cream} 0.001220132 0.2666667 0.004575496 3.7200946 12
## [16538] {butter,
## other_vegetables,
## whipped/sour_cream} => {domestic_eggs} 0.001220132 0.2105263 0.005795628 3.3181511 12
## [16539] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {butter} 0.001220132 0.2400000 0.005083884 4.3310092 12
## [16540] {butter,
## domestic_eggs,
## whipped/sour_cream} => {whole_milk} 0.001626843 0.8421053 0.001931876 3.2957044 16
## [16541] {butter,
## domestic_eggs,
## whole_milk} => {whipped/sour_cream} 0.001626843 0.2711864 0.005998983 3.7831470 16
## [16542] {butter,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001626843 0.2424242 0.006710727 3.8209013 16
## [16543] {domestic_eggs,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001626843 0.2857143 0.005693950 5.1559633 16
## [16544] {butter,
## domestic_eggs,
## pip_fruit} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [16545] {butter,
## domestic_eggs,
## whole_milk} => {pip_fruit} 0.001220132 0.2033898 0.005998983 2.6886277 12
## [16546] {butter,
## pip_fruit,
## whole_milk} => {domestic_eggs} 0.001220132 0.2727273 0.004473818 4.2985140 12
## [16547] {domestic_eggs,
## pip_fruit,
## whole_milk} => {butter} 0.001220132 0.2264151 0.005388917 4.0858577 12
## [16548] {butter,
## citrus_fruit,
## domestic_eggs} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [16549] {butter,
## domestic_eggs,
## other_vegetables} => {citrus_fruit} 0.001016777 0.2222222 0.004575496 2.6849577 10
## [16550] {butter,
## citrus_fruit,
## other_vegetables} => {domestic_eggs} 0.001016777 0.2222222 0.004575496 3.5024929 10
## [16551] {citrus_fruit,
## domestic_eggs,
## other_vegetables} => {butter} 0.001016777 0.2272727 0.004473818 4.1013344 10
## [16552] {butter,
## citrus_fruit,
## domestic_eggs} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [16553] {butter,
## citrus_fruit,
## whole_milk} => {domestic_eggs} 0.001016777 0.2000000 0.005083884 3.1522436 10
## [16554] {butter,
## domestic_eggs,
## sausage} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [16555] {butter,
## domestic_eggs,
## other_vegetables} => {sausage} 0.001016777 0.2222222 0.004575496 2.3653199 10
## [16556] {butter,
## other_vegetables,
## sausage} => {domestic_eggs} 0.001016777 0.2631579 0.003863752 4.1476889 10
## [16557] {domestic_eggs,
## other_vegetables,
## sausage} => {butter} 0.001016777 0.2702703 0.003762074 4.8772626 10
## [16558] {butter,
## domestic_eggs,
## sausage} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [16559] {butter,
## domestic_eggs,
## whole_milk} => {sausage} 0.001220132 0.2033898 0.005998983 2.1648690 12
## [16560] {butter,
## sausage,
## whole_milk} => {domestic_eggs} 0.001220132 0.2553191 0.004778851 4.0241408 12
## [16561] {domestic_eggs,
## sausage,
## whole_milk} => {butter} 0.001220132 0.2727273 0.004473818 4.9216013 12
## [16562] {bottled_water,
## butter,
## domestic_eggs} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [16563] {butter,
## domestic_eggs,
## other_vegetables} => {bottled_water} 0.001118454 0.2444444 0.004575496 2.2116938 11
## [16564] {bottled_water,
## butter,
## other_vegetables} => {domestic_eggs} 0.001118454 0.3055556 0.003660397 4.8159277 11
## [16565] {bottled_water,
## domestic_eggs,
## other_vegetables} => {butter} 0.001118454 0.2750000 0.004067107 4.9626147 11
## [16566] {bottled_water,
## butter,
## domestic_eggs} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [16567] {butter,
## domestic_eggs,
## whole_milk} => {bottled_water} 0.001220132 0.2033898 0.005998983 1.8402383 12
## [16568] {bottled_water,
## butter,
## whole_milk} => {domestic_eggs} 0.001220132 0.2264151 0.005388917 3.5685776 12
## [16569] {bottled_water,
## domestic_eggs,
## whole_milk} => {butter} 0.001220132 0.2500000 0.004880529 4.5114679 12
## [16570] {butter,
## domestic_eggs,
## tropical_fruit} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [16571] {butter,
## domestic_eggs,
## root_vegetables} => {tropical_fruit} 0.001016777 0.3125000 0.003253686 2.9781371 10
## [16572] {butter,
## root_vegetables,
## tropical_fruit} => {domestic_eggs} 0.001016777 0.2857143 0.003558719 4.5032051 10
## [16573] {domestic_eggs,
## root_vegetables,
## tropical_fruit} => {butter} 0.001016777 0.2857143 0.003558719 5.1559633 10
## [16574] {butter,
## domestic_eggs,
## tropical_fruit} => {yogurt} 0.001321810 0.5652174 0.002338587 4.0516859 13
## [16575] {butter,
## domestic_eggs,
## yogurt} => {tropical_fruit} 0.001321810 0.4482759 0.002948653 4.2720863 13
## [16576] {butter,
## tropical_fruit,
## yogurt} => {domestic_eggs} 0.001321810 0.2888889 0.004575496 4.5532407 13
## [16577] {domestic_eggs,
## tropical_fruit,
## yogurt} => {butter} 0.001321810 0.3095238 0.004270463 5.5856269 13
## [16578] {butter,
## domestic_eggs,
## tropical_fruit} => {other_vegetables} 0.001728521 0.7391304 0.002338587 3.8199411 17
## [16579] {butter,
## domestic_eggs,
## other_vegetables} => {tropical_fruit} 0.001728521 0.3777778 0.004575496 3.6002369 17
## [16580] {butter,
## other_vegetables,
## tropical_fruit} => {domestic_eggs} 0.001728521 0.3148148 0.005490595 4.9618649 17
## [16581] {domestic_eggs,
## other_vegetables,
## tropical_fruit} => {butter} 0.001728521 0.3617021 0.004778851 6.5272301 17
## [16582] {butter,
## domestic_eggs,
## tropical_fruit} => {whole_milk} 0.001830198 0.7826087 0.002338587 3.0628558 18
## [16583] {butter,
## domestic_eggs,
## whole_milk} => {tropical_fruit} 0.001830198 0.3050847 0.005998983 2.9074695 18
## [16584] {butter,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.001830198 0.2950820 0.006202339 4.6508512 18
## [16585] {domestic_eggs,
## tropical_fruit,
## whole_milk} => {butter} 0.001830198 0.2647059 0.006914082 4.7768484 18
## [16586] {butter,
## domestic_eggs,
## root_vegetables} => {yogurt} 0.001220132 0.3750000 0.003253686 2.6881378 12
## [16587] {butter,
## domestic_eggs,
## yogurt} => {root_vegetables} 0.001220132 0.4137931 0.002948653 3.7963201 12
## [16588] {butter,
## root_vegetables,
## yogurt} => {domestic_eggs} 0.001220132 0.3157895 0.003863752 4.9772267 12
## [16589] {domestic_eggs,
## root_vegetables,
## yogurt} => {butter} 0.001220132 0.3333333 0.003660397 6.0152905 12
## [16590] {butter,
## domestic_eggs,
## root_vegetables} => {other_vegetables} 0.001931876 0.5937500 0.003253686 3.0685924 19
## [16591] {butter,
## domestic_eggs,
## other_vegetables} => {root_vegetables} 0.001931876 0.4222222 0.004575496 3.8736526 19
## [16592] {butter,
## other_vegetables,
## root_vegetables} => {domestic_eggs} 0.001931876 0.2923077 0.006609049 4.6071252 19
## [16593] {domestic_eggs,
## other_vegetables,
## root_vegetables} => {butter} 0.001931876 0.2638889 0.007320793 4.7621050 19
## [16594] {butter,
## domestic_eggs,
## root_vegetables} => {whole_milk} 0.002440264 0.7500000 0.003253686 2.9352368 24
## [16595] {butter,
## domestic_eggs,
## whole_milk} => {root_vegetables} 0.002440264 0.4067797 0.005998983 3.7319757 24
## [16596] {butter,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.002440264 0.2962963 0.008235892 4.6699905 24
## [16597] {domestic_eggs,
## root_vegetables,
## whole_milk} => {butter} 0.002440264 0.2857143 0.008540925 5.1559633 24
## [16598] {butter,
## domestic_eggs,
## yogurt} => {other_vegetables} 0.001728521 0.5862069 0.002948653 3.0296084 17
## [16599] {butter,
## domestic_eggs,
## other_vegetables} => {yogurt} 0.001728521 0.3777778 0.004575496 2.7080499 17
## [16600] {butter,
## other_vegetables,
## yogurt} => {domestic_eggs} 0.001728521 0.2698413 0.006405694 4.2530271 17
## [16601] {domestic_eggs,
## other_vegetables,
## yogurt} => {butter} 0.001728521 0.2982456 0.005795628 5.3821020 17
## [16602] {butter,
## domestic_eggs,
## yogurt} => {whole_milk} 0.002236909 0.7586207 0.002948653 2.9689751 22
## [16603] {butter,
## domestic_eggs,
## whole_milk} => {yogurt} 0.002236909 0.3728814 0.005998983 2.6729505 22
## [16604] {butter,
## whole_milk,
## yogurt} => {domestic_eggs} 0.002236909 0.2391304 0.009354347 3.7689869 22
## [16605] {domestic_eggs,
## whole_milk,
## yogurt} => {butter} 0.002236909 0.2894737 0.007727504 5.2238049 22
## [16606] {butter,
## domestic_eggs,
## rolls/buns} => {other_vegetables} 0.001525165 0.6000000 0.002541942 3.1008933 15
## [16607] {butter,
## domestic_eggs,
## other_vegetables} => {rolls/buns} 0.001525165 0.3333333 0.004575496 1.8122351 15
## [16608] {butter,
## other_vegetables,
## rolls/buns} => {domestic_eggs} 0.001525165 0.2678571 0.005693950 4.2217548 15
## [16609] {domestic_eggs,
## other_vegetables,
## rolls/buns} => {butter} 0.001525165 0.2586207 0.005897306 4.6670357 15
## [16610] {butter,
## domestic_eggs,
## rolls/buns} => {whole_milk} 0.001321810 0.5200000 0.002541942 2.0350975 13
## [16611] {butter,
## domestic_eggs,
## whole_milk} => {rolls/buns} 0.001321810 0.2203390 0.005998983 1.1979181 13
## [16612] {butter,
## rolls/buns,
## whole_milk} => {domestic_eggs} 0.001321810 0.2000000 0.006609049 3.1522436 13
## [16613] {domestic_eggs,
## rolls/buns,
## whole_milk} => {butter} 0.001321810 0.2000000 0.006609049 3.6091743 13
## [16614] {butter,
## domestic_eggs,
## other_vegetables} => {whole_milk} 0.003050330 0.6666667 0.004575496 2.6090994 30
## [16615] {butter,
## domestic_eggs,
## whole_milk} => {other_vegetables} 0.003050330 0.5084746 0.005998983 2.6278757 30
## [16616] {butter,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.003050330 0.2654867 0.011489578 4.1843941 30
## [16617] {domestic_eggs,
## other_vegetables,
## whole_milk} => {butter} 0.003050330 0.2479339 0.012302999 4.4741830 30
## [16618] {butter,
## fruit/vegetable_juice,
## whipped/sour_cream} => {tropical_fruit} 0.001016777 0.4761905 0.002135231 4.5381137 10
## [16619] {butter,
## fruit/vegetable_juice,
## tropical_fruit} => {whipped/sour_cream} 0.001016777 0.4000000 0.002541942 5.5801418 10
## [16620] {butter,
## tropical_fruit,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001016777 0.3333333 0.003050330 4.6108767 10
## [16621] {fruit/vegetable_juice,
## tropical_fruit,
## whipped/sour_cream} => {butter} 0.001016777 0.4761905 0.002135231 8.5932722 10
## [16622] {butter,
## fruit/vegetable_juice,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.4761905 0.002135231 4.3687811 10
## [16623] {butter,
## fruit/vegetable_juice,
## root_vegetables} => {whipped/sour_cream} 0.001016777 0.5000000 0.002033554 6.9751773 10
## [16624] {butter,
## root_vegetables,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001016777 0.2941176 0.003457041 4.0684206 10
## [16625] {fruit/vegetable_juice,
## root_vegetables,
## whipped/sour_cream} => {butter} 0.001016777 0.3571429 0.002846975 6.4449541 10
## [16626] {butter,
## fruit/vegetable_juice,
## whipped/sour_cream} => {yogurt} 0.001321810 0.6190476 0.002135231 4.4375607 13
## [16627] {butter,
## fruit/vegetable_juice,
## yogurt} => {whipped/sour_cream} 0.001321810 0.3714286 0.003558719 5.1815603 13
## [16628] {butter,
## whipped/sour_cream,
## yogurt} => {fruit/vegetable_juice} 0.001321810 0.3421053 0.003863752 4.7322156 13
## [16629] {fruit/vegetable_juice,
## whipped/sour_cream,
## yogurt} => {butter} 0.001321810 0.3421053 0.003863752 6.1735876 13
## [16630] {butter,
## fruit/vegetable_juice,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.6666667 0.002135231 3.4454370 14
## [16631] {butter,
## fruit/vegetable_juice,
## other_vegetables} => {whipped/sour_cream} 0.001423488 0.4242424 0.003355363 5.9183323 14
## [16632] {butter,
## other_vegetables,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001423488 0.2456140 0.005795628 3.3974881 14
## [16633] {fruit/vegetable_juice,
## other_vegetables,
## whipped/sour_cream} => {butter} 0.001423488 0.3333333 0.004270463 6.0152905 14
## [16634] {butter,
## fruit/vegetable_juice,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [16635] {butter,
## fruit/vegetable_juice,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.2682927 0.004168785 3.7427781 11
## [16636] {fruit/vegetable_juice,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001118454 0.2500000 0.004473818 4.5114679 11
## [16637] {butter,
## fruit/vegetable_juice,
## sausage} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [16638] {butter,
## fruit/vegetable_juice,
## whole_milk} => {sausage} 0.001118454 0.2682927 0.004168785 2.8556911 11
## [16639] {butter,
## sausage,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.2340426 0.004778851 3.2374241 11
## [16640] {fruit/vegetable_juice,
## sausage,
## whole_milk} => {butter} 0.001118454 0.2291667 0.004880529 4.1355122 11
## [16641] {bottled_water,
## butter,
## fruit/vegetable_juice} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [16642] {butter,
## fruit/vegetable_juice,
## whole_milk} => {bottled_water} 0.001118454 0.2682927 0.004168785 2.4274688 11
## [16643] {bottled_water,
## butter,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.2075472 0.005388917 2.8709232 11
## [16644] {butter,
## fruit/vegetable_juice,
## tropical_fruit} => {yogurt} 0.001423488 0.5600000 0.002541942 4.0142857 14
## [16645] {butter,
## fruit/vegetable_juice,
## yogurt} => {tropical_fruit} 0.001423488 0.4000000 0.003558719 3.8120155 14
## [16646] {butter,
## tropical_fruit,
## yogurt} => {fruit/vegetable_juice} 0.001423488 0.3111111 0.004575496 4.3034849 14
## [16647] {fruit/vegetable_juice,
## tropical_fruit,
## yogurt} => {butter} 0.001423488 0.2916667 0.004880529 5.2633792 14
## [16648] {butter,
## fruit/vegetable_juice,
## tropical_fruit} => {other_vegetables} 0.001525165 0.6000000 0.002541942 3.1008933 15
## [16649] {butter,
## fruit/vegetable_juice,
## other_vegetables} => {tropical_fruit} 0.001525165 0.4545455 0.003355363 4.3318358 15
## [16650] {butter,
## other_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.001525165 0.2777778 0.005490595 3.8423972 15
## [16651] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit} => {butter} 0.001525165 0.2307692 0.006609049 4.1644319 15
## [16652] {butter,
## fruit/vegetable_juice,
## tropical_fruit} => {whole_milk} 0.001321810 0.5200000 0.002541942 2.0350975 13
## [16653] {butter,
## fruit/vegetable_juice,
## whole_milk} => {tropical_fruit} 0.001321810 0.3170732 0.004168785 3.0217196 13
## [16654] {butter,
## tropical_fruit,
## whole_milk} => {fruit/vegetable_juice} 0.001321810 0.2131148 0.006202339 2.9479376 13
## [16655] {fruit/vegetable_juice,
## tropical_fruit,
## whole_milk} => {butter} 0.001321810 0.2203390 0.005998983 3.9762090 13
## [16656] {butter,
## fruit/vegetable_juice,
## root_vegetables} => {other_vegetables} 0.001321810 0.6500000 0.002033554 3.3593011 13
## [16657] {butter,
## fruit/vegetable_juice,
## other_vegetables} => {root_vegetables} 0.001321810 0.3939394 0.003355363 3.6141735 13
## [16658] {butter,
## other_vegetables,
## root_vegetables} => {fruit/vegetable_juice} 0.001321810 0.2000000 0.006609049 2.7665260 13
## [16659] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {butter} 0.001321810 0.2000000 0.006609049 3.6091743 13
## [16660] {butter,
## fruit/vegetable_juice,
## root_vegetables} => {whole_milk} 0.001423488 0.7000000 0.002033554 2.7395543 14
## [16661] {butter,
## fruit/vegetable_juice,
## whole_milk} => {root_vegetables} 0.001423488 0.3414634 0.004168785 3.1327357 14
## [16662] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {butter} 0.001423488 0.2187500 0.006507372 3.9475344 14
## [16663] {butter,
## fruit/vegetable_juice,
## yogurt} => {other_vegetables} 0.001626843 0.4571429 0.003558719 2.3625854 16
## [16664] {butter,
## fruit/vegetable_juice,
## other_vegetables} => {yogurt} 0.001626843 0.4848485 0.003355363 3.4755720 16
## [16665] {butter,
## other_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.001626843 0.2539683 0.006405694 3.5130489 16
## [16666] {butter,
## fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.002135231 0.6000000 0.003558719 2.3481894 21
## [16667] {butter,
## fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.002135231 0.5121951 0.004168785 3.6716028 21
## [16668] {butter,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.002135231 0.2282609 0.009354347 3.1574482 21
## [16669] {fruit/vegetable_juice,
## whole_milk,
## yogurt} => {butter} 0.002135231 0.2258065 0.009456024 4.0748742 21
## [16670] {butter,
## fruit/vegetable_juice,
## other_vegetables} => {whole_milk} 0.001931876 0.5757576 0.003355363 2.2533131 19
## [16671] {butter,
## fruit/vegetable_juice,
## whole_milk} => {other_vegetables} 0.001931876 0.4634146 0.004168785 2.3949989 19
## [16672] {butter,
## pip_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001525165 0.7500000 0.002033554 3.8761167 15
## [16673] {butter,
## other_vegetables,
## whipped/sour_cream} => {pip_fruit} 0.001525165 0.2631579 0.005795628 3.4787068 15
## [16674] {butter,
## other_vegetables,
## pip_fruit} => {whipped/sour_cream} 0.001525165 0.3750000 0.004067107 5.2313830 15
## [16675] {other_vegetables,
## pip_fruit,
## whipped/sour_cream} => {butter} 0.001525165 0.2727273 0.005592272 4.9216013 15
## [16676] {butter,
## pip_fruit,
## whipped/sour_cream} => {whole_milk} 0.001830198 0.9000000 0.002033554 3.5222841 18
## [16677] {butter,
## whipped/sour_cream,
## whole_milk} => {pip_fruit} 0.001830198 0.2727273 0.006710727 3.6052053 18
## [16678] {butter,
## pip_fruit,
## whole_milk} => {whipped/sour_cream} 0.001830198 0.4090909 0.004473818 5.7069632 18
## [16679] {pip_fruit,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001830198 0.3050847 0.005998983 5.5055201 18
## [16680] {butter,
## pastry,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [16681] {butter,
## other_vegetables,
## whipped/sour_cream} => {pastry} 0.001220132 0.2105263 0.005795628 2.3663158 12
## [16682] {butter,
## other_vegetables,
## pastry} => {whipped/sour_cream} 0.001220132 0.3157895 0.003863752 4.4053751 12
## [16683] {other_vegetables,
## pastry,
## whipped/sour_cream} => {butter} 0.001220132 0.2926829 0.004168785 5.2817185 12
## [16684] {butter,
## pastry,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [16685] {butter,
## pastry,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.3076923 0.003965430 4.2924168 12
## [16686] {pastry,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001220132 0.2926829 0.004168785 5.2817185 12
## [16687] {butter,
## citrus_fruit,
## whipped/sour_cream} => {yogurt} 0.001016777 0.4347826 0.002338587 3.1166815 10
## [16688] {butter,
## whipped/sour_cream,
## yogurt} => {citrus_fruit} 0.001016777 0.2631579 0.003863752 3.1795552 10
## [16689] {butter,
## citrus_fruit,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3333333 0.003050330 4.6501182 10
## [16690] {citrus_fruit,
## whipped/sour_cream,
## yogurt} => {butter} 0.001016777 0.2222222 0.004575496 4.0101937 10
## [16691] {butter,
## citrus_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [16692] {butter,
## other_vegetables,
## whipped/sour_cream} => {citrus_fruit} 0.001220132 0.2105263 0.005795628 2.5436441 12
## [16693] {butter,
## citrus_fruit,
## other_vegetables} => {whipped/sour_cream} 0.001220132 0.2666667 0.004575496 3.7200946 12
## [16694] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream} => {butter} 0.001220132 0.2142857 0.005693950 3.8669725 12
## [16695] {butter,
## citrus_fruit,
## whipped/sour_cream} => {whole_milk} 0.001728521 0.7391304 0.002338587 2.8926971 17
## [16696] {butter,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.001728521 0.2575758 0.006710727 3.1121100 17
## [16697] {butter,
## citrus_fruit,
## whole_milk} => {whipped/sour_cream} 0.001728521 0.3400000 0.005083884 4.7431206 17
## [16698] {citrus_fruit,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001728521 0.2741935 0.006304016 4.9480616 17
## [16699] {butter,
## sausage,
## whipped/sour_cream} => {other_vegetables} 0.001626843 0.6400000 0.002541942 3.3076195 16
## [16700] {butter,
## other_vegetables,
## whipped/sour_cream} => {sausage} 0.001626843 0.2807018 0.005795628 2.9877725 16
## [16701] {butter,
## other_vegetables,
## sausage} => {whipped/sour_cream} 0.001626843 0.4210526 0.003863752 5.8738335 16
## [16702] {other_vegetables,
## sausage,
## whipped/sour_cream} => {butter} 0.001626843 0.3333333 0.004880529 6.0152905 16
## [16703] {butter,
## sausage,
## whipped/sour_cream} => {whole_milk} 0.001728521 0.6800000 0.002541942 2.6612813 17
## [16704] {butter,
## whipped/sour_cream,
## whole_milk} => {sausage} 0.001728521 0.2575758 0.006710727 2.7416208 17
## [16705] {butter,
## sausage,
## whole_milk} => {whipped/sour_cream} 0.001728521 0.3617021 0.004778851 5.0458729 17
## [16706] {sausage,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001728521 0.3400000 0.005083884 6.1355963 17
## [16707] {bottled_water,
## butter,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [16708] {bottled_water,
## butter,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.2264151 0.005388917 3.1585709 12
## [16709] {bottled_water,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001220132 0.2790698 0.004372140 5.0360572 12
## [16710] {butter,
## tropical_fruit,
## whipped/sour_cream} => {root_vegetables} 0.001321810 0.4333333 0.003050330 3.9755908 13
## [16711] {butter,
## root_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001321810 0.3823529 0.003457041 3.6438383 13
## [16712] {butter,
## root_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001321810 0.3714286 0.003558719 5.1815603 13
## [16713] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {butter} 0.001321810 0.2888889 0.004575496 5.2132518 13
## [16714] {butter,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001525165 0.5000000 0.003050330 3.5841837 15
## [16715] {butter,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001525165 0.3947368 0.003863752 3.7618574 15
## [16716] {butter,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001525165 0.3333333 0.004575496 4.6501182 15
## [16717] {tropical_fruit,
## whipped/sour_cream,
## yogurt} => {butter} 0.001525165 0.2459016 0.006202339 4.4375094 15
## [16718] {butter,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.002338587 0.7666667 0.003050330 3.9622526 23
## [16719] {butter,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.002338587 0.4035088 0.005795628 3.8454542 23
## [16720] {butter,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.002338587 0.4259259 0.005490595 5.9418177 23
## [16721] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {butter} 0.002338587 0.2987013 0.007829181 5.3903253 23
## [16722] {butter,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.002135231 0.7000000 0.003050330 2.7395543 21
## [16723] {butter,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.002135231 0.3181818 0.006710727 3.0322851 21
## [16724] {butter,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.002135231 0.3442623 0.006202339 4.8025811 21
## [16725] {tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {butter} 0.002135231 0.2692308 0.007930859 4.8585039 21
## [16726] {butter,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001321810 0.3823529 0.003457041 2.7408463 13
## [16727] {butter,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001321810 0.3421053 0.003863752 3.1386243 13
## [16728] {butter,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001321810 0.3421053 0.003863752 4.7724897 13
## [16729] {root_vegetables,
## whipped/sour_cream,
## yogurt} => {butter} 0.001321810 0.2063492 0.006405694 3.7237513 13
## [16730] {butter,
## root_vegetables,
## whipped/sour_cream} => {rolls/buns} 0.001321810 0.3823529 0.003457041 2.0787403 13
## [16731] {butter,
## rolls/buns,
## whipped/sour_cream} => {root_vegetables} 0.001321810 0.4814815 0.002745297 4.4173231 13
## [16732] {butter,
## rolls/buns,
## root_vegetables} => {whipped/sour_cream} 0.001321810 0.3421053 0.003863752 4.7724897 13
## [16733] {rolls/buns,
## root_vegetables,
## whipped/sour_cream} => {butter} 0.001321810 0.3023256 0.004372140 5.4557286 13
## [16734] {butter,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.002135231 0.6176471 0.003457041 3.1920961 21
## [16735] {butter,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.002135231 0.3684211 0.005795628 3.3800570 21
## [16736] {butter,
## other_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.002135231 0.3230769 0.006609049 4.5070376 21
## [16737] {other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {butter} 0.002135231 0.2500000 0.008540925 4.5114679 21
## [16738] {butter,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.002643620 0.7647059 0.003457041 2.9927904 26
## [16739] {butter,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.002643620 0.3939394 0.006710727 3.6141735 26
## [16740] {butter,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.002643620 0.3209877 0.008235892 4.4778916 26
## [16741] {root_vegetables,
## whipped/sour_cream,
## whole_milk} => {butter} 0.002643620 0.2795699 0.009456024 5.0450824 26
## [16742] {butter,
## soda,
## whipped/sour_cream} => {other_vegetables} 0.001321810 0.9285714 0.001423488 4.7990016 13
## [16743] {butter,
## other_vegetables,
## whipped/sour_cream} => {soda} 0.001321810 0.2280702 0.005795628 1.3079126 13
## [16744] {butter,
## other_vegetables,
## soda} => {whipped/sour_cream} 0.001321810 0.3714286 0.003558719 5.1815603 13
## [16745] {other_vegetables,
## soda,
## whipped/sour_cream} => {butter} 0.001321810 0.2708333 0.004880529 4.8874235 13
## [16746] {butter,
## soda,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [16747] {butter,
## soda,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.3666667 0.003050330 5.1151300 11
## [16748] {soda,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001118454 0.2037037 0.005490595 3.6760109 11
## [16749] {butter,
## whipped/sour_cream,
## yogurt} => {rolls/buns} 0.001016777 0.2631579 0.003863752 1.4307119 10
## [16750] {butter,
## rolls/buns,
## whipped/sour_cream} => {yogurt} 0.001016777 0.3703704 0.002745297 2.6549509 10
## [16751] {butter,
## rolls/buns,
## yogurt} => {whipped/sour_cream} 0.001016777 0.2272727 0.004473818 3.1705351 10
## [16752] {rolls/buns,
## whipped/sour_cream,
## yogurt} => {butter} 0.001016777 0.2127660 0.004778851 3.8395471 10
## [16753] {butter,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.002135231 0.5526316 0.003863752 2.8560860 21
## [16754] {butter,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.002135231 0.3684211 0.005795628 2.6409774 21
## [16755] {butter,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.002135231 0.3333333 0.006405694 4.6501182 21
## [16756] {other_vegetables,
## whipped/sour_cream,
## yogurt} => {butter} 0.002135231 0.2100000 0.010167768 3.7896330 21
## [16757] {butter,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.002643620 0.6842105 0.003863752 2.6777599 26
## [16758] {butter,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.002643620 0.3939394 0.006710727 2.8239023 26
## [16759] {butter,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.002643620 0.2826087 0.009354347 3.9424915 26
## [16760] {whipped/sour_cream,
## whole_milk,
## yogurt} => {butter} 0.002643620 0.2429907 0.010879512 4.3849781 26
## [16761] {butter,
## rolls/buns,
## whipped/sour_cream} => {other_vegetables} 0.001525165 0.5555556 0.002745297 2.8711975 15
## [16762] {butter,
## other_vegetables,
## whipped/sour_cream} => {rolls/buns} 0.001525165 0.2631579 0.005795628 1.4307119 15
## [16763] {butter,
## other_vegetables,
## rolls/buns} => {whipped/sour_cream} 0.001525165 0.2678571 0.005693950 3.7367021 15
## [16764] {other_vegetables,
## rolls/buns,
## whipped/sour_cream} => {butter} 0.001525165 0.2272727 0.006710727 4.1013344 15
## [16765] {butter,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.001626843 0.5925926 0.002745297 2.3191994 16
## [16766] {butter,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001626843 0.2424242 0.006710727 1.3179892 16
## [16767] {butter,
## rolls/buns,
## whole_milk} => {whipped/sour_cream} 0.001626843 0.2461538 0.006609049 3.4339334 16
## [16768] {rolls/buns,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001626843 0.2077922 0.007829181 3.7497915 16
## [16769] {butter,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.003965430 0.6842105 0.005795628 2.6777599 39
## [16770] {butter,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.003965430 0.5909091 0.006710727 3.0539101 39
## [16771] {butter,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.003965430 0.3451327 0.011489578 4.8147242 39
## [16772] {other_vegetables,
## whipped/sour_cream,
## whole_milk} => {butter} 0.003965430 0.2708333 0.014641586 4.8874235 39
## [16773] {butter,
## pastry,
## pip_fruit} => {other_vegetables} 0.001321810 0.9285714 0.001423488 4.7990016 13
## [16774] {butter,
## other_vegetables,
## pip_fruit} => {pastry} 0.001321810 0.3250000 0.004067107 3.6530000 13
## [16775] {butter,
## other_vegetables,
## pastry} => {pip_fruit} 0.001321810 0.3421053 0.003863752 4.5223189 13
## [16776] {other_vegetables,
## pastry,
## pip_fruit} => {butter} 0.001321810 0.2826087 0.004677173 5.0999202 13
## [16777] {butter,
## citrus_fruit,
## pip_fruit} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [16778] {butter,
## other_vegetables,
## pip_fruit} => {citrus_fruit} 0.001016777 0.2500000 0.004067107 3.0205774 10
## [16779] {butter,
## citrus_fruit,
## other_vegetables} => {pip_fruit} 0.001016777 0.2222222 0.004575496 2.9375747 10
## [16780] {butter,
## citrus_fruit,
## pip_fruit} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [16781] {butter,
## pip_fruit,
## whole_milk} => {citrus_fruit} 0.001118454 0.2500000 0.004473818 3.0205774 11
## [16782] {butter,
## citrus_fruit,
## whole_milk} => {pip_fruit} 0.001118454 0.2200000 0.005083884 2.9081989 11
## [16783] {citrus_fruit,
## pip_fruit,
## whole_milk} => {butter} 0.001118454 0.2156863 0.005185562 3.8922468 11
## [16784] {butter,
## pip_fruit,
## sausage} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [16785] {butter,
## pip_fruit,
## whole_milk} => {sausage} 0.001321810 0.2954545 0.004473818 3.1448003 13
## [16786] {butter,
## sausage,
## whole_milk} => {pip_fruit} 0.001321810 0.2765957 0.004778851 3.6563429 13
## [16787] {pip_fruit,
## sausage,
## whole_milk} => {butter} 0.001321810 0.2363636 0.005592272 4.2653878 13
## [16788] {bottled_water,
## butter,
## pip_fruit} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [16789] {butter,
## other_vegetables,
## pip_fruit} => {bottled_water} 0.001016777 0.2500000 0.004067107 2.2619595 10
## [16790] {bottled_water,
## butter,
## other_vegetables} => {pip_fruit} 0.001016777 0.2777778 0.003660397 3.6719683 10
## [16791] {bottled_water,
## other_vegetables,
## pip_fruit} => {butter} 0.001016777 0.3333333 0.003050330 6.0152905 10
## [16792] {bottled_water,
## butter,
## pip_fruit} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [16793] {butter,
## pip_fruit,
## whole_milk} => {bottled_water} 0.001321810 0.2954545 0.004473818 2.6732249 13
## [16794] {bottled_water,
## butter,
## whole_milk} => {pip_fruit} 0.001321810 0.2452830 0.005388917 3.2424173 13
## [16795] {bottled_water,
## pip_fruit,
## whole_milk} => {butter} 0.001321810 0.2888889 0.004575496 5.2132518 13
## [16796] {butter,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [16797] {butter,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001220132 0.3000000 0.004067107 2.8590116 12
## [16798] {butter,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001220132 0.2222222 0.005490595 2.9375747 12
## [16799] {butter,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [16800] {butter,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001118454 0.2500000 0.004473818 2.3825097 11
## [16801] {butter,
## pip_fruit,
## root_vegetables} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [16802] {butter,
## other_vegetables,
## pip_fruit} => {root_vegetables} 0.001118454 0.2750000 0.004067107 2.5229711 11
## [16803] {butter,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001728521 0.8095238 0.002135231 3.1681921 17
## [16804] {butter,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001728521 0.3863636 0.004473818 3.5446701 17
## [16805] {butter,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001728521 0.2098765 0.008235892 2.7743761 17
## [16806] {butter,
## pip_fruit,
## yogurt} => {other_vegetables} 0.001321810 0.5652174 0.002338587 2.9211314 13
## [16807] {butter,
## other_vegetables,
## pip_fruit} => {yogurt} 0.001321810 0.3250000 0.004067107 2.3297194 13
## [16808] {butter,
## other_vegetables,
## yogurt} => {pip_fruit} 0.001321810 0.2063492 0.006405694 2.7277479 13
## [16809] {butter,
## pip_fruit,
## yogurt} => {whole_milk} 0.001728521 0.7391304 0.002338587 2.8926971 17
## [16810] {butter,
## pip_fruit,
## whole_milk} => {yogurt} 0.001728521 0.3863636 0.004473818 2.7695965 17
## [16811] {butter,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.002745297 0.6750000 0.004067107 2.6417131 27
## [16812] {butter,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.002745297 0.6136364 0.004473818 3.1713682 27
## [16813] {butter,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.002745297 0.2389381 0.011489578 3.1585427 27
## [16814] {other_vegetables,
## pip_fruit,
## whole_milk} => {butter} 0.002745297 0.2030075 0.013523132 3.6634476 27
## [16815] {butter,
## pastry,
## sausage} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [16816] {butter,
## pastry,
## whole_milk} => {sausage} 0.001016777 0.2564103 0.003965430 2.7292152 10
## [16817] {butter,
## sausage,
## whole_milk} => {pastry} 0.001016777 0.2127660 0.004778851 2.3914894 10
## [16818] {butter,
## pastry,
## tropical_fruit} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [16819] {butter,
## other_vegetables,
## pastry} => {tropical_fruit} 0.001016777 0.2631579 0.003863752 2.5079049 10
## [16820] {other_vegetables,
## pastry,
## tropical_fruit} => {butter} 0.001016777 0.2000000 0.005083884 3.6091743 10
## [16821] {butter,
## pastry,
## soda} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [16822] {butter,
## other_vegetables,
## pastry} => {soda} 0.001016777 0.2631579 0.003863752 1.5091300 10
## [16823] {butter,
## other_vegetables,
## soda} => {pastry} 0.001016777 0.2857143 0.003558719 3.2114286 10
## [16824] {butter,
## pastry,
## soda} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [16825] {butter,
## pastry,
## whole_milk} => {soda} 0.001118454 0.2820513 0.003965430 1.6174778 11
## [16826] {butter,
## soda,
## whole_milk} => {pastry} 0.001118454 0.3666667 0.003050330 4.1213333 11
## [16827] {butter,
## pastry,
## yogurt} => {other_vegetables} 0.001321810 0.6500000 0.002033554 3.3593011 13
## [16828] {butter,
## other_vegetables,
## pastry} => {yogurt} 0.001321810 0.3421053 0.003863752 2.4523362 13
## [16829] {butter,
## other_vegetables,
## yogurt} => {pastry} 0.001321810 0.2063492 0.006405694 2.3193651 13
## [16830] {other_vegetables,
## pastry,
## yogurt} => {butter} 0.001321810 0.2000000 0.006609049 3.6091743 13
## [16831] {butter,
## pastry,
## yogurt} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [16832] {butter,
## pastry,
## whole_milk} => {yogurt} 0.001118454 0.2820513 0.003965430 2.0218472 11
## [16833] {butter,
## pastry,
## rolls/buns} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [16834] {butter,
## other_vegetables,
## pastry} => {rolls/buns} 0.001016777 0.2631579 0.003863752 1.4307119 10
## [16835] {butter,
## pastry,
## rolls/buns} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [16836] {butter,
## pastry,
## whole_milk} => {rolls/buns} 0.001016777 0.2564103 0.003965430 1.3940270 10
## [16837] {butter,
## other_vegetables,
## pastry} => {whole_milk} 0.002236909 0.5789474 0.003863752 2.2657968 22
## [16838] {butter,
## pastry,
## whole_milk} => {other_vegetables} 0.002236909 0.5641026 0.003965430 2.9153698 22
## [16839] {other_vegetables,
## pastry,
## whole_milk} => {butter} 0.002236909 0.2115385 0.010574479 3.8173959 22
## [16840] {butter,
## citrus_fruit,
## sausage} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [16841] {butter,
## citrus_fruit,
## other_vegetables} => {sausage} 0.001016777 0.2222222 0.004575496 2.3653199 10
## [16842] {butter,
## other_vegetables,
## sausage} => {citrus_fruit} 0.001016777 0.2631579 0.003863752 3.1795552 10
## [16843] {citrus_fruit,
## other_vegetables,
## sausage} => {butter} 0.001016777 0.2272727 0.004473818 4.1013344 10
## [16844] {butter,
## citrus_fruit,
## sausage} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [16845] {butter,
## citrus_fruit,
## whole_milk} => {sausage} 0.001016777 0.2000000 0.005083884 2.1287879 10
## [16846] {butter,
## sausage,
## whole_milk} => {citrus_fruit} 0.001016777 0.2127660 0.004778851 2.5707042 10
## [16847] {citrus_fruit,
## sausage,
## whole_milk} => {butter} 0.001016777 0.2040816 0.004982206 3.6828309 10
## [16848] {bottled_water,
## butter,
## citrus_fruit} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [16849] {butter,
## citrus_fruit,
## other_vegetables} => {bottled_water} 0.001118454 0.2444444 0.004575496 2.2116938 11
## [16850] {bottled_water,
## butter,
## other_vegetables} => {citrus_fruit} 0.001118454 0.3055556 0.003660397 3.6918168 11
## [16851] {bottled_water,
## citrus_fruit,
## other_vegetables} => {butter} 0.001118454 0.2200000 0.005083884 3.9700917 11
## [16852] {bottled_water,
## butter,
## citrus_fruit} => {whole_milk} 0.001423488 0.7368421 0.001931876 2.8837414 14
## [16853] {butter,
## citrus_fruit,
## whole_milk} => {bottled_water} 0.001423488 0.2800000 0.005083884 2.5333947 14
## [16854] {bottled_water,
## butter,
## whole_milk} => {citrus_fruit} 0.001423488 0.2641509 0.005388917 3.1915535 14
## [16855] {bottled_water,
## citrus_fruit,
## whole_milk} => {butter} 0.001423488 0.2413793 0.005897306 4.3559000 14
## [16856] {butter,
## citrus_fruit,
## tropical_fruit} => {yogurt} 0.001118454 0.5500000 0.002033554 3.9426020 11
## [16857] {butter,
## citrus_fruit,
## yogurt} => {tropical_fruit} 0.001118454 0.3666667 0.003050330 3.4943475 11
## [16858] {butter,
## tropical_fruit,
## yogurt} => {citrus_fruit} 0.001118454 0.2444444 0.004575496 2.9534535 11
## [16859] {butter,
## citrus_fruit,
## tropical_fruit} => {other_vegetables} 0.001423488 0.7000000 0.002033554 3.6177089 14
## [16860] {butter,
## citrus_fruit,
## other_vegetables} => {tropical_fruit} 0.001423488 0.3111111 0.004575496 2.9649009 14
## [16861] {butter,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001423488 0.2592593 0.005490595 3.1324506 14
## [16862] {butter,
## citrus_fruit,
## tropical_fruit} => {whole_milk} 0.001626843 0.8000000 0.002033554 3.1309192 16
## [16863] {butter,
## citrus_fruit,
## whole_milk} => {tropical_fruit} 0.001626843 0.3200000 0.005083884 3.0496124 16
## [16864] {butter,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001626843 0.2622951 0.006202339 3.1691304 16
## [16865] {butter,
## citrus_fruit,
## root_vegetables} => {other_vegetables} 0.001830198 0.6923077 0.002643620 3.5779538 18
## [16866] {butter,
## citrus_fruit,
## other_vegetables} => {root_vegetables} 0.001830198 0.4000000 0.004575496 3.6697761 18
## [16867] {butter,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001830198 0.2769231 0.006609049 3.3458703 18
## [16868] {butter,
## citrus_fruit,
## root_vegetables} => {whole_milk} 0.001830198 0.6923077 0.002643620 2.7094493 18
## [16869] {butter,
## citrus_fruit,
## whole_milk} => {root_vegetables} 0.001830198 0.3600000 0.005083884 3.3027985 18
## [16870] {butter,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001830198 0.2222222 0.008235892 2.6849577 18
## [16871] {citrus_fruit,
## root_vegetables,
## whole_milk} => {butter} 0.001830198 0.2000000 0.009150991 3.6091743 18
## [16872] {butter,
## citrus_fruit,
## soda} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [16873] {butter,
## citrus_fruit,
## other_vegetables} => {soda} 0.001016777 0.2222222 0.004575496 1.2743764 10
## [16874] {butter,
## other_vegetables,
## soda} => {citrus_fruit} 0.001016777 0.2857143 0.003558719 3.4520885 10
## [16875] {citrus_fruit,
## other_vegetables,
## soda} => {butter} 0.001016777 0.2439024 0.004168785 4.4014321 10
## [16876] {butter,
## citrus_fruit,
## yogurt} => {rolls/buns} 0.001016777 0.3333333 0.003050330 1.8122351 10
## [16877] {butter,
## citrus_fruit,
## rolls/buns} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [16878] {butter,
## rolls/buns,
## yogurt} => {citrus_fruit} 0.001016777 0.2272727 0.004473818 2.7459795 10
## [16879] {butter,
## citrus_fruit,
## yogurt} => {other_vegetables} 0.001220132 0.4000000 0.003050330 2.0672622 12
## [16880] {butter,
## citrus_fruit,
## other_vegetables} => {yogurt} 0.001220132 0.2666667 0.004575496 1.9115646 12
## [16881] {butter,
## citrus_fruit,
## yogurt} => {whole_milk} 0.002033554 0.6666667 0.003050330 2.6090994 20
## [16882] {butter,
## citrus_fruit,
## whole_milk} => {yogurt} 0.002033554 0.4000000 0.005083884 2.8673469 20
## [16883] {butter,
## whole_milk,
## yogurt} => {citrus_fruit} 0.002033554 0.2173913 0.009354347 2.6265890 20
## [16884] {butter,
## citrus_fruit,
## rolls/buns} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [16885] {butter,
## citrus_fruit,
## other_vegetables} => {rolls/buns} 0.001118454 0.2444444 0.004575496 1.3289724 11
## [16886] {butter,
## citrus_fruit,
## rolls/buns} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [16887] {butter,
## citrus_fruit,
## whole_milk} => {rolls/buns} 0.001118454 0.2200000 0.005083884 1.1960752 11
## [16888] {butter,
## citrus_fruit,
## other_vegetables} => {whole_milk} 0.002948653 0.6444444 0.004575496 2.5221294 29
## [16889] {butter,
## citrus_fruit,
## whole_milk} => {other_vegetables} 0.002948653 0.5800000 0.005083884 2.9975302 29
## [16890] {butter,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.002948653 0.2566372 0.011489578 3.1007697 29
## [16891] {citrus_fruit,
## other_vegetables,
## whole_milk} => {butter} 0.002948653 0.2265625 0.013014743 4.0885178 29
## [16892] {butter,
## sausage,
## tropical_fruit} => {yogurt} 0.001220132 0.5217391 0.002338587 3.7400177 12
## [16893] {butter,
## sausage,
## yogurt} => {tropical_fruit} 0.001220132 0.4800000 0.002541942 4.5744186 12
## [16894] {butter,
## tropical_fruit,
## yogurt} => {sausage} 0.001220132 0.2666667 0.004575496 2.8383838 12
## [16895] {sausage,
## tropical_fruit,
## yogurt} => {butter} 0.001220132 0.2608696 0.004677173 4.7076187 12
## [16896] {butter,
## sausage,
## tropical_fruit} => {other_vegetables} 0.001525165 0.6521739 0.002338587 3.3705362 15
## [16897] {butter,
## other_vegetables,
## sausage} => {tropical_fruit} 0.001525165 0.3947368 0.003863752 3.7618574 15
## [16898] {butter,
## other_vegetables,
## tropical_fruit} => {sausage} 0.001525165 0.2777778 0.005490595 2.9566498 15
## [16899] {other_vegetables,
## sausage,
## tropical_fruit} => {butter} 0.001525165 0.2542373 0.005998983 4.5879334 15
## [16900] {butter,
## sausage,
## tropical_fruit} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [16901] {butter,
## sausage,
## whole_milk} => {tropical_fruit} 0.001423488 0.2978723 0.004778851 2.8387349 14
## [16902] {butter,
## tropical_fruit,
## whole_milk} => {sausage} 0.001423488 0.2295082 0.006202339 2.4428713 14
## [16903] {butter,
## root_vegetables,
## sausage} => {rolls/buns} 0.001016777 0.4545455 0.002236909 2.4712297 10
## [16904] {butter,
## rolls/buns,
## sausage} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [16905] {butter,
## rolls/buns,
## root_vegetables} => {sausage} 0.001016777 0.2631579 0.003863752 2.8010367 10
## [16906] {rolls/buns,
## root_vegetables,
## sausage} => {butter} 0.001016777 0.2040816 0.004982206 3.6828309 10
## [16907] {butter,
## root_vegetables,
## sausage} => {whole_milk} 0.001728521 0.7727273 0.002236909 3.0241833 17
## [16908] {butter,
## sausage,
## whole_milk} => {root_vegetables} 0.001728521 0.3617021 0.004778851 3.3184146 17
## [16909] {butter,
## root_vegetables,
## whole_milk} => {sausage} 0.001728521 0.2098765 0.008235892 2.2339132 17
## [16910] {root_vegetables,
## sausage,
## whole_milk} => {butter} 0.001728521 0.2236842 0.007727504 4.0365765 17
## [16911] {butter,
## sausage,
## yogurt} => {other_vegetables} 0.001423488 0.5600000 0.002541942 2.8941671 14
## [16912] {butter,
## other_vegetables,
## sausage} => {yogurt} 0.001423488 0.3684211 0.003863752 2.6409774 14
## [16913] {butter,
## other_vegetables,
## yogurt} => {sausage} 0.001423488 0.2222222 0.006405694 2.3653199 14
## [16914] {butter,
## sausage,
## yogurt} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [16915] {butter,
## sausage,
## whole_milk} => {yogurt} 0.001525165 0.3191489 0.004778851 2.2877768 15
## [16916] {butter,
## rolls/buns,
## sausage} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [16917] {butter,
## other_vegetables,
## sausage} => {rolls/buns} 0.001118454 0.2894737 0.003863752 1.5737831 11
## [16918] {butter,
## rolls/buns,
## sausage} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [16919] {butter,
## sausage,
## whole_milk} => {rolls/buns} 0.001118454 0.2340426 0.004778851 1.2724204 11
## [16920] {butter,
## other_vegetables,
## sausage} => {whole_milk} 0.002338587 0.6052632 0.003863752 2.3687876 23
## [16921] {butter,
## sausage,
## whole_milk} => {other_vegetables} 0.002338587 0.4893617 0.004778851 2.5290974 23
## [16922] {butter,
## other_vegetables,
## whole_milk} => {sausage} 0.002338587 0.2035398 0.011489578 2.1664655 23
## [16923] {other_vegetables,
## sausage,
## whole_milk} => {butter} 0.002338587 0.2300000 0.010167768 4.1505505 23
## [16924] {bottled_water,
## butter,
## tropical_fruit} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [16925] {bottled_water,
## butter,
## yogurt} => {tropical_fruit} 0.001016777 0.4166667 0.002440264 3.9708495 10
## [16926] {butter,
## tropical_fruit,
## yogurt} => {bottled_water} 0.001016777 0.2222222 0.004575496 2.0106307 10
## [16927] {bottled_water,
## butter,
## tropical_fruit} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [16928] {bottled_water,
## butter,
## whole_milk} => {tropical_fruit} 0.001423488 0.2641509 0.005388917 2.5173687 14
## [16929] {butter,
## tropical_fruit,
## whole_milk} => {bottled_water} 0.001423488 0.2295082 0.006202339 2.0765530 14
## [16930] {bottled_water,
## butter,
## root_vegetables} => {other_vegetables} 0.001830198 0.5454545 0.003355363 2.8189939 18
## [16931] {bottled_water,
## butter,
## other_vegetables} => {root_vegetables} 0.001830198 0.5000000 0.003660397 4.5872201 18
## [16932] {butter,
## other_vegetables,
## root_vegetables} => {bottled_water} 0.001830198 0.2769231 0.006609049 2.5055552 18
## [16933] {bottled_water,
## other_vegetables,
## root_vegetables} => {butter} 0.001830198 0.2608696 0.007015760 4.7076187 18
## [16934] {bottled_water,
## butter,
## root_vegetables} => {whole_milk} 0.002440264 0.7272727 0.003355363 2.8462902 24
## [16935] {bottled_water,
## butter,
## whole_milk} => {root_vegetables} 0.002440264 0.4528302 0.005388917 4.1544635 24
## [16936] {butter,
## root_vegetables,
## whole_milk} => {bottled_water} 0.002440264 0.2962963 0.008235892 2.6808409 24
## [16937] {bottled_water,
## root_vegetables,
## whole_milk} => {butter} 0.002440264 0.3333333 0.007320793 6.0152905 24
## [16938] {bottled_water,
## butter,
## soda} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [16939] {bottled_water,
## butter,
## yogurt} => {soda} 0.001016777 0.4166667 0.002440264 2.3894558 10
## [16940] {butter,
## soda,
## yogurt} => {bottled_water} 0.001016777 0.4347826 0.002338587 3.9338426 10
## [16941] {bottled_water,
## butter,
## yogurt} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [16942] {bottled_water,
## butter,
## other_vegetables} => {yogurt} 0.001016777 0.2777778 0.003660397 1.9912132 10
## [16943] {bottled_water,
## butter,
## yogurt} => {whole_milk} 0.001321810 0.5416667 0.002440264 2.1198932 13
## [16944] {bottled_water,
## butter,
## whole_milk} => {yogurt} 0.001321810 0.2452830 0.005388917 1.7582788 13
## [16945] {bottled_water,
## butter,
## other_vegetables} => {whole_milk} 0.002643620 0.7222222 0.003660397 2.8265243 26
## [16946] {bottled_water,
## butter,
## whole_milk} => {other_vegetables} 0.002643620 0.4905660 0.005388917 2.5353216 26
## [16947] {butter,
## other_vegetables,
## whole_milk} => {bottled_water} 0.002643620 0.2300885 0.011489578 2.0818035 26
## [16948] {bottled_water,
## other_vegetables,
## whole_milk} => {butter} 0.002643620 0.2452830 0.010777834 4.4263459 26
## [16949] {butter,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001931876 0.5428571 0.003558719 3.8913994 19
## [16950] {butter,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001931876 0.4222222 0.004575496 3.8736526 19
## [16951] {butter,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001931876 0.5000000 0.003863752 4.7650194 19
## [16952] {root_vegetables,
## tropical_fruit,
## yogurt} => {butter} 0.001931876 0.2375000 0.008134215 4.2858945 19
## [16953] {butter,
## root_vegetables,
## tropical_fruit} => {rolls/buns} 0.001118454 0.3142857 0.003558719 1.7086788 11
## [16954] {butter,
## rolls/buns,
## tropical_fruit} => {root_vegetables} 0.001118454 0.4400000 0.002541942 4.0367537 11
## [16955] {butter,
## rolls/buns,
## root_vegetables} => {tropical_fruit} 0.001118454 0.2894737 0.003863752 2.7586954 11
## [16956] {butter,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.002338587 0.6571429 0.003558719 3.3962165 23
## [16957] {butter,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.002338587 0.4259259 0.005490595 3.9076320 23
## [16958] {butter,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.002338587 0.3538462 0.006609049 3.3721676 23
## [16959] {butter,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.002440264 0.6857143 0.003558719 2.6836450 24
## [16960] {butter,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.002440264 0.3934426 0.006202339 3.6096159 24
## [16961] {butter,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.002440264 0.2962963 0.008235892 2.8237152 24
## [16962] {root_vegetables,
## tropical_fruit,
## whole_milk} => {butter} 0.002440264 0.2033898 0.011997966 3.6703468 24
## [16963] {butter,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001118454 0.2444444 0.004575496 1.3289724 11
## [16964] {butter,
## rolls/buns,
## tropical_fruit} => {yogurt} 0.001118454 0.4400000 0.002541942 3.1540816 11
## [16965] {butter,
## rolls/buns,
## yogurt} => {tropical_fruit} 0.001118454 0.2500000 0.004473818 2.3825097 11
## [16966] {butter,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.003050330 0.6666667 0.004575496 3.4454370 30
## [16967] {butter,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.003050330 0.5555556 0.005490595 3.9824263 30
## [16968] {butter,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.003050330 0.4761905 0.006405694 4.5381137 30
## [16969] {other_vegetables,
## tropical_fruit,
## yogurt} => {butter} 0.003050330 0.2479339 0.012302999 4.4741830 30
## [16970] {butter,
## tropical_fruit,
## yogurt} => {whole_milk} 0.003355363 0.7333333 0.004575496 2.8700093 33
## [16971] {butter,
## tropical_fruit,
## whole_milk} => {yogurt} 0.003355363 0.5409836 0.006202339 3.8779692 33
## [16972] {butter,
## whole_milk,
## yogurt} => {tropical_fruit} 0.003355363 0.3586957 0.009354347 3.4183835 33
## [16973] {tropical_fruit,
## whole_milk,
## yogurt} => {butter} 0.003355363 0.2214765 0.015149975 3.9967367 33
## [16974] {butter,
## rolls/buns,
## tropical_fruit} => {other_vegetables} 0.001423488 0.5600000 0.002541942 2.8941671 14
## [16975] {butter,
## other_vegetables,
## tropical_fruit} => {rolls/buns} 0.001423488 0.2592593 0.005490595 1.4095162 14
## [16976] {butter,
## other_vegetables,
## rolls/buns} => {tropical_fruit} 0.001423488 0.2500000 0.005693950 2.3825097 14
## [16977] {butter,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001525165 0.6000000 0.002541942 2.3481894 15
## [16978] {butter,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001525165 0.2459016 0.006202339 1.3368948 15
## [16979] {butter,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001525165 0.2307692 0.006609049 2.1992397 15
## [16980] {butter,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.003355363 0.6111111 0.005490595 2.3916744 33
## [16981] {butter,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.003355363 0.5409836 0.006202339 2.7958874 33
## [16982] {butter,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.003355363 0.2920354 0.011489578 2.7831087 33
## [16983] {butter,
## root_vegetables,
## soda} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [16984] {butter,
## other_vegetables,
## soda} => {root_vegetables} 0.001220132 0.3428571 0.003558719 3.1455224 12
## [16985] {butter,
## root_vegetables,
## soda} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [16986] {butter,
## soda,
## whole_milk} => {root_vegetables} 0.001220132 0.4000000 0.003050330 3.6697761 12
## [16987] {butter,
## root_vegetables,
## yogurt} => {other_vegetables} 0.002135231 0.5526316 0.003863752 2.8560860 21
## [16988] {butter,
## other_vegetables,
## root_vegetables} => {yogurt} 0.002135231 0.3230769 0.006609049 2.3159341 21
## [16989] {butter,
## other_vegetables,
## yogurt} => {root_vegetables} 0.002135231 0.3333333 0.006405694 3.0581468 21
## [16990] {butter,
## root_vegetables,
## yogurt} => {whole_milk} 0.003050330 0.7894737 0.003863752 3.0897229 30
## [16991] {butter,
## root_vegetables,
## whole_milk} => {yogurt} 0.003050330 0.3703704 0.008235892 2.6549509 30
## [16992] {butter,
## whole_milk,
## yogurt} => {root_vegetables} 0.003050330 0.3260870 0.009354347 2.9916653 30
## [16993] {root_vegetables,
## whole_milk,
## yogurt} => {butter} 0.003050330 0.2097902 0.014539908 3.7858472 30
## [16994] {butter,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.002440264 0.6315789 0.003863752 3.2640982 24
## [16995] {butter,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.002440264 0.3692308 0.006609049 2.0073989 24
## [16996] {butter,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.002440264 0.4285714 0.005693950 3.9319030 24
## [16997] {other_vegetables,
## rolls/buns,
## root_vegetables} => {butter} 0.002440264 0.2000000 0.012201322 3.6091743 24
## [16998] {butter,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.002338587 0.6052632 0.003863752 2.3687876 23
## [16999] {butter,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.002338587 0.2839506 0.008235892 1.5437558 23
## [17000] {butter,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.002338587 0.3538462 0.006609049 3.2463404 23
## [17001] {butter,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.004168785 0.6307692 0.006609049 2.4686094 41
## [17002] {butter,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.004168785 0.5061728 0.008235892 2.6159800 41
## [17003] {butter,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.004168785 0.3628319 0.011489578 3.3287792 41
## [17004] {butter,
## other_vegetables,
## soda} => {whole_milk} 0.001626843 0.4571429 0.003558719 1.7890967 16
## [17005] {butter,
## soda,
## whole_milk} => {other_vegetables} 0.001626843 0.5333333 0.003050330 2.7563496 16
## [17006] {butter,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001525165 0.3409091 0.004473818 1.7618712 15
## [17007] {butter,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001525165 0.2380952 0.006405694 1.2944537 15
## [17008] {butter,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001525165 0.2678571 0.005693950 1.9200984 15
## [17009] {butter,
## rolls/buns,
## yogurt} => {whole_milk} 0.002541942 0.5681818 0.004473818 2.2236642 25
## [17010] {butter,
## whole_milk,
## yogurt} => {rolls/buns} 0.002541942 0.2717391 0.009354347 1.4773656 25
## [17011] {butter,
## rolls/buns,
## whole_milk} => {yogurt} 0.002541942 0.3846154 0.006609049 2.7570644 25
## [17012] {butter,
## other_vegetables,
## yogurt} => {whole_milk} 0.004372140 0.6825397 0.006405694 2.6712208 43
## [17013] {butter,
## whole_milk,
## yogurt} => {other_vegetables} 0.004372140 0.4673913 0.009354347 2.4155510 43
## [17014] {butter,
## other_vegetables,
## whole_milk} => {yogurt} 0.004372140 0.3805310 0.011489578 2.7277858 43
## [17015] {butter,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.002846975 0.5000000 0.005693950 1.9568245 28
## [17016] {butter,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.002846975 0.4307692 0.006609049 2.2262824 28
## [17017] {butter,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.002846975 0.2477876 0.011489578 1.3471482 28
## [17018] {domestic_eggs,
## newspapers,
## root_vegetables} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [17019] {domestic_eggs,
## newspapers,
## whole_milk} => {root_vegetables} 0.001118454 0.3793103 0.002948653 3.4799601 11
## [17020] {domestic_eggs,
## newspapers,
## other_vegetables} => {whole_milk} 0.001016777 0.4166667 0.002440264 1.6306871 10
## [17021] {domestic_eggs,
## newspapers,
## whole_milk} => {other_vegetables} 0.001016777 0.3448276 0.002948653 1.7821226 10
## [17022] {bottled_water,
## fruit/vegetable_juice,
## newspapers} => {soda} 0.001016777 0.5555556 0.001830198 3.1859410 10
## [17023] {fruit/vegetable_juice,
## newspapers,
## soda} => {bottled_water} 0.001016777 0.4166667 0.002440264 3.7699325 10
## [17024] {bottled_water,
## newspapers,
## soda} => {fruit/vegetable_juice} 0.001016777 0.2857143 0.003558719 3.9521800 10
## [17025] {citrus_fruit,
## newspapers,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [17026] {newspapers,
## other_vegetables,
## whipped/sour_cream} => {citrus_fruit} 0.001016777 0.3125000 0.003253686 3.7757217 10
## [17027] {citrus_fruit,
## newspapers,
## other_vegetables} => {whipped/sour_cream} 0.001016777 0.2702703 0.003762074 3.7703661 10
## [17028] {newspapers,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001118454 0.6111111 0.001830198 4.3806689 11
## [17029] {newspapers,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001118454 0.4074074 0.002745297 3.7377349 11
## [17030] {newspapers,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3333333 0.003355363 4.6501182 11
## [17031] {newspapers,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [17032] {newspapers,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001118454 0.3437500 0.003253686 3.1537139 11
## [17033] {newspapers,
## whipped/sour_cream,
## yogurt} => {rolls/buns} 0.001016777 0.3703704 0.002745297 2.0135946 10
## [17034] {newspapers,
## rolls/buns,
## whipped/sour_cream} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [17035] {newspapers,
## rolls/buns,
## yogurt} => {whipped/sour_cream} 0.001016777 0.2000000 0.005083884 2.7900709 10
## [17036] {rolls/buns,
## whipped/sour_cream,
## yogurt} => {newspapers} 0.001016777 0.2127660 0.004778851 2.6656729 10
## [17037] {newspapers,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001525165 0.5555556 0.002745297 2.8711975 15
## [17038] {newspapers,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001525165 0.4687500 0.003253686 3.3601722 15
## [17039] {newspapers,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001525165 0.2727273 0.005592272 3.8046422 15
## [17040] {newspapers,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001220132 0.4444444 0.002745297 1.7393996 12
## [17041] {newspapers,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001220132 0.4285714 0.002846975 3.0721574 12
## [17042] {newspapers,
## rolls/buns,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [17043] {newspapers,
## other_vegetables,
## whipped/sour_cream} => {rolls/buns} 0.001118454 0.3437500 0.003253686 1.8688675 11
## [17044] {newspapers,
## other_vegetables,
## rolls/buns} => {whipped/sour_cream} 0.001118454 0.2037037 0.005490595 2.8417389 11
## [17045] {newspapers,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [17046] {newspapers,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001118454 0.3928571 0.002846975 2.1358485 11
## [17047] {newspapers,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.4062500 0.003253686 1.5899199 13
## [17048] {newspapers,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001321810 0.4642857 0.002846975 2.3995008 13
## [17049] {newspapers,
## pip_fruit,
## yogurt} => {rolls/buns} 0.001016777 0.5263158 0.001931876 2.8614239 10
## [17050] {newspapers,
## pip_fruit,
## rolls/buns} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [17051] {newspapers,
## rolls/buns,
## yogurt} => {pip_fruit} 0.001016777 0.2000000 0.005083884 2.6438172 10
## [17052] {pip_fruit,
## rolls/buns,
## yogurt} => {newspapers} 0.001016777 0.2564103 0.003965430 3.2124775 10
## [17053] {newspapers,
## pastry,
## soda} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [17054] {newspapers,
## other_vegetables,
## pastry} => {soda} 0.001321810 0.5416667 0.002440264 3.1062925 13
## [17055] {newspapers,
## other_vegetables,
## soda} => {pastry} 0.001321810 0.2653061 0.004982206 2.9820408 13
## [17056] {other_vegetables,
## pastry,
## soda} => {newspapers} 0.001321810 0.2407407 0.005490595 3.0161595 13
## [17057] {newspapers,
## pastry,
## soda} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [17058] {newspapers,
## pastry,
## whole_milk} => {soda} 0.001016777 0.2631579 0.003863752 1.5091300 10
## [17059] {newspapers,
## soda,
## whole_milk} => {pastry} 0.001016777 0.2127660 0.004778851 2.3914894 10
## [17060] {newspapers,
## pastry,
## yogurt} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [17061] {newspapers,
## pastry,
## whole_milk} => {yogurt} 0.001118454 0.2894737 0.003863752 2.0750537 11
## [17062] {newspapers,
## pastry,
## rolls/buns} => {whole_milk} 0.001525165 0.5172414 0.002948653 2.0243012 15
## [17063] {newspapers,
## pastry,
## whole_milk} => {rolls/buns} 0.001525165 0.3947368 0.003863752 2.1460679 15
## [17064] {newspapers,
## rolls/buns,
## whole_milk} => {pastry} 0.001525165 0.2000000 0.007625826 2.2480000 15
## [17065] {newspapers,
## other_vegetables,
## pastry} => {whole_milk} 0.001423488 0.5833333 0.002440264 2.2829619 14
## [17066] {newspapers,
## pastry,
## whole_milk} => {other_vegetables} 0.001423488 0.3684211 0.003863752 1.9040573 14
## [17067] {citrus_fruit,
## newspapers,
## tropical_fruit} => {other_vegetables} 0.001321810 0.6842105 0.001931876 3.5361064 13
## [17068] {citrus_fruit,
## newspapers,
## other_vegetables} => {tropical_fruit} 0.001321810 0.3513514 0.003762074 3.3483920 13
## [17069] {newspapers,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001321810 0.3095238 0.004270463 3.7397625 13
## [17070] {citrus_fruit,
## newspapers,
## tropical_fruit} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [17071] {citrus_fruit,
## newspapers,
## whole_milk} => {tropical_fruit} 0.001118454 0.3333333 0.003355363 3.1766796 11
## [17072] {newspapers,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001118454 0.2200000 0.005083884 2.6581081 11
## [17073] {citrus_fruit,
## newspapers,
## root_vegetables} => {other_vegetables} 0.001626843 0.8421053 0.001931876 4.3521310 16
## [17074] {citrus_fruit,
## newspapers,
## other_vegetables} => {root_vegetables} 0.001626843 0.4324324 0.003762074 3.9673255 16
## [17075] {newspapers,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001626843 0.2711864 0.005998983 3.2765585 16
## [17076] {citrus_fruit,
## newspapers,
## root_vegetables} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [17077] {citrus_fruit,
## newspapers,
## whole_milk} => {root_vegetables} 0.001220132 0.3636364 0.003355363 3.3361601 12
## [17078] {newspapers,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001220132 0.2105263 0.005795628 2.5436441 12
## [17079] {citrus_fruit,
## newspapers,
## soda} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [17080] {citrus_fruit,
## newspapers,
## yogurt} => {soda} 0.001016777 0.3846154 0.002643620 2.2056515 10
## [17081] {newspapers,
## soda,
## yogurt} => {citrus_fruit} 0.001016777 0.2380952 0.004270463 2.8767404 10
## [17082] {citrus_fruit,
## soda,
## yogurt} => {newspapers} 0.001016777 0.2439024 0.004168785 3.0557713 10
## [17083] {citrus_fruit,
## newspapers,
## soda} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [17084] {citrus_fruit,
## newspapers,
## other_vegetables} => {soda} 0.001220132 0.3243243 0.003762074 1.8599007 12
## [17085] {newspapers,
## other_vegetables,
## soda} => {citrus_fruit} 0.001220132 0.2448980 0.004982206 2.9589330 12
## [17086] {citrus_fruit,
## other_vegetables,
## soda} => {newspapers} 0.001220132 0.2926829 0.004168785 3.6669256 12
## [17087] {citrus_fruit,
## newspapers,
## yogurt} => {rolls/buns} 0.001118454 0.4230769 0.002643620 2.3001446 11
## [17088] {citrus_fruit,
## newspapers,
## rolls/buns} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [17089] {newspapers,
## rolls/buns,
## yogurt} => {citrus_fruit} 0.001118454 0.2200000 0.005083884 2.6581081 11
## [17090] {citrus_fruit,
## newspapers,
## yogurt} => {other_vegetables} 0.001118454 0.4230769 0.002643620 2.1865273 11
## [17091] {citrus_fruit,
## newspapers,
## other_vegetables} => {yogurt} 0.001118454 0.2972973 0.003762074 2.1311362 11
## [17092] {newspapers,
## other_vegetables,
## yogurt} => {citrus_fruit} 0.001118454 0.2000000 0.005592272 2.4164619 11
## [17093] {citrus_fruit,
## newspapers,
## yogurt} => {whole_milk} 0.001220132 0.4615385 0.002643620 1.8062996 12
## [17094] {citrus_fruit,
## newspapers,
## whole_milk} => {yogurt} 0.001220132 0.3636364 0.003355363 2.6066790 12
## [17095] {citrus_fruit,
## newspapers,
## rolls/buns} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [17096] {citrus_fruit,
## newspapers,
## other_vegetables} => {rolls/buns} 0.001118454 0.2972973 0.003762074 1.6163178 11
## [17097] {newspapers,
## other_vegetables,
## rolls/buns} => {citrus_fruit} 0.001118454 0.2037037 0.005490595 2.4612112 11
## [17098] {citrus_fruit,
## newspapers,
## rolls/buns} => {whole_milk} 0.001016777 0.4347826 0.002338587 1.7015865 10
## [17099] {citrus_fruit,
## newspapers,
## whole_milk} => {rolls/buns} 0.001016777 0.3030303 0.003355363 1.6474865 10
## [17100] {citrus_fruit,
## newspapers,
## other_vegetables} => {whole_milk} 0.002033554 0.5405405 0.003762074 2.1154860 20
## [17101] {citrus_fruit,
## newspapers,
## whole_milk} => {other_vegetables} 0.002033554 0.6060606 0.003355363 3.1322155 20
## [17102] {newspapers,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.002033554 0.2439024 0.008337570 2.9469048 20
## [17103] {bottled_water,
## newspapers,
## sausage} => {rolls/buns} 0.001220132 0.6000000 0.002033554 3.2620232 12
## [17104] {newspapers,
## rolls/buns,
## sausage} => {bottled_water} 0.001220132 0.4000000 0.003050330 3.6191352 12
## [17105] {bottled_water,
## newspapers,
## rolls/buns} => {sausage} 0.001220132 0.3157895 0.003863752 3.3612440 12
## [17106] {bottled_water,
## rolls/buns,
## sausage} => {newspapers} 0.001220132 0.3076923 0.003965430 3.8549731 12
## [17107] {bottled_water,
## newspapers,
## sausage} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [17108] {newspapers,
## other_vegetables,
## sausage} => {bottled_water} 0.001220132 0.3636364 0.003355363 3.2901229 12
## [17109] {bottled_water,
## newspapers,
## other_vegetables} => {sausage} 0.001220132 0.3636364 0.003355363 3.8705234 12
## [17110] {bottled_water,
## other_vegetables,
## sausage} => {newspapers} 0.001220132 0.2400000 0.005083884 3.0068790 12
## [17111] {newspapers,
## sausage,
## tropical_fruit} => {yogurt} 0.001118454 0.5789474 0.001931876 4.1501074 11
## [17112] {newspapers,
## sausage,
## yogurt} => {tropical_fruit} 0.001118454 0.3928571 0.002846975 3.7439438 11
## [17113] {newspapers,
## tropical_fruit,
## yogurt} => {sausage} 0.001118454 0.2619048 0.004270463 2.7876984 11
## [17114] {sausage,
## tropical_fruit,
## yogurt} => {newspapers} 0.001118454 0.2391304 0.004677173 2.9959845 11
## [17115] {newspapers,
## sausage,
## tropical_fruit} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [17116] {newspapers,
## other_vegetables,
## sausage} => {tropical_fruit} 0.001016777 0.3030303 0.003355363 2.8878905 10
## [17117] {newspapers,
## other_vegetables,
## tropical_fruit} => {sausage} 0.001016777 0.2380952 0.004270463 2.5342713 10
## [17118] {newspapers,
## sausage,
## tropical_fruit} => {whole_milk} 0.001525165 0.7894737 0.001931876 3.0897229 15
## [17119] {newspapers,
## sausage,
## whole_milk} => {tropical_fruit} 0.001525165 0.5000000 0.003050330 4.7650194 15
## [17120] {newspapers,
## tropical_fruit,
## whole_milk} => {sausage} 0.001525165 0.3000000 0.005083884 3.1931818 15
## [17121] {sausage,
## tropical_fruit,
## whole_milk} => {newspapers} 0.001525165 0.2112676 0.007219115 2.6469005 15
## [17122] {newspapers,
## root_vegetables,
## sausage} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [17123] {newspapers,
## other_vegetables,
## sausage} => {root_vegetables} 0.001118454 0.3333333 0.003355363 3.0581468 11
## [17124] {newspapers,
## root_vegetables,
## sausage} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [17125] {newspapers,
## sausage,
## whole_milk} => {root_vegetables} 0.001016777 0.3333333 0.003050330 3.0581468 10
## [17126] {newspapers,
## sausage,
## soda} => {yogurt} 0.001220132 0.5714286 0.002135231 4.0962099 12
## [17127] {newspapers,
## sausage,
## yogurt} => {soda} 0.001220132 0.4285714 0.002846975 2.4577259 12
## [17128] {newspapers,
## soda,
## yogurt} => {sausage} 0.001220132 0.2857143 0.004270463 3.0411255 12
## [17129] {sausage,
## soda,
## yogurt} => {newspapers} 0.001220132 0.2181818 0.005592272 2.7335263 12
## [17130] {newspapers,
## sausage,
## soda} => {rolls/buns} 0.001118454 0.5238095 0.002135231 2.8477980 11
## [17131] {newspapers,
## rolls/buns,
## sausage} => {soda} 0.001118454 0.3666667 0.003050330 2.1027211 11
## [17132] {newspapers,
## rolls/buns,
## soda} => {sausage} 0.001118454 0.2750000 0.004067107 2.9270833 11
## [17133] {newspapers,
## sausage,
## soda} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [17134] {newspapers,
## other_vegetables,
## sausage} => {soda} 0.001016777 0.3030303 0.003355363 1.7377860 10
## [17135] {newspapers,
## other_vegetables,
## soda} => {sausage} 0.001016777 0.2040816 0.004982206 2.1722325 10
## [17136] {newspapers,
## sausage,
## yogurt} => {rolls/buns} 0.001626843 0.5714286 0.002846975 3.1066888 16
## [17137] {newspapers,
## rolls/buns,
## sausage} => {yogurt} 0.001626843 0.5333333 0.003050330 3.8231293 16
## [17138] {newspapers,
## rolls/buns,
## yogurt} => {sausage} 0.001626843 0.3200000 0.005083884 3.4060606 16
## [17139] {rolls/buns,
## sausage,
## yogurt} => {newspapers} 0.001626843 0.2711864 0.005998983 3.3976034 16
## [17140] {newspapers,
## sausage,
## yogurt} => {other_vegetables} 0.001118454 0.3928571 0.002846975 2.0303468 11
## [17141] {newspapers,
## other_vegetables,
## sausage} => {yogurt} 0.001118454 0.3333333 0.003355363 2.3894558 11
## [17142] {newspapers,
## other_vegetables,
## yogurt} => {sausage} 0.001118454 0.2000000 0.005592272 2.1287879 11
## [17143] {newspapers,
## sausage,
## yogurt} => {whole_milk} 0.001220132 0.4285714 0.002846975 1.6772782 12
## [17144] {newspapers,
## sausage,
## whole_milk} => {yogurt} 0.001220132 0.4000000 0.003050330 2.8673469 12
## [17145] {newspapers,
## rolls/buns,
## sausage} => {other_vegetables} 0.001423488 0.4666667 0.003050330 2.4118059 14
## [17146] {newspapers,
## other_vegetables,
## sausage} => {rolls/buns} 0.001423488 0.4242424 0.003355363 2.3064811 14
## [17147] {newspapers,
## other_vegetables,
## rolls/buns} => {sausage} 0.001423488 0.2592593 0.005490595 2.7595398 14
## [17148] {newspapers,
## rolls/buns,
## sausage} => {whole_milk} 0.001220132 0.4000000 0.003050330 1.5654596 12
## [17149] {newspapers,
## sausage,
## whole_milk} => {rolls/buns} 0.001220132 0.4000000 0.003050330 2.1746821 12
## [17150] {newspapers,
## other_vegetables,
## sausage} => {whole_milk} 0.001321810 0.3939394 0.003355363 1.5417405 13
## [17151] {newspapers,
## sausage,
## whole_milk} => {other_vegetables} 0.001321810 0.4333333 0.003050330 2.2395341 13
## [17152] {bottled_water,
## newspapers,
## tropical_fruit} => {yogurt} 0.001220132 0.4285714 0.002846975 3.0721574 12
## [17153] {bottled_water,
## newspapers,
## yogurt} => {tropical_fruit} 0.001220132 0.3750000 0.003253686 3.5737645 12
## [17154] {newspapers,
## tropical_fruit,
## yogurt} => {bottled_water} 0.001220132 0.2857143 0.004270463 2.5850966 12
## [17155] {bottled_water,
## newspapers,
## tropical_fruit} => {rolls/buns} 0.001016777 0.3571429 0.002846975 1.9416805 10
## [17156] {bottled_water,
## newspapers,
## rolls/buns} => {tropical_fruit} 0.001016777 0.2631579 0.003863752 2.5079049 10
## [17157] {newspapers,
## rolls/buns,
## tropical_fruit} => {bottled_water} 0.001016777 0.2439024 0.004168785 2.2067898 10
## [17158] {bottled_water,
## newspapers,
## tropical_fruit} => {other_vegetables} 0.001118454 0.3928571 0.002846975 2.0303468 11
## [17159] {bottled_water,
## newspapers,
## other_vegetables} => {tropical_fruit} 0.001118454 0.3333333 0.003355363 3.1766796 11
## [17160] {newspapers,
## other_vegetables,
## tropical_fruit} => {bottled_water} 0.001118454 0.2619048 0.004270463 2.3696719 11
## [17161] {bottled_water,
## newspapers,
## root_vegetables} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [17162] {bottled_water,
## newspapers,
## other_vegetables} => {root_vegetables} 0.001118454 0.3333333 0.003355363 3.0581468 11
## [17163] {bottled_water,
## newspapers,
## soda} => {yogurt} 0.001626843 0.4571429 0.003558719 3.2769679 16
## [17164] {bottled_water,
## newspapers,
## yogurt} => {soda} 0.001626843 0.5000000 0.003253686 2.8673469 16
## [17165] {newspapers,
## soda,
## yogurt} => {bottled_water} 0.001626843 0.3809524 0.004270463 3.4467955 16
## [17166] {bottled_water,
## soda,
## yogurt} => {newspapers} 0.001626843 0.2191781 0.007422471 2.7460082 16
## [17167] {bottled_water,
## newspapers,
## soda} => {rolls/buns} 0.001525165 0.4285714 0.003558719 2.3300166 15
## [17168] {bottled_water,
## newspapers,
## rolls/buns} => {soda} 0.001525165 0.3947368 0.003863752 2.2636950 15
## [17169] {newspapers,
## rolls/buns,
## soda} => {bottled_water} 0.001525165 0.3750000 0.004067107 3.3929393 15
## [17170] {bottled_water,
## rolls/buns,
## soda} => {newspapers} 0.001525165 0.2238806 0.006812405 2.8049244 15
## [17171] {bottled_water,
## newspapers,
## soda} => {other_vegetables} 0.001118454 0.3142857 0.003558719 1.6242775 11
## [17172] {bottled_water,
## newspapers,
## other_vegetables} => {soda} 0.001118454 0.3333333 0.003355363 1.9115646 11
## [17173] {newspapers,
## other_vegetables,
## soda} => {bottled_water} 0.001118454 0.2244898 0.004982206 2.0311473 11
## [17174] {bottled_water,
## newspapers,
## yogurt} => {rolls/buns} 0.001321810 0.4062500 0.003253686 2.2086616 13
## [17175] {bottled_water,
## newspapers,
## rolls/buns} => {yogurt} 0.001321810 0.3421053 0.003863752 2.4523362 13
## [17176] {newspapers,
## rolls/buns,
## yogurt} => {bottled_water} 0.001321810 0.2600000 0.005083884 2.3524379 13
## [17177] {bottled_water,
## newspapers,
## yogurt} => {other_vegetables} 0.001118454 0.3437500 0.003253686 1.7765535 11
## [17178] {bottled_water,
## newspapers,
## other_vegetables} => {yogurt} 0.001118454 0.3333333 0.003355363 2.3894558 11
## [17179] {newspapers,
## other_vegetables,
## yogurt} => {bottled_water} 0.001118454 0.2000000 0.005592272 1.8095676 11
## [17180] {bottled_water,
## newspapers,
## yogurt} => {whole_milk} 0.001016777 0.3125000 0.003253686 1.2230153 10
## [17181] {bottled_water,
## newspapers,
## whole_milk} => {yogurt} 0.001016777 0.2500000 0.004067107 1.7920918 10
## [17182] {bottled_water,
## newspapers,
## rolls/buns} => {other_vegetables} 0.001321810 0.3421053 0.003863752 1.7680532 13
## [17183] {bottled_water,
## newspapers,
## other_vegetables} => {rolls/buns} 0.001321810 0.3939394 0.003355363 2.1417324 13
## [17184] {newspapers,
## other_vegetables,
## rolls/buns} => {bottled_water} 0.001321810 0.2407407 0.005490595 2.1781832 13
## [17185] {bottled_water,
## newspapers,
## rolls/buns} => {whole_milk} 0.001016777 0.2631579 0.003863752 1.0299076 10
## [17186] {bottled_water,
## newspapers,
## whole_milk} => {rolls/buns} 0.001016777 0.2500000 0.004067107 1.3591763 10
## [17187] {bottled_water,
## newspapers,
## other_vegetables} => {whole_milk} 0.001321810 0.3939394 0.003355363 1.5417405 13
## [17188] {bottled_water,
## newspapers,
## whole_milk} => {other_vegetables} 0.001321810 0.3250000 0.004067107 1.6796506 13
## [17189] {newspapers,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001728521 0.5312500 0.003253686 3.8081952 17
## [17190] {newspapers,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001728521 0.4047619 0.004270463 3.7134639 17
## [17191] {newspapers,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001728521 0.5151515 0.003355363 4.9094139 17
## [17192] {root_vegetables,
## tropical_fruit,
## yogurt} => {newspapers} 0.001728521 0.2125000 0.008134215 2.6623408 17
## [17193] {newspapers,
## root_vegetables,
## tropical_fruit} => {rolls/buns} 0.001016777 0.3125000 0.003253686 1.6989704 10
## [17194] {newspapers,
## rolls/buns,
## tropical_fruit} => {root_vegetables} 0.001016777 0.2439024 0.004168785 2.2376684 10
## [17195] {newspapers,
## rolls/buns,
## root_vegetables} => {tropical_fruit} 0.001016777 0.3225806 0.003152008 3.0742061 10
## [17196] {newspapers,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001830198 0.5625000 0.003253686 2.9070875 18
## [17197] {newspapers,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001830198 0.4285714 0.004270463 3.9319030 18
## [17198] {newspapers,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001830198 0.3050847 0.005998983 2.9074695 18
## [17199] {newspapers,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001728521 0.5312500 0.003253686 2.0791260 17
## [17200] {newspapers,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001728521 0.3400000 0.005083884 3.1193097 17
## [17201] {newspapers,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001728521 0.2982456 0.005795628 2.8422923 17
## [17202] {newspapers,
## soda,
## tropical_fruit} => {yogurt} 0.001321810 0.5200000 0.002541942 3.7275510 13
## [17203] {newspapers,
## tropical_fruit,
## yogurt} => {soda} 0.001321810 0.3095238 0.004270463 1.7750243 13
## [17204] {newspapers,
## soda,
## yogurt} => {tropical_fruit} 0.001321810 0.3095238 0.004270463 2.9497739 13
## [17205] {soda,
## tropical_fruit,
## yogurt} => {newspapers} 0.001321810 0.2000000 0.006609049 2.5057325 13
## [17206] {newspapers,
## soda,
## tropical_fruit} => {rolls/buns} 0.001016777 0.4000000 0.002541942 2.1746821 10
## [17207] {newspapers,
## rolls/buns,
## tropical_fruit} => {soda} 0.001016777 0.2439024 0.004168785 1.3987058 10
## [17208] {newspapers,
## rolls/buns,
## soda} => {tropical_fruit} 0.001016777 0.2500000 0.004067107 2.3825097 10
## [17209] {newspapers,
## soda,
## tropical_fruit} => {other_vegetables} 0.001525165 0.6000000 0.002541942 3.1008933 15
## [17210] {newspapers,
## other_vegetables,
## tropical_fruit} => {soda} 0.001525165 0.3571429 0.004270463 2.0481050 15
## [17211] {newspapers,
## other_vegetables,
## soda} => {tropical_fruit} 0.001525165 0.3061224 0.004982206 2.9173588 15
## [17212] {other_vegetables,
## soda,
## tropical_fruit} => {newspapers} 0.001525165 0.2112676 0.007219115 2.6469005 15
## [17213] {newspapers,
## soda,
## tropical_fruit} => {whole_milk} 0.001321810 0.5200000 0.002541942 2.0350975 13
## [17214] {newspapers,
## tropical_fruit,
## whole_milk} => {soda} 0.001321810 0.2600000 0.005083884 1.4910204 13
## [17215] {newspapers,
## soda,
## whole_milk} => {tropical_fruit} 0.001321810 0.2765957 0.004778851 2.6359682 13
## [17216] {newspapers,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001728521 0.4047619 0.004270463 2.2005712 17
## [17217] {newspapers,
## rolls/buns,
## tropical_fruit} => {yogurt} 0.001728521 0.4146341 0.004168785 2.9722499 17
## [17218] {newspapers,
## rolls/buns,
## yogurt} => {tropical_fruit} 0.001728521 0.3400000 0.005083884 3.2402132 17
## [17219] {newspapers,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.002135231 0.5000000 0.004270463 2.5840778 21
## [17220] {newspapers,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.002135231 0.5000000 0.004270463 3.5841837 21
## [17221] {newspapers,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.002135231 0.3818182 0.005592272 3.6387421 21
## [17222] {newspapers,
## tropical_fruit,
## yogurt} => {whole_milk} 0.002236909 0.5238095 0.004270463 2.0500066 22
## [17223] {newspapers,
## tropical_fruit,
## whole_milk} => {yogurt} 0.002236909 0.4400000 0.005083884 3.1540816 22
## [17224] {newspapers,
## whole_milk,
## yogurt} => {tropical_fruit} 0.002236909 0.3384615 0.006609049 3.2255516 22
## [17225] {newspapers,
## rolls/buns,
## tropical_fruit} => {other_vegetables} 0.001626843 0.3902439 0.004168785 2.0168412 16
## [17226] {newspapers,
## other_vegetables,
## tropical_fruit} => {rolls/buns} 0.001626843 0.3809524 0.004270463 2.0711259 16
## [17227] {newspapers,
## other_vegetables,
## rolls/buns} => {tropical_fruit} 0.001626843 0.2962963 0.005490595 2.8237152 16
## [17228] {other_vegetables,
## rolls/buns,
## tropical_fruit} => {newspapers} 0.001626843 0.2077922 0.007829181 2.6033584 16
## [17229] {newspapers,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001728521 0.4146341 0.004168785 1.6227325 17
## [17230] {newspapers,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001728521 0.3400000 0.005083884 1.8484798 17
## [17231] {newspapers,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001728521 0.2266667 0.007625826 2.1601421 17
## [17232] {newspapers,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.002440264 0.5714286 0.004270463 2.2363709 24
## [17233] {newspapers,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.002440264 0.4800000 0.005083884 2.4807147 24
## [17234] {newspapers,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.002440264 0.2926829 0.008337570 2.7892796 24
## [17235] {newspapers,
## root_vegetables,
## soda} => {other_vegetables} 0.001626843 0.5925926 0.002745297 3.0626107 16
## [17236] {newspapers,
## other_vegetables,
## root_vegetables} => {soda} 0.001626843 0.2711864 0.005998983 1.5551712 16
## [17237] {newspapers,
## other_vegetables,
## soda} => {root_vegetables} 0.001626843 0.3265306 0.004982206 2.9957356 16
## [17238] {newspapers,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001931876 0.5757576 0.003355363 2.9756047 19
## [17239] {newspapers,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001931876 0.3220339 0.005998983 2.3084573 19
## [17240] {newspapers,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001931876 0.3454545 0.005592272 3.1693521 19
## [17241] {newspapers,
## root_vegetables,
## yogurt} => {whole_milk} 0.001525165 0.4545455 0.003355363 1.7789314 15
## [17242] {newspapers,
## root_vegetables,
## whole_milk} => {yogurt} 0.001525165 0.2631579 0.005795628 1.8864125 15
## [17243] {newspapers,
## whole_milk,
## yogurt} => {root_vegetables} 0.001525165 0.2307692 0.006609049 2.1171785 15
## [17244] {newspapers,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001830198 0.5806452 0.003152008 3.0008645 18
## [17245] {newspapers,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001830198 0.3050847 0.005998983 1.6586559 18
## [17246] {newspapers,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001830198 0.3333333 0.005490595 3.0581468 18
## [17247] {newspapers,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001626843 0.5161290 0.003152008 2.0199479 16
## [17248] {newspapers,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001626843 0.2807018 0.005795628 1.5260927 16
## [17249] {newspapers,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001626843 0.2133333 0.007625826 1.9572139 16
## [17250] {newspapers,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.003050330 0.5084746 0.005998983 1.9899910 30
## [17251] {newspapers,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.003050330 0.5263158 0.005795628 2.7200819 30
## [17252] {newspapers,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.003050330 0.3658537 0.008337570 3.3565025 30
## [17253] {newspapers,
## soda,
## yogurt} => {rolls/buns} 0.001830198 0.4285714 0.004270463 2.3300166 18
## [17254] {newspapers,
## rolls/buns,
## soda} => {yogurt} 0.001830198 0.4500000 0.004067107 3.2257653 18
## [17255] {newspapers,
## rolls/buns,
## yogurt} => {soda} 0.001830198 0.3600000 0.005083884 2.0644898 18
## [17256] {rolls/buns,
## soda,
## yogurt} => {newspapers} 0.001830198 0.2117647 0.008642603 2.6531285 18
## [17257] {newspapers,
## soda,
## yogurt} => {other_vegetables} 0.001830198 0.4285714 0.004270463 2.2149238 18
## [17258] {newspapers,
## other_vegetables,
## soda} => {yogurt} 0.001830198 0.3673469 0.004982206 2.6332778 18
## [17259] {newspapers,
## other_vegetables,
## yogurt} => {soda} 0.001830198 0.3272727 0.005592272 1.8768089 18
## [17260] {other_vegetables,
## soda,
## yogurt} => {newspapers} 0.001830198 0.2195122 0.008337570 2.7501942 18
## [17261] {newspapers,
## soda,
## yogurt} => {whole_milk} 0.001525165 0.3571429 0.004270463 1.3977318 15
## [17262] {newspapers,
## soda,
## whole_milk} => {yogurt} 0.001525165 0.3191489 0.004778851 2.2877768 15
## [17263] {newspapers,
## whole_milk,
## yogurt} => {soda} 0.001525165 0.2307692 0.006609049 1.3233909 15
## [17264] {newspapers,
## rolls/buns,
## soda} => {other_vegetables} 0.001728521 0.4250000 0.004067107 2.1964661 17
## [17265] {newspapers,
## other_vegetables,
## soda} => {rolls/buns} 0.001728521 0.3469388 0.004982206 1.8862039 17
## [17266] {newspapers,
## other_vegetables,
## rolls/buns} => {soda} 0.001728521 0.3148148 0.005490595 1.8053666 17
## [17267] {newspapers,
## rolls/buns,
## soda} => {whole_milk} 0.001016777 0.2500000 0.004067107 0.9784123 10
## [17268] {newspapers,
## soda,
## whole_milk} => {rolls/buns} 0.001016777 0.2127660 0.004778851 1.1567458 10
## [17269] {newspapers,
## other_vegetables,
## soda} => {whole_milk} 0.002541942 0.5102041 0.004982206 1.9967597 25
## [17270] {newspapers,
## soda,
## whole_milk} => {other_vegetables} 0.002541942 0.5319149 0.004778851 2.7490189 25
## [17271] {newspapers,
## other_vegetables,
## whole_milk} => {soda} 0.002541942 0.3048780 0.008337570 1.7483823 25
## [17272] {newspapers,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001931876 0.3800000 0.005083884 1.9638991 19
## [17273] {newspapers,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001931876 0.3454545 0.005592272 1.8781346 19
## [17274] {newspapers,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001931876 0.3518519 0.005490595 2.5222033 19
## [17275] {newspapers,
## rolls/buns,
## yogurt} => {whole_milk} 0.002643620 0.5200000 0.005083884 2.0350975 26
## [17276] {newspapers,
## whole_milk,
## yogurt} => {rolls/buns} 0.002643620 0.4000000 0.006609049 2.1746821 26
## [17277] {newspapers,
## rolls/buns,
## whole_milk} => {yogurt} 0.002643620 0.3466667 0.007625826 2.4850340 26
## [17278] {newspapers,
## other_vegetables,
## yogurt} => {whole_milk} 0.002846975 0.5090909 0.005592272 1.9924031 28
## [17279] {newspapers,
## whole_milk,
## yogurt} => {other_vegetables} 0.002846975 0.4307692 0.006609049 2.2262824 28
## [17280] {newspapers,
## other_vegetables,
## whole_milk} => {yogurt} 0.002846975 0.3414634 0.008337570 2.4477352 28
## [17281] {newspapers,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.002846975 0.5185185 0.005490595 2.0292995 28
## [17282] {newspapers,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.002846975 0.3733333 0.007625826 1.9294447 28
## [17283] {newspapers,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.002846975 0.3414634 0.008337570 1.8564360 28
## [17284] {domestic_eggs,
## fruit/vegetable_juice,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [17285] {domestic_eggs,
## fruit/vegetable_juice,
## other_vegetables} => {whipped/sour_cream} 0.001016777 0.2941176 0.003457041 4.1030455 10
## [17286] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001016777 0.2000000 0.005083884 2.7665260 10
## [17287] {fruit/vegetable_juice,
## other_vegetables,
## whipped/sour_cream} => {domestic_eggs} 0.001016777 0.2380952 0.004270463 3.7526709 10
## [17288] {domestic_eggs,
## fruit/vegetable_juice,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [17289] {domestic_eggs,
## fruit/vegetable_juice,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.2340426 0.004778851 3.2649766 11
## [17290] {fruit/vegetable_juice,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001118454 0.2500000 0.004473818 3.9403045 11
## [17291] {domestic_eggs,
## fruit/vegetable_juice,
## pip_fruit} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [17292] {domestic_eggs,
## fruit/vegetable_juice,
## whole_milk} => {pip_fruit} 0.001118454 0.2340426 0.004778851 3.0938286 11
## [17293] {domestic_eggs,
## pip_fruit,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.2075472 0.005388917 2.8709232 11
## [17294] {fruit/vegetable_juice,
## pip_fruit,
## whole_milk} => {domestic_eggs} 0.001118454 0.2340426 0.004778851 3.6887957 11
## [17295] {citrus_fruit,
## domestic_eggs,
## fruit/vegetable_juice} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [17296] {domestic_eggs,
## fruit/vegetable_juice,
## whole_milk} => {citrus_fruit} 0.001016777 0.2127660 0.004778851 2.5707042 10
## [17297] {citrus_fruit,
## fruit/vegetable_juice,
## whole_milk} => {domestic_eggs} 0.001016777 0.2380952 0.004270463 3.7526709 10
## [17298] {bottled_water,
## domestic_eggs,
## fruit/vegetable_juice} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [17299] {domestic_eggs,
## fruit/vegetable_juice,
## other_vegetables} => {bottled_water} 0.001016777 0.2941176 0.003457041 2.6611288 10
## [17300] {bottled_water,
## domestic_eggs,
## other_vegetables} => {fruit/vegetable_juice} 0.001016777 0.2500000 0.004067107 3.4581575 10
## [17301] {bottled_water,
## fruit/vegetable_juice,
## other_vegetables} => {domestic_eggs} 0.001016777 0.2500000 0.004067107 3.9403045 10
## [17302] {domestic_eggs,
## fruit/vegetable_juice,
## tropical_fruit} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [17303] {domestic_eggs,
## fruit/vegetable_juice,
## other_vegetables} => {tropical_fruit} 0.001118454 0.3235294 0.003457041 3.0832478 11
## [17304] {domestic_eggs,
## other_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.001118454 0.2340426 0.004778851 3.2374241 11
## [17305] {domestic_eggs,
## fruit/vegetable_juice,
## tropical_fruit} => {whole_milk} 0.001220132 0.5217391 0.002338587 2.0419038 12
## [17306] {domestic_eggs,
## fruit/vegetable_juice,
## whole_milk} => {tropical_fruit} 0.001220132 0.2553191 0.004778851 2.4332014 12
## [17307] {fruit/vegetable_juice,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.001220132 0.2033898 0.005998983 3.2056714 12
## [17308] {domestic_eggs,
## fruit/vegetable_juice,
## root_vegetables} => {other_vegetables} 0.001728521 0.6800000 0.002541942 3.5143458 17
## [17309] {domestic_eggs,
## fruit/vegetable_juice,
## other_vegetables} => {root_vegetables} 0.001728521 0.5000000 0.003457041 4.5872201 17
## [17310] {domestic_eggs,
## other_vegetables,
## root_vegetables} => {fruit/vegetable_juice} 0.001728521 0.2361111 0.007320793 3.2660377 17
## [17311] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {domestic_eggs} 0.001728521 0.2615385 0.006609049 4.1221647 17
## [17312] {domestic_eggs,
## fruit/vegetable_juice,
## root_vegetables} => {whole_milk} 0.001830198 0.7200000 0.002541942 2.8178273 18
## [17313] {domestic_eggs,
## fruit/vegetable_juice,
## whole_milk} => {root_vegetables} 0.001830198 0.3829787 0.004778851 3.5136154 18
## [17314] {domestic_eggs,
## root_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001830198 0.2142857 0.008540925 2.9641350 18
## [17315] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001830198 0.2812500 0.006507372 4.4328425 18
## [17316] {domestic_eggs,
## fruit/vegetable_juice,
## soda} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [17317] {domestic_eggs,
## fruit/vegetable_juice,
## whole_milk} => {soda} 0.001118454 0.2340426 0.004778851 1.3421624 11
## [17318] {domestic_eggs,
## soda,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.2156863 0.005185562 2.9835085 11
## [17319] {domestic_eggs,
## fruit/vegetable_juice,
## yogurt} => {other_vegetables} 0.001220132 0.4800000 0.002541942 2.4807147 12
## [17320] {domestic_eggs,
## fruit/vegetable_juice,
## other_vegetables} => {yogurt} 0.001220132 0.3529412 0.003457041 2.5300120 12
## [17321] {domestic_eggs,
## other_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.001220132 0.2105263 0.005795628 2.9121327 12
## [17322] {domestic_eggs,
## fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [17323] {domestic_eggs,
## fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.001423488 0.2978723 0.004778851 2.1352584 14
## [17324] {domestic_eggs,
## fruit/vegetable_juice,
## rolls/buns} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [17325] {domestic_eggs,
## fruit/vegetable_juice,
## whole_milk} => {rolls/buns} 0.001321810 0.2765957 0.004778851 1.5037696 13
## [17326] {domestic_eggs,
## rolls/buns,
## whole_milk} => {fruit/vegetable_juice} 0.001321810 0.2000000 0.006609049 2.7665260 13
## [17327] {fruit/vegetable_juice,
## rolls/buns,
## whole_milk} => {domestic_eggs} 0.001321810 0.2363636 0.005592272 3.7253788 13
## [17328] {domestic_eggs,
## fruit/vegetable_juice,
## other_vegetables} => {whole_milk} 0.002135231 0.6176471 0.003457041 2.4172538 21
## [17329] {domestic_eggs,
## fruit/vegetable_juice,
## whole_milk} => {other_vegetables} 0.002135231 0.4468085 0.004778851 2.3091759 21
## [17330] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.002135231 0.2038835 0.010472801 3.2134522 21
## [17331] {domestic_eggs,
## pip_fruit,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.5263158 0.001931876 4.8286528 10
## [17332] {domestic_eggs,
## root_vegetables,
## whipped/sour_cream} => {pip_fruit} 0.001016777 0.3030303 0.003355363 4.0057836 10
## [17333] {domestic_eggs,
## pip_fruit,
## root_vegetables} => {whipped/sour_cream} 0.001016777 0.3846154 0.002643620 5.3655210 10
## [17334] {pip_fruit,
## root_vegetables,
## whipped/sour_cream} => {domestic_eggs} 0.001016777 0.3333333 0.003050330 5.2537393 10
## [17335] {domestic_eggs,
## pip_fruit,
## whipped/sour_cream} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [17336] {domestic_eggs,
## whipped/sour_cream,
## yogurt} => {pip_fruit} 0.001016777 0.2857143 0.003558719 3.7768817 10
## [17337] {domestic_eggs,
## pip_fruit,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3846154 0.002643620 5.3655210 10
## [17338] {pip_fruit,
## whipped/sour_cream,
## yogurt} => {domestic_eggs} 0.001016777 0.2777778 0.003660397 4.3781161 10
## [17339] {domestic_eggs,
## pip_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001321810 0.6842105 0.001931876 3.5361064 13
## [17340] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {pip_fruit} 0.001321810 0.2600000 0.005083884 3.4369624 13
## [17341] {domestic_eggs,
## other_vegetables,
## pip_fruit} => {whipped/sour_cream} 0.001321810 0.3333333 0.003965430 4.6501182 13
## [17342] {other_vegetables,
## pip_fruit,
## whipped/sour_cream} => {domestic_eggs} 0.001321810 0.2363636 0.005592272 3.7253788 13
## [17343] {domestic_eggs,
## pip_fruit,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.7894737 0.001931876 3.0897229 15
## [17344] {domestic_eggs,
## whipped/sour_cream,
## whole_milk} => {pip_fruit} 0.001525165 0.2678571 0.005693950 3.5408266 15
## [17345] {domestic_eggs,
## pip_fruit,
## whole_milk} => {whipped/sour_cream} 0.001525165 0.2830189 0.005388917 3.9482136 15
## [17346] {pip_fruit,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001525165 0.2542373 0.005998983 4.0070893 15
## [17347] {domestic_eggs,
## pastry,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.8571429 0.001423488 4.4298476 12
## [17348] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {pastry} 0.001220132 0.2400000 0.005083884 2.6976000 12
## [17349] {domestic_eggs,
## other_vegetables,
## pastry} => {whipped/sour_cream} 0.001220132 0.3000000 0.004067107 4.1851064 12
## [17350] {other_vegetables,
## pastry,
## whipped/sour_cream} => {domestic_eggs} 0.001220132 0.2926829 0.004168785 4.6130394 12
## [17351] {citrus_fruit,
## domestic_eggs,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.7777778 0.001830198 4.0196765 14
## [17352] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {citrus_fruit} 0.001423488 0.2800000 0.005083884 3.3830467 14
## [17353] {citrus_fruit,
## domestic_eggs,
## other_vegetables} => {whipped/sour_cream} 0.001423488 0.3181818 0.004473818 4.4387492 14
## [17354] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream} => {domestic_eggs} 0.001423488 0.2500000 0.005693950 3.9403045 14
## [17355] {citrus_fruit,
## domestic_eggs,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [17356] {domestic_eggs,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.001321810 0.2321429 0.005693950 2.8048219 13
## [17357] {citrus_fruit,
## domestic_eggs,
## whole_milk} => {whipped/sour_cream} 0.001321810 0.2321429 0.005693950 3.2384752 13
## [17358] {citrus_fruit,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001321810 0.2096774 0.006304016 3.3047715 13
## [17359] {domestic_eggs,
## sausage,
## whipped/sour_cream} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [17360] {domestic_eggs,
## whipped/sour_cream,
## yogurt} => {sausage} 0.001016777 0.2857143 0.003558719 3.0411255 10
## [17361] {domestic_eggs,
## sausage,
## yogurt} => {whipped/sour_cream} 0.001016777 0.4166667 0.002440264 5.8126478 10
## [17362] {sausage,
## whipped/sour_cream,
## yogurt} => {domestic_eggs} 0.001016777 0.2857143 0.003558719 4.5032051 10
## [17363] {domestic_eggs,
## sausage,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [17364] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {sausage} 0.001220132 0.2400000 0.005083884 2.5545455 12
## [17365] {domestic_eggs,
## other_vegetables,
## sausage} => {whipped/sour_cream} 0.001220132 0.3243243 0.003762074 4.5244393 12
## [17366] {other_vegetables,
## sausage,
## whipped/sour_cream} => {domestic_eggs} 0.001220132 0.2500000 0.004880529 3.9403045 12
## [17367] {domestic_eggs,
## sausage,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [17368] {domestic_eggs,
## whipped/sour_cream,
## whole_milk} => {sausage} 0.001220132 0.2142857 0.005693950 2.2808442 12
## [17369] {domestic_eggs,
## sausage,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.2727273 0.004473818 3.8046422 12
## [17370] {sausage,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001220132 0.2400000 0.005083884 3.7826923 12
## [17371] {bottled_water,
## domestic_eggs,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [17372] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {bottled_water} 0.001016777 0.2000000 0.005083884 1.8095676 10
## [17373] {bottled_water,
## domestic_eggs,
## other_vegetables} => {whipped/sour_cream} 0.001016777 0.2500000 0.004067107 3.4875887 10
## [17374] {bottled_water,
## other_vegetables,
## whipped/sour_cream} => {domestic_eggs} 0.001016777 0.2631579 0.003863752 4.1476889 10
## [17375] {bottled_water,
## domestic_eggs,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [17376] {bottled_water,
## domestic_eggs,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.2291667 0.004880529 3.1969563 11
## [17377] {bottled_water,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001118454 0.2558140 0.004372140 4.0319395 11
## [17378] {domestic_eggs,
## tropical_fruit,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.5000000 0.002033554 4.5872201 10
## [17379] {domestic_eggs,
## root_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001016777 0.3030303 0.003355363 2.8878905 10
## [17380] {domestic_eggs,
## root_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001016777 0.2857143 0.003558719 3.9858156 10
## [17381] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {domestic_eggs} 0.001016777 0.2222222 0.004575496 3.5024929 10
## [17382] {domestic_eggs,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001220132 0.6000000 0.002033554 4.3010204 12
## [17383] {domestic_eggs,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001220132 0.3428571 0.003558719 3.2674419 12
## [17384] {domestic_eggs,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001220132 0.2857143 0.004270463 3.9858156 12
## [17385] {domestic_eggs,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [17386] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001220132 0.2400000 0.005083884 2.2872093 12
## [17387] {domestic_eggs,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001220132 0.2553191 0.004778851 3.5617927 12
## [17388] {domestic_eggs,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001830198 0.9000000 0.002033554 3.5222841 18
## [17389] {domestic_eggs,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001830198 0.3214286 0.005693950 3.0632267 18
## [17390] {domestic_eggs,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001830198 0.2647059 0.006914082 3.6927409 18
## [17391] {tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001830198 0.2307692 0.007930859 3.6372041 18
## [17392] {domestic_eggs,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001626843 0.4848485 0.003355363 3.4755720 16
## [17393] {domestic_eggs,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001626843 0.4571429 0.003558719 4.1940299 16
## [17394] {domestic_eggs,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001626843 0.4444444 0.003660397 6.2001576 16
## [17395] {root_vegetables,
## whipped/sour_cream,
## yogurt} => {domestic_eggs} 0.001626843 0.2539683 0.006405694 4.0028490 16
## [17396] {domestic_eggs,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001728521 0.5151515 0.003355363 2.6623832 17
## [17397] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001728521 0.3400000 0.005083884 3.1193097 17
## [17398] {domestic_eggs,
## other_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.001728521 0.2361111 0.007320793 3.2938337 17
## [17399] {other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {domestic_eggs} 0.001728521 0.2023810 0.008540925 3.1897703 17
## [17400] {domestic_eggs,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.002033554 0.6060606 0.003355363 2.3719085 20
## [17401] {domestic_eggs,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.002033554 0.3571429 0.005693950 3.2765858 20
## [17402] {domestic_eggs,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.002033554 0.2380952 0.008540925 3.3215130 20
## [17403] {root_vegetables,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.002033554 0.2150538 0.009456024 3.3895092 20
## [17404] {domestic_eggs,
## soda,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [17405] {domestic_eggs,
## whipped/sour_cream,
## whole_milk} => {soda} 0.001220132 0.2142857 0.005693950 1.2288630 12
## [17406] {domestic_eggs,
## soda,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.2352941 0.005185562 3.2824364 12
## [17407] {soda,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001220132 0.2222222 0.005490595 3.5024929 12
## [17408] {domestic_eggs,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001830198 0.5142857 0.003558719 2.6579086 18
## [17409] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001830198 0.3600000 0.005083884 2.5806122 18
## [17410] {domestic_eggs,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001830198 0.3157895 0.005795628 4.4053751 18
## [17411] {domestic_eggs,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.002236909 0.6285714 0.003558719 2.4600080 22
## [17412] {domestic_eggs,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.002236909 0.3928571 0.005693950 2.8161443 22
## [17413] {domestic_eggs,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.002236909 0.2894737 0.007727504 4.0382605 22
## [17414] {whipped/sour_cream,
## whole_milk,
## yogurt} => {domestic_eggs} 0.002236909 0.2056075 0.010879512 3.2406243 22
## [17415] {domestic_eggs,
## rolls/buns,
## whipped/sour_cream} => {other_vegetables} 0.001321810 0.5200000 0.002541942 2.6874409 13
## [17416] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {rolls/buns} 0.001321810 0.2600000 0.005083884 1.4135434 13
## [17417] {domestic_eggs,
## other_vegetables,
## rolls/buns} => {whipped/sour_cream} 0.001321810 0.2241379 0.005897306 3.1268036 13
## [17418] {domestic_eggs,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [17419] {domestic_eggs,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001423488 0.2500000 0.005693950 1.3591763 14
## [17420] {domestic_eggs,
## rolls/buns,
## whole_milk} => {whipped/sour_cream} 0.001423488 0.2153846 0.006609049 3.0046918 14
## [17421] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.003558719 0.7000000 0.005083884 2.7395543 35
## [17422] {domestic_eggs,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.003558719 0.6250000 0.005693950 3.2300972 35
## [17423] {domestic_eggs,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.003558719 0.2892562 0.012302999 4.0352265 35
## [17424] {other_vegetables,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.003558719 0.2430556 0.014641586 3.8308516 35
## [17425] {citrus_fruit,
## domestic_eggs,
## pip_fruit} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [17426] {domestic_eggs,
## pip_fruit,
## whole_milk} => {citrus_fruit} 0.001321810 0.2452830 0.005388917 2.9635854 13
## [17427] {citrus_fruit,
## domestic_eggs,
## whole_milk} => {pip_fruit} 0.001321810 0.2321429 0.005693950 3.0687164 13
## [17428] {citrus_fruit,
## pip_fruit,
## whole_milk} => {domestic_eggs} 0.001321810 0.2549020 0.005185562 4.0175654 13
## [17429] {domestic_eggs,
## pip_fruit,
## sausage} => {whole_milk} 0.001423488 0.8235294 0.001728521 3.2230051 14
## [17430] {domestic_eggs,
## pip_fruit,
## whole_milk} => {sausage} 0.001423488 0.2641509 0.005388917 2.8116066 14
## [17431] {domestic_eggs,
## sausage,
## whole_milk} => {pip_fruit} 0.001423488 0.3181818 0.004473818 4.2060728 14
## [17432] {pip_fruit,
## sausage,
## whole_milk} => {domestic_eggs} 0.001423488 0.2545455 0.005592272 4.0119464 14
## [17433] {domestic_eggs,
## pip_fruit,
## tropical_fruit} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [17434] {domestic_eggs,
## pip_fruit,
## root_vegetables} => {tropical_fruit} 0.001016777 0.3846154 0.002643620 3.6653995 10
## [17435] {domestic_eggs,
## root_vegetables,
## tropical_fruit} => {pip_fruit} 0.001016777 0.2857143 0.003558719 3.7768817 10
## [17436] {domestic_eggs,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [17437] {domestic_eggs,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001118454 0.4230769 0.002643620 4.0319395 11
## [17438] {domestic_eggs,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001118454 0.2619048 0.004270463 3.4621416 11
## [17439] {domestic_eggs,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001321810 0.5652174 0.002338587 2.9211314 13
## [17440] {domestic_eggs,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001321810 0.3333333 0.003965430 3.1766796 13
## [17441] {domestic_eggs,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001321810 0.2765957 0.004778851 3.6563429 13
## [17442] {domestic_eggs,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [17443] {domestic_eggs,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001423488 0.2641509 0.005388917 2.5173687 14
## [17444] {domestic_eggs,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001423488 0.2058824 0.006914082 2.7215765 14
## [17445] {domestic_eggs,
## pip_fruit,
## root_vegetables} => {yogurt} 0.001016777 0.3846154 0.002643620 2.7570644 10
## [17446] {domestic_eggs,
## pip_fruit,
## yogurt} => {root_vegetables} 0.001016777 0.3846154 0.002643620 3.5286309 10
## [17447] {domestic_eggs,
## root_vegetables,
## yogurt} => {pip_fruit} 0.001016777 0.2777778 0.003660397 3.6719683 10
## [17448] {domestic_eggs,
## pip_fruit,
## root_vegetables} => {other_vegetables} 0.001423488 0.5384615 0.002643620 2.7828530 14
## [17449] {domestic_eggs,
## other_vegetables,
## pip_fruit} => {root_vegetables} 0.001423488 0.3589744 0.003965430 3.2933888 14
## [17450] {domestic_eggs,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001830198 0.6923077 0.002643620 2.7094493 18
## [17451] {domestic_eggs,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001830198 0.3396226 0.005388917 3.1158476 18
## [17452] {domestic_eggs,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001830198 0.2142857 0.008540925 2.8326613 18
## [17453] {pip_fruit,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001830198 0.2045455 0.008947636 3.2238855 18
## [17454] {domestic_eggs,
## pip_fruit,
## soda} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [17455] {domestic_eggs,
## pip_fruit,
## whole_milk} => {soda} 0.001118454 0.2075472 0.005388917 1.1902195 11
## [17456] {domestic_eggs,
## soda,
## whole_milk} => {pip_fruit} 0.001118454 0.2156863 0.005185562 2.8511754 11
## [17457] {pip_fruit,
## soda,
## whole_milk} => {domestic_eggs} 0.001118454 0.2244898 0.004982206 3.5382326 11
## [17458] {domestic_eggs,
## pip_fruit,
## yogurt} => {other_vegetables} 0.001220132 0.4615385 0.002643620 2.3853026 12
## [17459] {domestic_eggs,
## other_vegetables,
## pip_fruit} => {yogurt} 0.001220132 0.3076923 0.003965430 2.2056515 12
## [17460] {domestic_eggs,
## other_vegetables,
## yogurt} => {pip_fruit} 0.001220132 0.2105263 0.005795628 2.7829655 12
## [17461] {domestic_eggs,
## pip_fruit,
## yogurt} => {whole_milk} 0.001321810 0.5000000 0.002643620 1.9568245 13
## [17462] {domestic_eggs,
## pip_fruit,
## whole_milk} => {yogurt} 0.001321810 0.2452830 0.005388917 1.7582788 13
## [17463] {domestic_eggs,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.002643620 0.6666667 0.003965430 2.6090994 26
## [17464] {domestic_eggs,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.002643620 0.4905660 0.005388917 2.5353216 26
## [17465] {domestic_eggs,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.002643620 0.2148760 0.012302999 2.8404648 26
## [17466] {domestic_eggs,
## pastry,
## tropical_fruit} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [17467] {domestic_eggs,
## pastry,
## whole_milk} => {tropical_fruit} 0.001321810 0.3170732 0.004168785 3.0217196 13
## [17468] {domestic_eggs,
## pastry,
## root_vegetables} => {other_vegetables} 0.001220132 0.8571429 0.001423488 4.4298476 12
## [17469] {domestic_eggs,
## other_vegetables,
## pastry} => {root_vegetables} 0.001220132 0.3000000 0.004067107 2.7523321 12
## [17470] {other_vegetables,
## pastry,
## root_vegetables} => {domestic_eggs} 0.001220132 0.2068966 0.005897306 3.2609416 12
## [17471] {domestic_eggs,
## pastry,
## root_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [17472] {domestic_eggs,
## pastry,
## whole_milk} => {root_vegetables} 0.001016777 0.2439024 0.004168785 2.2376684 10
## [17473] {domestic_eggs,
## pastry,
## soda} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [17474] {domestic_eggs,
## other_vegetables,
## pastry} => {soda} 0.001321810 0.3250000 0.004067107 1.8637755 13
## [17475] {domestic_eggs,
## other_vegetables,
## soda} => {pastry} 0.001321810 0.2600000 0.005083884 2.9224000 13
## [17476] {other_vegetables,
## pastry,
## soda} => {domestic_eggs} 0.001321810 0.2407407 0.005490595 3.7943673 13
## [17477] {domestic_eggs,
## pastry,
## soda} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [17478] {domestic_eggs,
## pastry,
## whole_milk} => {soda} 0.001220132 0.2926829 0.004168785 1.6784470 12
## [17479] {domestic_eggs,
## soda,
## whole_milk} => {pastry} 0.001220132 0.2352941 0.005185562 2.6447059 12
## [17480] {domestic_eggs,
## pastry,
## yogurt} => {other_vegetables} 0.001321810 0.5652174 0.002338587 2.9211314 13
## [17481] {domestic_eggs,
## other_vegetables,
## pastry} => {yogurt} 0.001321810 0.3250000 0.004067107 2.3297194 13
## [17482] {domestic_eggs,
## other_vegetables,
## yogurt} => {pastry} 0.001321810 0.2280702 0.005795628 2.5635088 13
## [17483] {other_vegetables,
## pastry,
## yogurt} => {domestic_eggs} 0.001321810 0.2000000 0.006609049 3.1522436 13
## [17484] {domestic_eggs,
## pastry,
## yogurt} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [17485] {domestic_eggs,
## pastry,
## whole_milk} => {yogurt} 0.001321810 0.3170732 0.004168785 2.2728970 13
## [17486] {domestic_eggs,
## pastry,
## rolls/buns} => {other_vegetables} 0.001525165 0.5172414 0.002948653 2.6731839 15
## [17487] {domestic_eggs,
## other_vegetables,
## pastry} => {rolls/buns} 0.001525165 0.3750000 0.004067107 2.0387645 15
## [17488] {domestic_eggs,
## other_vegetables,
## rolls/buns} => {pastry} 0.001525165 0.2586207 0.005897306 2.9068966 15
## [17489] {other_vegetables,
## pastry,
## rolls/buns} => {domestic_eggs} 0.001525165 0.2500000 0.006100661 3.9403045 15
## [17490] {domestic_eggs,
## other_vegetables,
## pastry} => {whole_milk} 0.002236909 0.5500000 0.004067107 2.1525070 22
## [17491] {domestic_eggs,
## pastry,
## whole_milk} => {other_vegetables} 0.002236909 0.5365854 0.004168785 2.7731566 22
## [17492] {other_vegetables,
## pastry,
## whole_milk} => {domestic_eggs} 0.002236909 0.2115385 0.010574479 3.3341038 22
## [17493] {citrus_fruit,
## domestic_eggs,
## sausage} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [17494] {citrus_fruit,
## domestic_eggs,
## whole_milk} => {sausage} 0.001321810 0.2321429 0.005693950 2.4709145 13
## [17495] {domestic_eggs,
## sausage,
## whole_milk} => {citrus_fruit} 0.001321810 0.2954545 0.004473818 3.5697733 13
## [17496] {citrus_fruit,
## sausage,
## whole_milk} => {domestic_eggs} 0.001321810 0.2653061 0.004982206 4.1815476 13
## [17497] {citrus_fruit,
## domestic_eggs,
## tropical_fruit} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [17498] {citrus_fruit,
## domestic_eggs,
## yogurt} => {tropical_fruit} 0.001118454 0.3793103 0.002948653 3.6148423 11
## [17499] {domestic_eggs,
## tropical_fruit,
## yogurt} => {citrus_fruit} 0.001118454 0.2619048 0.004270463 3.1644144 11
## [17500] {citrus_fruit,
## domestic_eggs,
## tropical_fruit} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [17501] {citrus_fruit,
## domestic_eggs,
## other_vegetables} => {tropical_fruit} 0.001118454 0.2500000 0.004473818 2.3825097 11
## [17502] {domestic_eggs,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001118454 0.2340426 0.004778851 2.8277746 11
## [17503] {citrus_fruit,
## domestic_eggs,
## tropical_fruit} => {whole_milk} 0.001830198 0.7826087 0.002338587 3.0628558 18
## [17504] {citrus_fruit,
## domestic_eggs,
## whole_milk} => {tropical_fruit} 0.001830198 0.3214286 0.005693950 3.0632267 18
## [17505] {domestic_eggs,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001830198 0.2647059 0.006914082 3.1982584 18
## [17506] {citrus_fruit,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.001830198 0.2022472 0.009049314 3.1876621 18
## [17507] {citrus_fruit,
## domestic_eggs,
## root_vegetables} => {other_vegetables} 0.001830198 0.7500000 0.002440264 3.8761167 18
## [17508] {citrus_fruit,
## domestic_eggs,
## other_vegetables} => {root_vegetables} 0.001830198 0.4090909 0.004473818 3.7531801 18
## [17509] {domestic_eggs,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001830198 0.2500000 0.007320793 3.0205774 18
## [17510] {citrus_fruit,
## domestic_eggs,
## root_vegetables} => {whole_milk} 0.001423488 0.5833333 0.002440264 2.2829619 14
## [17511] {citrus_fruit,
## domestic_eggs,
## whole_milk} => {root_vegetables} 0.001423488 0.2500000 0.005693950 2.2936101 14
## [17512] {citrus_fruit,
## domestic_eggs,
## soda} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [17513] {citrus_fruit,
## domestic_eggs,
## other_vegetables} => {soda} 0.001016777 0.2272727 0.004473818 1.3033395 10
## [17514] {domestic_eggs,
## other_vegetables,
## soda} => {citrus_fruit} 0.001016777 0.2000000 0.005083884 2.4164619 10
## [17515] {citrus_fruit,
## other_vegetables,
## soda} => {domestic_eggs} 0.001016777 0.2439024 0.004168785 3.8441995 10
## [17516] {citrus_fruit,
## domestic_eggs,
## yogurt} => {other_vegetables} 0.001321810 0.4482759 0.002948653 2.3167594 13
## [17517] {citrus_fruit,
## domestic_eggs,
## other_vegetables} => {yogurt} 0.001321810 0.2954545 0.004473818 2.1179267 13
## [17518] {domestic_eggs,
## other_vegetables,
## yogurt} => {citrus_fruit} 0.001321810 0.2280702 0.005795628 2.7556145 13
## [17519] {citrus_fruit,
## domestic_eggs,
## yogurt} => {whole_milk} 0.001626843 0.5517241 0.002948653 2.1592546 16
## [17520] {citrus_fruit,
## domestic_eggs,
## whole_milk} => {yogurt} 0.001626843 0.2857143 0.005693950 2.0481050 16
## [17521] {domestic_eggs,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001626843 0.2105263 0.007727504 2.5436441 16
## [17522] {citrus_fruit,
## domestic_eggs,
## rolls/buns} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [17523] {citrus_fruit,
## domestic_eggs,
## other_vegetables} => {rolls/buns} 0.001118454 0.2500000 0.004473818 1.3591763 11
## [17524] {citrus_fruit,
## domestic_eggs,
## rolls/buns} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [17525] {citrus_fruit,
## domestic_eggs,
## other_vegetables} => {whole_milk} 0.002846975 0.6363636 0.004473818 2.4905039 28
## [17526] {citrus_fruit,
## domestic_eggs,
## whole_milk} => {other_vegetables} 0.002846975 0.5000000 0.005693950 2.5840778 28
## [17527] {domestic_eggs,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.002846975 0.2314050 0.012302999 2.7959063 28
## [17528] {citrus_fruit,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.002846975 0.2187500 0.013014743 3.4477664 28
## [17529] {domestic_eggs,
## shopping_bags,
## tropical_fruit} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [17530] {domestic_eggs,
## shopping_bags,
## whole_milk} => {tropical_fruit} 0.001016777 0.2439024 0.004168785 2.3243997 10
## [17531] {shopping_bags,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.001016777 0.2040816 0.004982206 3.2165751 10
## [17532] {domestic_eggs,
## shopping_bags,
## soda} => {other_vegetables} 0.001321810 0.4193548 0.003152008 2.1672910 13
## [17533] {domestic_eggs,
## other_vegetables,
## shopping_bags} => {soda} 0.001321810 0.3823529 0.003457041 2.1926771 13
## [17534] {domestic_eggs,
## other_vegetables,
## soda} => {shopping_bags} 0.001321810 0.2600000 0.005083884 2.6389061 13
## [17535] {other_vegetables,
## shopping_bags,
## soda} => {domestic_eggs} 0.001321810 0.2452830 0.005388917 3.8659591 13
## [17536] {domestic_eggs,
## shopping_bags,
## soda} => {whole_milk} 0.001728521 0.5483871 0.003152008 2.1461946 17
## [17537] {domestic_eggs,
## shopping_bags,
## whole_milk} => {soda} 0.001728521 0.4146341 0.004168785 2.3777999 17
## [17538] {domestic_eggs,
## soda,
## whole_milk} => {shopping_bags} 0.001728521 0.3333333 0.005185562 3.3832129 17
## [17539] {shopping_bags,
## soda,
## whole_milk} => {domestic_eggs} 0.001728521 0.2537313 0.006812405 3.9991150 17
## [17540] {domestic_eggs,
## shopping_bags,
## yogurt} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [17541] {domestic_eggs,
## other_vegetables,
## shopping_bags} => {yogurt} 0.001016777 0.2941176 0.003457041 2.1083433 10
## [17542] {domestic_eggs,
## shopping_bags,
## yogurt} => {whole_milk} 0.001321810 0.5909091 0.002236909 2.3126108 13
## [17543] {domestic_eggs,
## shopping_bags,
## whole_milk} => {yogurt} 0.001321810 0.3170732 0.004168785 2.2728970 13
## [17544] {shopping_bags,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001321810 0.2500000 0.005287239 3.9403045 13
## [17545] {domestic_eggs,
## rolls/buns,
## shopping_bags} => {other_vegetables} 0.001423488 0.5600000 0.002541942 2.8941671 14
## [17546] {domestic_eggs,
## other_vegetables,
## shopping_bags} => {rolls/buns} 0.001423488 0.4117647 0.003457041 2.2386434 14
## [17547] {domestic_eggs,
## other_vegetables,
## rolls/buns} => {shopping_bags} 0.001423488 0.2413793 0.005897306 2.4499128 14
## [17548] {other_vegetables,
## rolls/buns,
## shopping_bags} => {domestic_eggs} 0.001423488 0.2692308 0.005287239 4.2434048 14
## [17549] {domestic_eggs,
## rolls/buns,
## shopping_bags} => {whole_milk} 0.001118454 0.4400000 0.002541942 1.7220056 11
## [17550] {domestic_eggs,
## shopping_bags,
## whole_milk} => {rolls/buns} 0.001118454 0.2682927 0.004168785 1.4586283 11
## [17551] {rolls/buns,
## shopping_bags,
## whole_milk} => {domestic_eggs} 0.001118454 0.2115385 0.005287239 3.3341038 11
## [17552] {domestic_eggs,
## other_vegetables,
## shopping_bags} => {whole_milk} 0.001626843 0.4705882 0.003457041 1.8417172 16
## [17553] {domestic_eggs,
## shopping_bags,
## whole_milk} => {other_vegetables} 0.001626843 0.3902439 0.004168785 2.0168412 16
## [17554] {other_vegetables,
## shopping_bags,
## whole_milk} => {domestic_eggs} 0.001626843 0.2133333 0.007625826 3.3623932 16
## [17555] {bottled_water,
## domestic_eggs,
## sausage} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [17556] {domestic_eggs,
## other_vegetables,
## sausage} => {bottled_water} 0.001016777 0.2702703 0.003762074 2.4453616 10
## [17557] {bottled_water,
## domestic_eggs,
## other_vegetables} => {sausage} 0.001016777 0.2500000 0.004067107 2.6609848 10
## [17558] {bottled_water,
## other_vegetables,
## sausage} => {domestic_eggs} 0.001016777 0.2000000 0.005083884 3.1522436 10
## [17559] {domestic_eggs,
## sausage,
## tropical_fruit} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [17560] {domestic_eggs,
## other_vegetables,
## sausage} => {tropical_fruit} 0.001118454 0.2972973 0.003762074 2.8332548 11
## [17561] {domestic_eggs,
## other_vegetables,
## tropical_fruit} => {sausage} 0.001118454 0.2340426 0.004778851 2.4911348 11
## [17562] {domestic_eggs,
## sausage,
## tropical_fruit} => {whole_milk} 0.001423488 0.7777778 0.001830198 3.0439492 14
## [17563] {domestic_eggs,
## sausage,
## whole_milk} => {tropical_fruit} 0.001423488 0.3181818 0.004473818 3.0322851 14
## [17564] {domestic_eggs,
## tropical_fruit,
## whole_milk} => {sausage} 0.001423488 0.2058824 0.006914082 2.1913993 14
## [17565] {domestic_eggs,
## root_vegetables,
## sausage} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [17566] {domestic_eggs,
## sausage,
## whole_milk} => {root_vegetables} 0.001118454 0.2500000 0.004473818 2.2936101 11
## [17567] {domestic_eggs,
## sausage,
## soda} => {rolls/buns} 0.001220132 0.3870968 0.003152008 2.1045311 12
## [17568] {domestic_eggs,
## rolls/buns,
## sausage} => {soda} 0.001220132 0.3428571 0.003558719 1.9661808 12
## [17569] {domestic_eggs,
## rolls/buns,
## soda} => {sausage} 0.001220132 0.3529412 0.003457041 3.7566845 12
## [17570] {domestic_eggs,
## sausage,
## soda} => {other_vegetables} 0.001423488 0.4516129 0.003152008 2.3340057 14
## [17571] {domestic_eggs,
## other_vegetables,
## sausage} => {soda} 0.001423488 0.3783784 0.003762074 2.1698842 14
## [17572] {domestic_eggs,
## other_vegetables,
## soda} => {sausage} 0.001423488 0.2800000 0.005083884 2.9803030 14
## [17573] {domestic_eggs,
## sausage,
## soda} => {whole_milk} 0.001321810 0.4193548 0.003152008 1.6412077 13
## [17574] {domestic_eggs,
## sausage,
## whole_milk} => {soda} 0.001321810 0.2954545 0.004473818 1.6943414 13
## [17575] {domestic_eggs,
## soda,
## whole_milk} => {sausage} 0.001321810 0.2549020 0.005185562 2.7131610 13
## [17576] {domestic_eggs,
## sausage,
## yogurt} => {rolls/buns} 0.001016777 0.4166667 0.002440264 2.2652939 10
## [17577] {domestic_eggs,
## rolls/buns,
## sausage} => {yogurt} 0.001016777 0.2857143 0.003558719 2.0481050 10
## [17578] {domestic_eggs,
## rolls/buns,
## yogurt} => {sausage} 0.001016777 0.2380952 0.004270463 2.5342713 10
## [17579] {domestic_eggs,
## sausage,
## yogurt} => {other_vegetables} 0.001118454 0.4583333 0.002440264 2.3687380 11
## [17580] {domestic_eggs,
## other_vegetables,
## sausage} => {yogurt} 0.001118454 0.2972973 0.003762074 2.1311362 11
## [17581] {domestic_eggs,
## sausage,
## yogurt} => {whole_milk} 0.001016777 0.4166667 0.002440264 1.6306871 10
## [17582] {domestic_eggs,
## sausage,
## whole_milk} => {yogurt} 0.001016777 0.2272727 0.004473818 1.6291744 10
## [17583] {domestic_eggs,
## rolls/buns,
## sausage} => {other_vegetables} 0.001626843 0.4571429 0.003558719 2.3625854 16
## [17584] {domestic_eggs,
## other_vegetables,
## sausage} => {rolls/buns} 0.001626843 0.4324324 0.003762074 2.3510077 16
## [17585] {domestic_eggs,
## other_vegetables,
## rolls/buns} => {sausage} 0.001626843 0.2758621 0.005897306 2.9362591 16
## [17586] {domestic_eggs,
## rolls/buns,
## sausage} => {whole_milk} 0.001525165 0.4285714 0.003558719 1.6772782 15
## [17587] {domestic_eggs,
## sausage,
## whole_milk} => {rolls/buns} 0.001525165 0.3409091 0.004473818 1.8534223 15
## [17588] {domestic_eggs,
## rolls/buns,
## whole_milk} => {sausage} 0.001525165 0.2307692 0.006609049 2.4562937 15
## [17589] {domestic_eggs,
## other_vegetables,
## sausage} => {whole_milk} 0.001931876 0.5135135 0.003762074 2.0097117 19
## [17590] {domestic_eggs,
## sausage,
## whole_milk} => {other_vegetables} 0.001931876 0.4318182 0.004473818 2.2317035 19
## [17591] {bottled_water,
## domestic_eggs,
## tropical_fruit} => {root_vegetables} 0.001016777 0.4545455 0.002236909 4.1702001 10
## [17592] {bottled_water,
## domestic_eggs,
## root_vegetables} => {tropical_fruit} 0.001016777 0.4545455 0.002236909 4.3318358 10
## [17593] {domestic_eggs,
## root_vegetables,
## tropical_fruit} => {bottled_water} 0.001016777 0.2857143 0.003558719 2.5850966 10
## [17594] {bottled_water,
## root_vegetables,
## tropical_fruit} => {domestic_eggs} 0.001016777 0.2222222 0.004575496 3.5024929 10
## [17595] {bottled_water,
## domestic_eggs,
## tropical_fruit} => {yogurt} 0.001220132 0.5454545 0.002236909 3.9100186 12
## [17596] {bottled_water,
## domestic_eggs,
## yogurt} => {tropical_fruit} 0.001220132 0.4285714 0.002846975 4.0843023 12
## [17597] {domestic_eggs,
## tropical_fruit,
## yogurt} => {bottled_water} 0.001220132 0.2857143 0.004270463 2.5850966 12
## [17598] {bottled_water,
## domestic_eggs,
## tropical_fruit} => {rolls/buns} 0.001118454 0.5000000 0.002236909 2.7183527 11
## [17599] {bottled_water,
## domestic_eggs,
## rolls/buns} => {tropical_fruit} 0.001118454 0.3548387 0.003152008 3.3816267 11
## [17600] {domestic_eggs,
## rolls/buns,
## tropical_fruit} => {bottled_water} 0.001118454 0.4400000 0.002541942 3.9810488 11
## [17601] {bottled_water,
## rolls/buns,
## tropical_fruit} => {domestic_eggs} 0.001118454 0.2075472 0.005388917 3.2711962 11
## [17602] {bottled_water,
## domestic_eggs,
## tropical_fruit} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [17603] {bottled_water,
## domestic_eggs,
## other_vegetables} => {tropical_fruit} 0.001220132 0.3000000 0.004067107 2.8590116 12
## [17604] {domestic_eggs,
## other_vegetables,
## tropical_fruit} => {bottled_water} 0.001220132 0.2553191 0.004778851 2.3100863 12
## [17605] {bottled_water,
## domestic_eggs,
## tropical_fruit} => {whole_milk} 0.001728521 0.7727273 0.002236909 3.0241833 17
## [17606] {bottled_water,
## domestic_eggs,
## whole_milk} => {tropical_fruit} 0.001728521 0.3541667 0.004880529 3.3752221 17
## [17607] {domestic_eggs,
## tropical_fruit,
## whole_milk} => {bottled_water} 0.001728521 0.2500000 0.006914082 2.2619595 17
## [17608] {bottled_water,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.001728521 0.2151899 0.008032537 3.3916545 17
## [17609] {bottled_water,
## domestic_eggs,
## root_vegetables} => {other_vegetables} 0.001626843 0.7272727 0.002236909 3.7586586 16
## [17610] {bottled_water,
## domestic_eggs,
## other_vegetables} => {root_vegetables} 0.001626843 0.4000000 0.004067107 3.6697761 16
## [17611] {domestic_eggs,
## other_vegetables,
## root_vegetables} => {bottled_water} 0.001626843 0.2222222 0.007320793 2.0106307 16
## [17612] {bottled_water,
## other_vegetables,
## root_vegetables} => {domestic_eggs} 0.001626843 0.2318841 0.007015760 3.6547752 16
## [17613] {bottled_water,
## domestic_eggs,
## root_vegetables} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [17614] {bottled_water,
## domestic_eggs,
## whole_milk} => {root_vegetables} 0.001220132 0.2500000 0.004880529 2.2936101 12
## [17615] {bottled_water,
## domestic_eggs,
## soda} => {other_vegetables} 0.001423488 0.5000000 0.002846975 2.5840778 14
## [17616] {bottled_water,
## domestic_eggs,
## other_vegetables} => {soda} 0.001423488 0.3500000 0.004067107 2.0071429 14
## [17617] {domestic_eggs,
## other_vegetables,
## soda} => {bottled_water} 0.001423488 0.2800000 0.005083884 2.5333947 14
## [17618] {bottled_water,
## other_vegetables,
## soda} => {domestic_eggs} 0.001423488 0.2500000 0.005693950 3.9403045 14
## [17619] {bottled_water,
## domestic_eggs,
## soda} => {whole_milk} 0.001118454 0.3928571 0.002846975 1.5375050 11
## [17620] {bottled_water,
## domestic_eggs,
## whole_milk} => {soda} 0.001118454 0.2291667 0.004880529 1.3142007 11
## [17621] {domestic_eggs,
## soda,
## whole_milk} => {bottled_water} 0.001118454 0.2156863 0.005185562 1.9514945 11
## [17622] {bottled_water,
## domestic_eggs,
## yogurt} => {rolls/buns} 0.001016777 0.3571429 0.002846975 1.9416805 10
## [17623] {bottled_water,
## domestic_eggs,
## rolls/buns} => {yogurt} 0.001016777 0.3225806 0.003152008 2.3123766 10
## [17624] {domestic_eggs,
## rolls/buns,
## yogurt} => {bottled_water} 0.001016777 0.2380952 0.004270463 2.1542472 10
## [17625] {bottled_water,
## domestic_eggs,
## yogurt} => {other_vegetables} 0.001830198 0.6428571 0.002846975 3.3223857 18
## [17626] {bottled_water,
## domestic_eggs,
## other_vegetables} => {yogurt} 0.001830198 0.4500000 0.004067107 3.2257653 18
## [17627] {domestic_eggs,
## other_vegetables,
## yogurt} => {bottled_water} 0.001830198 0.3157895 0.005795628 2.8572120 18
## [17628] {bottled_water,
## other_vegetables,
## yogurt} => {domestic_eggs} 0.001830198 0.2250000 0.008134215 3.5462740 18
## [17629] {bottled_water,
## domestic_eggs,
## yogurt} => {whole_milk} 0.001321810 0.4642857 0.002846975 1.8170513 13
## [17630] {bottled_water,
## domestic_eggs,
## whole_milk} => {yogurt} 0.001321810 0.2708333 0.004880529 1.9414328 13
## [17631] {bottled_water,
## domestic_eggs,
## rolls/buns} => {other_vegetables} 0.001525165 0.4838710 0.003152008 2.5007204 15
## [17632] {bottled_water,
## domestic_eggs,
## other_vegetables} => {rolls/buns} 0.001525165 0.3750000 0.004067107 2.0387645 15
## [17633] {domestic_eggs,
## other_vegetables,
## rolls/buns} => {bottled_water} 0.001525165 0.2586207 0.005897306 2.3399581 15
## [17634] {bottled_water,
## other_vegetables,
## rolls/buns} => {domestic_eggs} 0.001525165 0.2083333 0.007320793 3.2835871 15
## [17635] {bottled_water,
## domestic_eggs,
## rolls/buns} => {whole_milk} 0.001525165 0.4838710 0.003152008 1.8937011 15
## [17636] {bottled_water,
## domestic_eggs,
## whole_milk} => {rolls/buns} 0.001525165 0.3125000 0.004880529 1.6989704 15
## [17637] {domestic_eggs,
## rolls/buns,
## whole_milk} => {bottled_water} 0.001525165 0.2307692 0.006609049 2.0879626 15
## [17638] {bottled_water,
## domestic_eggs,
## other_vegetables} => {whole_milk} 0.002135231 0.5250000 0.004067107 2.0546657 21
## [17639] {bottled_water,
## domestic_eggs,
## whole_milk} => {other_vegetables} 0.002135231 0.4375000 0.004880529 2.2610681 21
## [17640] {domestic_eggs,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001830198 0.5142857 0.003558719 3.6865889 18
## [17641] {domestic_eggs,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001830198 0.4285714 0.004270463 3.9319030 18
## [17642] {domestic_eggs,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001830198 0.5000000 0.003660397 4.7650194 18
## [17643] {root_vegetables,
## tropical_fruit,
## yogurt} => {domestic_eggs} 0.001830198 0.2250000 0.008134215 3.5462740 18
## [17644] {domestic_eggs,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001931876 0.5428571 0.003558719 2.8055702 19
## [17645] {domestic_eggs,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001931876 0.4042553 0.004778851 3.7088163 19
## [17646] {domestic_eggs,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001931876 0.2638889 0.007320793 2.5148713 19
## [17647] {domestic_eggs,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.002745297 0.7714286 0.003558719 3.0191007 27
## [17648] {domestic_eggs,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.002745297 0.3970588 0.006914082 3.6427925 27
## [17649] {domestic_eggs,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.002745297 0.3214286 0.008540925 3.0632267 27
## [17650] {root_vegetables,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.002745297 0.2288136 0.011997966 3.6063804 27
## [17651] {domestic_eggs,
## soda,
## tropical_fruit} => {yogurt} 0.001016777 0.3448276 0.002948653 2.4718508 10
## [17652] {domestic_eggs,
## tropical_fruit,
## yogurt} => {soda} 0.001016777 0.2380952 0.004270463 1.3654033 10
## [17653] {domestic_eggs,
## soda,
## yogurt} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [17654] {domestic_eggs,
## soda,
## tropical_fruit} => {other_vegetables} 0.001220132 0.4137931 0.002948653 2.1385471 12
## [17655] {domestic_eggs,
## other_vegetables,
## tropical_fruit} => {soda} 0.001220132 0.2553191 0.004778851 1.4641772 12
## [17656] {domestic_eggs,
## other_vegetables,
## soda} => {tropical_fruit} 0.001220132 0.2400000 0.005083884 2.2872093 12
## [17657] {domestic_eggs,
## soda,
## tropical_fruit} => {whole_milk} 0.001728521 0.5862069 0.002948653 2.2942080 17
## [17658] {domestic_eggs,
## tropical_fruit,
## whole_milk} => {soda} 0.001728521 0.2500000 0.006914082 1.4336735 17
## [17659] {domestic_eggs,
## soda,
## whole_milk} => {tropical_fruit} 0.001728521 0.3333333 0.005185562 3.1766796 17
## [17660] {soda,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.001728521 0.2207792 0.007829181 3.4797494 17
## [17661] {domestic_eggs,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001016777 0.2380952 0.004270463 1.2944537 10
## [17662] {domestic_eggs,
## rolls/buns,
## tropical_fruit} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [17663] {domestic_eggs,
## rolls/buns,
## yogurt} => {tropical_fruit} 0.001016777 0.2380952 0.004270463 2.2690568 10
## [17664] {domestic_eggs,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.002135231 0.5000000 0.004270463 2.5840778 21
## [17665] {domestic_eggs,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.002135231 0.4468085 0.004778851 3.2028875 21
## [17666] {domestic_eggs,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.002135231 0.3684211 0.005795628 3.5110669 21
## [17667] {domestic_eggs,
## tropical_fruit,
## yogurt} => {whole_milk} 0.002948653 0.6904762 0.004270463 2.7022815 29
## [17668] {domestic_eggs,
## tropical_fruit,
## whole_milk} => {yogurt} 0.002948653 0.4264706 0.006914082 3.0570978 29
## [17669] {domestic_eggs,
## whole_milk,
## yogurt} => {tropical_fruit} 0.002948653 0.3815789 0.007727504 3.6364622 29
## [17670] {domestic_eggs,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [17671] {domestic_eggs,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001423488 0.2058824 0.006914082 1.1193217 14
## [17672] {domestic_eggs,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001423488 0.2153846 0.006609049 2.0526237 14
## [17673] {domestic_eggs,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.003050330 0.6382979 0.004778851 2.4980738 30
## [17674] {domestic_eggs,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.003050330 0.4411765 0.006914082 2.2800686 30
## [17675] {domestic_eggs,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.003050330 0.2479339 0.012302999 2.3628195 30
## [17676] {domestic_eggs,
## root_vegetables,
## soda} => {other_vegetables} 0.001830198 0.6666667 0.002745297 3.4454370 18
## [17677] {domestic_eggs,
## other_vegetables,
## root_vegetables} => {soda} 0.001830198 0.2500000 0.007320793 1.4336735 18
## [17678] {domestic_eggs,
## other_vegetables,
## soda} => {root_vegetables} 0.001830198 0.3600000 0.005083884 3.3027985 18
## [17679] {other_vegetables,
## root_vegetables,
## soda} => {domestic_eggs} 0.001830198 0.2222222 0.008235892 3.5024929 18
## [17680] {domestic_eggs,
## root_vegetables,
## soda} => {whole_milk} 0.001525165 0.5555556 0.002745297 2.1742495 15
## [17681] {domestic_eggs,
## soda,
## whole_milk} => {root_vegetables} 0.001525165 0.2941176 0.005185562 2.6983648 15
## [17682] {domestic_eggs,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001931876 0.5277778 0.003660397 2.7276376 19
## [17683] {domestic_eggs,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001931876 0.2638889 0.007320793 1.8916525 19
## [17684] {domestic_eggs,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001931876 0.3333333 0.005795628 3.0581468 19
## [17685] {domestic_eggs,
## root_vegetables,
## yogurt} => {whole_milk} 0.002541942 0.6944444 0.003660397 2.7178118 25
## [17686] {domestic_eggs,
## root_vegetables,
## whole_milk} => {yogurt} 0.002541942 0.2976190 0.008540925 2.1334427 25
## [17687] {domestic_eggs,
## whole_milk,
## yogurt} => {root_vegetables} 0.002541942 0.3289474 0.007727504 3.0179080 25
## [17688] {domestic_eggs,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001423488 0.5384615 0.002643620 2.7828530 14
## [17689] {domestic_eggs,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001423488 0.2413793 0.005897306 2.2145201 14
## [17690] {domestic_eggs,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001626843 0.6153846 0.002643620 2.4083994 16
## [17691] {domestic_eggs,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001626843 0.2461538 0.006609049 2.2583238 16
## [17692] {domestic_eggs,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.004575496 0.6250000 0.007320793 2.4460306 45
## [17693] {domestic_eggs,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.004575496 0.5357143 0.008540925 2.7686548 45
## [17694] {domestic_eggs,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.004575496 0.3719008 0.012302999 3.4119819 45
## [17695] {domestic_eggs,
## soda,
## yogurt} => {other_vegetables} 0.001321810 0.5200000 0.002541942 2.6874409 13
## [17696] {domestic_eggs,
## other_vegetables,
## soda} => {yogurt} 0.001321810 0.2600000 0.005083884 1.8637755 13
## [17697] {domestic_eggs,
## other_vegetables,
## yogurt} => {soda} 0.001321810 0.2280702 0.005795628 1.3079126 13
## [17698] {domestic_eggs,
## soda,
## yogurt} => {whole_milk} 0.001321810 0.5200000 0.002541942 2.0350975 13
## [17699] {domestic_eggs,
## soda,
## whole_milk} => {yogurt} 0.001321810 0.2549020 0.005185562 1.8272309 13
## [17700] {domestic_eggs,
## rolls/buns,
## soda} => {other_vegetables} 0.001525165 0.4411765 0.003457041 2.2800686 15
## [17701] {domestic_eggs,
## other_vegetables,
## soda} => {rolls/buns} 0.001525165 0.3000000 0.005083884 1.6310116 15
## [17702] {domestic_eggs,
## other_vegetables,
## rolls/buns} => {soda} 0.001525165 0.2586207 0.005897306 1.4831105 15
## [17703] {domestic_eggs,
## rolls/buns,
## soda} => {whole_milk} 0.001321810 0.3823529 0.003457041 1.4963952 13
## [17704] {domestic_eggs,
## soda,
## whole_milk} => {rolls/buns} 0.001321810 0.2549020 0.005185562 1.3858269 13
## [17705] {domestic_eggs,
## rolls/buns,
## whole_milk} => {soda} 0.001321810 0.2000000 0.006609049 1.1469388 13
## [17706] {domestic_eggs,
## other_vegetables,
## soda} => {whole_milk} 0.002541942 0.5000000 0.005083884 1.9568245 25
## [17707] {domestic_eggs,
## soda,
## whole_milk} => {other_vegetables} 0.002541942 0.4901961 0.005185562 2.5334096 25
## [17708] {domestic_eggs,
## other_vegetables,
## whole_milk} => {soda} 0.002541942 0.2066116 0.012302999 1.1848541 25
## [17709] {domestic_eggs,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001525165 0.3571429 0.004270463 1.8457698 15
## [17710] {domestic_eggs,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001525165 0.2631579 0.005795628 1.4307119 15
## [17711] {domestic_eggs,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001525165 0.2586207 0.005897306 1.8538881 15
## [17712] {domestic_eggs,
## rolls/buns,
## yogurt} => {whole_milk} 0.001931876 0.4523810 0.004270463 1.7704603 19
## [17713] {domestic_eggs,
## whole_milk,
## yogurt} => {rolls/buns} 0.001931876 0.2500000 0.007727504 1.3591763 19
## [17714] {domestic_eggs,
## rolls/buns,
## whole_milk} => {yogurt} 0.001931876 0.2923077 0.006609049 2.0953689 19
## [17715] {domestic_eggs,
## other_vegetables,
## yogurt} => {whole_milk} 0.003355363 0.5789474 0.005795628 2.2657968 33
## [17716] {domestic_eggs,
## whole_milk,
## yogurt} => {other_vegetables} 0.003355363 0.4342105 0.007727504 2.2440675 33
## [17717] {domestic_eggs,
## other_vegetables,
## whole_milk} => {yogurt} 0.003355363 0.2727273 0.012302999 1.9550093 33
## [17718] {domestic_eggs,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.002745297 0.4655172 0.005897306 1.8218711 27
## [17719] {domestic_eggs,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.002745297 0.4153846 0.006609049 2.1467723 27
## [17720] {domestic_eggs,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.002745297 0.2231405 0.012302999 1.2131491 27
## [17721] {fruit/vegetable_juice,
## pip_fruit,
## whipped/sour_cream} => {yogurt} 0.001118454 0.6111111 0.001830198 4.3806689 11
## [17722] {fruit/vegetable_juice,
## whipped/sour_cream,
## yogurt} => {pip_fruit} 0.001118454 0.2894737 0.003863752 3.8265775 11
## [17723] {fruit/vegetable_juice,
## pip_fruit,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3142857 0.003558719 4.3843972 11
## [17724] {pip_fruit,
## whipped/sour_cream,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.3055556 0.003660397 4.2266370 11
## [17725] {fruit/vegetable_juice,
## pip_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [17726] {fruit/vegetable_juice,
## other_vegetables,
## whipped/sour_cream} => {pip_fruit} 0.001220132 0.2857143 0.004270463 3.7768817 12
## [17727] {fruit/vegetable_juice,
## other_vegetables,
## pip_fruit} => {whipped/sour_cream} 0.001220132 0.2790698 0.004372140 3.8931222 12
## [17728] {other_vegetables,
## pip_fruit,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001220132 0.2181818 0.005592272 3.0180284 12
## [17729] {fruit/vegetable_juice,
## pip_fruit,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [17730] {fruit/vegetable_juice,
## whipped/sour_cream,
## whole_milk} => {pip_fruit} 0.001220132 0.2727273 0.004473818 3.6052053 12
## [17731] {fruit/vegetable_juice,
## pip_fruit,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.2553191 0.004778851 3.5617927 12
## [17732] {pip_fruit,
## whipped/sour_cream,
## whole_milk} => {fruit/vegetable_juice} 0.001220132 0.2033898 0.005998983 2.8134163 12
## [17733] {fruit/vegetable_juice,
## pastry,
## whipped/sour_cream} => {yogurt} 0.001220132 0.8000000 0.001525165 5.7346939 12
## [17734] {fruit/vegetable_juice,
## whipped/sour_cream,
## yogurt} => {pastry} 0.001220132 0.3157895 0.003863752 3.5494737 12
## [17735] {fruit/vegetable_juice,
## pastry,
## yogurt} => {whipped/sour_cream} 0.001220132 0.3750000 0.003253686 5.2313830 12
## [17736] {pastry,
## whipped/sour_cream,
## yogurt} => {fruit/vegetable_juice} 0.001220132 0.4444444 0.002745297 6.1478356 12
## [17737] {bottled_water,
## fruit/vegetable_juice,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [17738] {fruit/vegetable_juice,
## whipped/sour_cream,
## whole_milk} => {bottled_water} 0.001118454 0.2500000 0.004473818 2.2619595 11
## [17739] {bottled_water,
## whipped/sour_cream,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.2558140 0.004372140 3.5385798 11
## [17740] {fruit/vegetable_juice,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001220132 0.5714286 0.002135231 4.0962099 12
## [17741] {fruit/vegetable_juice,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001220132 0.3157895 0.003863752 3.0094859 12
## [17742] {fruit/vegetable_juice,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001220132 0.2500000 0.004880529 3.4875887 12
## [17743] {fruit/vegetable_juice,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001931876 0.9047619 0.002135231 4.6759503 19
## [17744] {fruit/vegetable_juice,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001931876 0.4523810 0.004270463 4.3112080 19
## [17745] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001931876 0.2923077 0.006609049 4.0777960 19
## [17746] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001931876 0.2467532 0.007829181 3.4132464 19
## [17747] {fruit/vegetable_juice,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [17748] {fruit/vegetable_juice,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001118454 0.2500000 0.004473818 2.3825097 11
## [17749] {fruit/vegetable_juice,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001321810 0.4642857 0.002846975 3.3281706 13
## [17750] {fruit/vegetable_juice,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001321810 0.3421053 0.003863752 3.1386243 13
## [17751] {fruit/vegetable_juice,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001321810 0.3823529 0.003457041 5.3339591 13
## [17752] {root_vegetables,
## whipped/sour_cream,
## yogurt} => {fruit/vegetable_juice} 0.001321810 0.2063492 0.006405694 2.8543522 13
## [17753] {fruit/vegetable_juice,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001525165 0.5357143 0.002846975 2.7686548 15
## [17754] {fruit/vegetable_juice,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001525165 0.3571429 0.004270463 3.2765858 15
## [17755] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.001525165 0.2307692 0.006609049 3.2193126 15
## [17756] {fruit/vegetable_juice,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001830198 0.6428571 0.002846975 2.5159172 18
## [17757] {fruit/vegetable_juice,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001830198 0.4090909 0.004473818 3.7531801 18
## [17758] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001830198 0.2812500 0.006507372 3.9235372 18
## [17759] {fruit/vegetable_juice,
## soda,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.5000000 0.002440264 1.9568245 12
## [17760] {fruit/vegetable_juice,
## whipped/sour_cream,
## whole_milk} => {soda} 0.001220132 0.2727273 0.004473818 1.5640074 12
## [17761] {fruit/vegetable_juice,
## soda,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.2000000 0.006100661 2.7900709 12
## [17762] {soda,
## whipped/sour_cream,
## whole_milk} => {fruit/vegetable_juice} 0.001220132 0.2222222 0.005490595 3.0739178 12
## [17763] {fruit/vegetable_juice,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.002338587 0.6052632 0.003863752 3.1280941 23
## [17764] {fruit/vegetable_juice,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.002338587 0.5476190 0.004270463 3.9255345 23
## [17765] {fruit/vegetable_juice,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.002338587 0.2839506 0.008235892 3.9612118 23
## [17766] {other_vegetables,
## whipped/sour_cream,
## yogurt} => {fruit/vegetable_juice} 0.002338587 0.2300000 0.010167768 3.1815049 23
## [17767] {fruit/vegetable_juice,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001931876 0.5000000 0.003863752 1.9568245 19
## [17768] {fruit/vegetable_juice,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001931876 0.4318182 0.004473818 3.0954314 19
## [17769] {fruit/vegetable_juice,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001931876 0.2043011 0.009456024 2.8500724 19
## [17770] {fruit/vegetable_juice,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.002236909 0.5238095 0.004270463 2.0500066 22
## [17771] {fruit/vegetable_juice,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.002236909 0.5000000 0.004473818 2.5840778 22
## [17772] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.002236909 0.2135922 0.010472801 2.9796874 22
## [17773] {citrus_fruit,
## fruit/vegetable_juice,
## pip_fruit} => {tropical_fruit} 0.001118454 0.4782609 0.002338587 4.5578446 11
## [17774] {fruit/vegetable_juice,
## pip_fruit,
## tropical_fruit} => {citrus_fruit} 0.001118454 0.3548387 0.003152008 4.2872711 11
## [17775] {citrus_fruit,
## fruit/vegetable_juice,
## tropical_fruit} => {pip_fruit} 0.001118454 0.2820513 0.003965430 3.7284602 11
## [17776] {citrus_fruit,
## pip_fruit,
## tropical_fruit} => {fruit/vegetable_juice} 0.001118454 0.2000000 0.005592272 2.7665260 11
## [17777] {citrus_fruit,
## fruit/vegetable_juice,
## pip_fruit} => {yogurt} 0.001016777 0.4347826 0.002338587 3.1166815 10
## [17778] {fruit/vegetable_juice,
## pip_fruit,
## yogurt} => {citrus_fruit} 0.001016777 0.2857143 0.003558719 3.4520885 10
## [17779] {citrus_fruit,
## fruit/vegetable_juice,
## yogurt} => {pip_fruit} 0.001016777 0.3030303 0.003355363 4.0057836 10
## [17780] {citrus_fruit,
## pip_fruit,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.3125000 0.003253686 4.3226969 10
## [17781] {citrus_fruit,
## fruit/vegetable_juice,
## pip_fruit} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [17782] {fruit/vegetable_juice,
## other_vegetables,
## pip_fruit} => {citrus_fruit} 0.001118454 0.2558140 0.004372140 3.0908234 11
## [17783] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables} => {pip_fruit} 0.001118454 0.2340426 0.004778851 3.0938286 11
## [17784] {citrus_fruit,
## fruit/vegetable_juice,
## pip_fruit} => {whole_milk} 0.001220132 0.5217391 0.002338587 2.0419038 12
## [17785] {fruit/vegetable_juice,
## pip_fruit,
## whole_milk} => {citrus_fruit} 0.001220132 0.2553191 0.004778851 3.0848450 12
## [17786] {citrus_fruit,
## fruit/vegetable_juice,
## whole_milk} => {pip_fruit} 0.001220132 0.2857143 0.004270463 3.7768817 12
## [17787] {citrus_fruit,
## pip_fruit,
## whole_milk} => {fruit/vegetable_juice} 0.001220132 0.2352941 0.005185562 3.2547365 12
## [17788] {fruit/vegetable_juice,
## pip_fruit,
## sausage} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [17789] {fruit/vegetable_juice,
## pip_fruit,
## whole_milk} => {sausage} 0.001118454 0.2340426 0.004778851 2.4911348 11
## [17790] {fruit/vegetable_juice,
## sausage,
## whole_milk} => {pip_fruit} 0.001118454 0.2291667 0.004880529 3.0293739 11
## [17791] {pip_fruit,
## sausage,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.2000000 0.005592272 2.7665260 11
## [17792] {bottled_water,
## fruit/vegetable_juice,
## pip_fruit} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [17793] {fruit/vegetable_juice,
## pip_fruit,
## whole_milk} => {bottled_water} 0.001321810 0.2765957 0.004778851 2.5025935 13
## [17794] {bottled_water,
## fruit/vegetable_juice,
## whole_milk} => {pip_fruit} 0.001321810 0.2280702 0.005795628 3.0148793 13
## [17795] {bottled_water,
## pip_fruit,
## whole_milk} => {fruit/vegetable_juice} 0.001321810 0.2888889 0.004575496 3.9960931 13
## [17796] {fruit/vegetable_juice,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001321810 0.4193548 0.003152008 3.0060895 13
## [17797] {fruit/vegetable_juice,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001321810 0.3714286 0.003558719 3.5397287 13
## [17798] {fruit/vegetable_juice,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001321810 0.2708333 0.004880529 3.5801691 13
## [17799] {pip_fruit,
## tropical_fruit,
## yogurt} => {fruit/vegetable_juice} 0.001321810 0.2063492 0.006405694 2.8543522 13
## [17800] {fruit/vegetable_juice,
## pip_fruit,
## tropical_fruit} => {rolls/buns} 0.001016777 0.3225806 0.003152008 1.7537759 10
## [17801] {fruit/vegetable_juice,
## pip_fruit,
## rolls/buns} => {tropical_fruit} 0.001016777 0.6250000 0.001626843 5.9562742 10
## [17802] {fruit/vegetable_juice,
## rolls/buns,
## tropical_fruit} => {pip_fruit} 0.001016777 0.3448276 0.002948653 4.5583055 10
## [17803] {pip_fruit,
## rolls/buns,
## tropical_fruit} => {fruit/vegetable_juice} 0.001016777 0.2272727 0.004473818 3.1437796 10
## [17804] {fruit/vegetable_juice,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001830198 0.5806452 0.003152008 3.0008645 18
## [17805] {fruit/vegetable_juice,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001830198 0.4186047 0.004372140 3.9893186 18
## [17806] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.001830198 0.2769231 0.006609049 3.6606700 18
## [17807] {fruit/vegetable_juice,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001525165 0.4838710 0.003152008 1.8937011 15
## [17808] {fruit/vegetable_juice,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001525165 0.3191489 0.004778851 3.0415017 15
## [17809] {fruit/vegetable_juice,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001525165 0.2542373 0.005998983 3.3607846 15
## [17810] {fruit/vegetable_juice,
## pip_fruit,
## root_vegetables} => {yogurt} 0.001220132 0.4615385 0.002643620 3.3084772 12
## [17811] {fruit/vegetable_juice,
## pip_fruit,
## yogurt} => {root_vegetables} 0.001220132 0.3428571 0.003558719 3.1455224 12
## [17812] {fruit/vegetable_juice,
## root_vegetables,
## yogurt} => {pip_fruit} 0.001220132 0.3529412 0.003457041 4.6655598 12
## [17813] {pip_fruit,
## root_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.001220132 0.2307692 0.005287239 3.1921454 12
## [17814] {fruit/vegetable_juice,
## pip_fruit,
## root_vegetables} => {other_vegetables} 0.001525165 0.5769231 0.002643620 2.9816282 15
## [17815] {fruit/vegetable_juice,
## other_vegetables,
## pip_fruit} => {root_vegetables} 0.001525165 0.3488372 0.004372140 3.2003862 15
## [17816] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {pip_fruit} 0.001525165 0.2307692 0.006609049 3.0505583 15
## [17817] {fruit/vegetable_juice,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001931876 0.7307692 0.002643620 2.8599743 19
## [17818] {fruit/vegetable_juice,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001931876 0.4042553 0.004778851 3.7088163 19
## [17819] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001931876 0.2968750 0.006507372 3.9244162 19
## [17820] {pip_fruit,
## root_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001931876 0.2159091 0.008947636 2.9865906 19
## [17821] {fruit/vegetable_juice,
## pip_fruit,
## soda} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [17822] {fruit/vegetable_juice,
## pip_fruit,
## yogurt} => {soda} 0.001016777 0.2857143 0.003558719 1.6384840 10
## [17823] {fruit/vegetable_juice,
## soda,
## yogurt} => {pip_fruit} 0.001016777 0.2000000 0.005083884 2.6438172 10
## [17824] {pip_fruit,
## soda,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.2631579 0.003863752 3.6401658 10
## [17825] {fruit/vegetable_juice,
## pip_fruit,
## soda} => {whole_milk} 0.001220132 0.4800000 0.002541942 1.8785515 12
## [17826] {fruit/vegetable_juice,
## pip_fruit,
## whole_milk} => {soda} 0.001220132 0.2553191 0.004778851 1.4641772 12
## [17827] {fruit/vegetable_juice,
## soda,
## whole_milk} => {pip_fruit} 0.001220132 0.2000000 0.006100661 2.6438172 12
## [17828] {pip_fruit,
## soda,
## whole_milk} => {fruit/vegetable_juice} 0.001220132 0.2448980 0.004982206 3.3875829 12
## [17829] {fruit/vegetable_juice,
## pip_fruit,
## yogurt} => {other_vegetables} 0.002236909 0.6285714 0.003558719 3.2485549 22
## [17830] {fruit/vegetable_juice,
## other_vegetables,
## pip_fruit} => {yogurt} 0.002236909 0.5116279 0.004372140 3.6675368 22
## [17831] {fruit/vegetable_juice,
## other_vegetables,
## yogurt} => {pip_fruit} 0.002236909 0.2716049 0.008235892 3.5903690 22
## [17832] {other_vegetables,
## pip_fruit,
## yogurt} => {fruit/vegetable_juice} 0.002236909 0.2750000 0.008134215 3.8039733 22
## [17833] {fruit/vegetable_juice,
## pip_fruit,
## yogurt} => {whole_milk} 0.002338587 0.6571429 0.003558719 2.5718265 23
## [17834] {fruit/vegetable_juice,
## pip_fruit,
## whole_milk} => {yogurt} 0.002338587 0.4893617 0.004778851 3.5079244 23
## [17835] {fruit/vegetable_juice,
## whole_milk,
## yogurt} => {pip_fruit} 0.002338587 0.2473118 0.009456024 3.2692363 23
## [17836] {pip_fruit,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.002338587 0.2446809 0.009557702 3.3845797 23
## [17837] {fruit/vegetable_juice,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.002440264 0.5581395 0.004372140 2.1843622 24
## [17838] {fruit/vegetable_juice,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.002440264 0.5106383 0.004778851 2.6390582 24
## [17839] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.002440264 0.2330097 0.010472801 3.0801754 24
## [17840] {citrus_fruit,
## fruit/vegetable_juice,
## pastry} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [17841] {fruit/vegetable_juice,
## pastry,
## whole_milk} => {citrus_fruit} 0.001118454 0.2619048 0.004270463 3.1644144 11
## [17842] {citrus_fruit,
## fruit/vegetable_juice,
## whole_milk} => {pastry} 0.001118454 0.2619048 0.004270463 2.9438095 11
## [17843] {citrus_fruit,
## pastry,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.2291667 0.004880529 3.1699777 11
## [17844] {fruit/vegetable_juice,
## pastry,
## sausage} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [17845] {fruit/vegetable_juice,
## pastry,
## whole_milk} => {sausage} 0.001220132 0.2857143 0.004270463 3.0411255 12
## [17846] {fruit/vegetable_juice,
## sausage,
## whole_milk} => {pastry} 0.001220132 0.2500000 0.004880529 2.8100000 12
## [17847] {pastry,
## sausage,
## whole_milk} => {fruit/vegetable_juice} 0.001220132 0.2142857 0.005693950 2.9641350 12
## [17848] {bottled_water,
## fruit/vegetable_juice,
## pastry} => {yogurt} 0.001321810 0.7647059 0.001728521 5.4816927 13
## [17849] {fruit/vegetable_juice,
## pastry,
## yogurt} => {bottled_water} 0.001321810 0.4062500 0.003253686 3.6756842 13
## [17850] {bottled_water,
## fruit/vegetable_juice,
## yogurt} => {pastry} 0.001321810 0.3023256 0.004372140 3.3981395 13
## [17851] {bottled_water,
## pastry,
## yogurt} => {fruit/vegetable_juice} 0.001321810 0.4193548 0.003152008 5.8007804 13
## [17852] {fruit/vegetable_juice,
## pastry,
## tropical_fruit} => {other_vegetables} 0.001321810 0.6842105 0.001931876 3.5361064 13
## [17853] {fruit/vegetable_juice,
## other_vegetables,
## pastry} => {tropical_fruit} 0.001321810 0.4642857 0.002846975 4.4246609 13
## [17854] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit} => {pastry} 0.001321810 0.2000000 0.006609049 2.2480000 13
## [17855] {other_vegetables,
## pastry,
## tropical_fruit} => {fruit/vegetable_juice} 0.001321810 0.2600000 0.005083884 3.5964838 13
## [17856] {fruit/vegetable_juice,
## pastry,
## root_vegetables} => {other_vegetables} 0.001118454 0.7857143 0.001423488 4.0606936 11
## [17857] {fruit/vegetable_juice,
## other_vegetables,
## pastry} => {root_vegetables} 0.001118454 0.3928571 0.002846975 3.6042444 11
## [17858] {fruit/vegetable_juice,
## pastry,
## soda} => {yogurt} 0.001016777 0.4347826 0.002338587 3.1166815 10
## [17859] {fruit/vegetable_juice,
## pastry,
## yogurt} => {soda} 0.001016777 0.3125000 0.003253686 1.7920918 10
## [17860] {fruit/vegetable_juice,
## soda,
## yogurt} => {pastry} 0.001016777 0.2000000 0.005083884 2.2480000 10
## [17861] {pastry,
## soda,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.2040816 0.004982206 2.8229857 10
## [17862] {fruit/vegetable_juice,
## pastry,
## soda} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [17863] {fruit/vegetable_juice,
## pastry,
## whole_milk} => {soda} 0.001321810 0.3095238 0.004270463 1.7750243 13
## [17864] {fruit/vegetable_juice,
## soda,
## whole_milk} => {pastry} 0.001321810 0.2166667 0.006100661 2.4353333 13
## [17865] {fruit/vegetable_juice,
## pastry,
## yogurt} => {other_vegetables} 0.001626843 0.5000000 0.003253686 2.5840778 16
## [17866] {fruit/vegetable_juice,
## other_vegetables,
## pastry} => {yogurt} 0.001626843 0.5714286 0.002846975 4.0962099 16
## [17867] {other_vegetables,
## pastry,
## yogurt} => {fruit/vegetable_juice} 0.001626843 0.2461538 0.006609049 3.4049551 16
## [17868] {fruit/vegetable_juice,
## pastry,
## yogurt} => {whole_milk} 0.001931876 0.5937500 0.003253686 2.3237291 19
## [17869] {fruit/vegetable_juice,
## pastry,
## whole_milk} => {yogurt} 0.001931876 0.4523810 0.004270463 3.2428328 19
## [17870] {fruit/vegetable_juice,
## whole_milk,
## yogurt} => {pastry} 0.001931876 0.2043011 0.009456024 2.2963441 19
## [17871] {pastry,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001931876 0.2111111 0.009150991 2.9202219 19
## [17872] {fruit/vegetable_juice,
## pastry,
## rolls/buns} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [17873] {fruit/vegetable_juice,
## pastry,
## whole_milk} => {rolls/buns} 0.001118454 0.2619048 0.004270463 1.4238990 11
## [17874] {fruit/vegetable_juice,
## rolls/buns,
## whole_milk} => {pastry} 0.001118454 0.2000000 0.005592272 2.2480000 11
## [17875] {fruit/vegetable_juice,
## other_vegetables,
## pastry} => {whole_milk} 0.001626843 0.5714286 0.002846975 2.2363709 16
## [17876] {fruit/vegetable_juice,
## pastry,
## whole_milk} => {other_vegetables} 0.001626843 0.3809524 0.004270463 1.9688212 16
## [17877] {citrus_fruit,
## fruit/vegetable_juice,
## sausage} => {soda} 0.001016777 0.4761905 0.002135231 2.7308066 10
## [17878] {citrus_fruit,
## fruit/vegetable_juice,
## soda} => {sausage} 0.001016777 0.3030303 0.003355363 3.2254362 10
## [17879] {fruit/vegetable_juice,
## sausage,
## soda} => {citrus_fruit} 0.001016777 0.3448276 0.002948653 4.1663136 10
## [17880] {citrus_fruit,
## sausage,
## soda} => {fruit/vegetable_juice} 0.001016777 0.3125000 0.003253686 4.3226969 10
## [17881] {citrus_fruit,
## fruit/vegetable_juice,
## tropical_fruit} => {root_vegetables} 0.001626843 0.4102564 0.003965430 3.7638729 16
## [17882] {citrus_fruit,
## fruit/vegetable_juice,
## root_vegetables} => {tropical_fruit} 0.001626843 0.4705882 0.003457041 4.4847241 16
## [17883] {fruit/vegetable_juice,
## root_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001626843 0.5000000 0.003253686 6.0411548 16
## [17884] {citrus_fruit,
## root_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.001626843 0.2857143 0.005693950 3.9521800 16
## [17885] {citrus_fruit,
## fruit/vegetable_juice,
## tropical_fruit} => {soda} 0.001118454 0.2820513 0.003965430 1.6174778 11
## [17886] {citrus_fruit,
## fruit/vegetable_juice,
## soda} => {tropical_fruit} 0.001118454 0.3333333 0.003355363 3.1766796 11
## [17887] {fruit/vegetable_juice,
## soda,
## tropical_fruit} => {citrus_fruit} 0.001118454 0.3333333 0.003355363 4.0274365 11
## [17888] {citrus_fruit,
## soda,
## tropical_fruit} => {fruit/vegetable_juice} 0.001118454 0.3235294 0.003457041 4.4752627 11
## [17889] {citrus_fruit,
## fruit/vegetable_juice,
## tropical_fruit} => {yogurt} 0.001423488 0.3589744 0.003965430 2.5732601 14
## [17890] {citrus_fruit,
## fruit/vegetable_juice,
## yogurt} => {tropical_fruit} 0.001423488 0.4242424 0.003355363 4.0430467 14
## [17891] {fruit/vegetable_juice,
## tropical_fruit,
## yogurt} => {citrus_fruit} 0.001423488 0.2916667 0.004880529 3.5240070 14
## [17892] {citrus_fruit,
## tropical_fruit,
## yogurt} => {fruit/vegetable_juice} 0.001423488 0.2258065 0.006304016 3.1234971 14
## [17893] {citrus_fruit,
## fruit/vegetable_juice,
## tropical_fruit} => {other_vegetables} 0.002338587 0.5897436 0.003965430 3.0478866 23
## [17894] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables} => {tropical_fruit} 0.002338587 0.4893617 0.004778851 4.6636360 23
## [17895] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.002338587 0.3538462 0.006609049 4.2752788 23
## [17896] {citrus_fruit,
## other_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.002338587 0.2584270 0.009049314 3.5747246 23
## [17897] {citrus_fruit,
## fruit/vegetable_juice,
## tropical_fruit} => {whole_milk} 0.001626843 0.4102564 0.003965430 1.6055996 16
## [17898] {citrus_fruit,
## fruit/vegetable_juice,
## whole_milk} => {tropical_fruit} 0.001626843 0.3809524 0.004270463 3.6304910 16
## [17899] {fruit/vegetable_juice,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001626843 0.2711864 0.005998983 3.2765585 16
## [17900] {citrus_fruit,
## fruit/vegetable_juice,
## root_vegetables} => {soda} 0.001423488 0.4117647 0.003457041 2.3613445 14
## [17901] {citrus_fruit,
## fruit/vegetable_juice,
## soda} => {root_vegetables} 0.001423488 0.4242424 0.003355363 3.8921868 14
## [17902] {fruit/vegetable_juice,
## root_vegetables,
## soda} => {citrus_fruit} 0.001423488 0.4242424 0.003355363 5.1258283 14
## [17903] {citrus_fruit,
## root_vegetables,
## soda} => {fruit/vegetable_juice} 0.001423488 0.4666667 0.003050330 6.4552274 14
## [17904] {citrus_fruit,
## fruit/vegetable_juice,
## root_vegetables} => {yogurt} 0.001321810 0.3823529 0.003457041 2.7408463 13
## [17905] {citrus_fruit,
## fruit/vegetable_juice,
## yogurt} => {root_vegetables} 0.001321810 0.3939394 0.003355363 3.6141735 13
## [17906] {fruit/vegetable_juice,
## root_vegetables,
## yogurt} => {citrus_fruit} 0.001321810 0.3823529 0.003457041 4.6197066 13
## [17907] {citrus_fruit,
## root_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.001321810 0.2708333 0.004880529 3.7463373 13
## [17908] {citrus_fruit,
## fruit/vegetable_juice,
## root_vegetables} => {other_vegetables} 0.002338587 0.6764706 0.003457041 3.4961052 23
## [17909] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables} => {root_vegetables} 0.002338587 0.4893617 0.004778851 4.4896197 23
## [17910] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.002338587 0.3538462 0.006609049 4.2752788 23
## [17911] {citrus_fruit,
## other_vegetables,
## root_vegetables} => {fruit/vegetable_juice} 0.002338587 0.2254902 0.010371124 3.1191225 23
## [17912] {citrus_fruit,
## fruit/vegetable_juice,
## root_vegetables} => {whole_milk} 0.001728521 0.5000000 0.003457041 1.9568245 17
## [17913] {citrus_fruit,
## fruit/vegetable_juice,
## whole_milk} => {root_vegetables} 0.001728521 0.4047619 0.004270463 3.7134639 17
## [17914] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001728521 0.2656250 0.006507372 3.2093635 17
## [17915] {citrus_fruit,
## fruit/vegetable_juice,
## soda} => {yogurt} 0.001016777 0.3030303 0.003355363 2.1722325 10
## [17916] {citrus_fruit,
## fruit/vegetable_juice,
## yogurt} => {soda} 0.001016777 0.3030303 0.003355363 1.7377860 10
## [17917] {fruit/vegetable_juice,
## soda,
## yogurt} => {citrus_fruit} 0.001016777 0.2000000 0.005083884 2.4164619 10
## [17918] {citrus_fruit,
## soda,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.2439024 0.004168785 3.3738122 10
## [17919] {citrus_fruit,
## fruit/vegetable_juice,
## soda} => {other_vegetables} 0.001118454 0.3333333 0.003355363 1.7227185 11
## [17920] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables} => {soda} 0.001118454 0.2340426 0.004778851 1.3421624 11
## [17921] {fruit/vegetable_juice,
## other_vegetables,
## soda} => {citrus_fruit} 0.001118454 0.2500000 0.004473818 3.0205774 11
## [17922] {citrus_fruit,
## other_vegetables,
## soda} => {fruit/vegetable_juice} 0.001118454 0.2682927 0.004168785 3.7111934 11
## [17923] {citrus_fruit,
## fruit/vegetable_juice,
## soda} => {whole_milk} 0.001321810 0.3939394 0.003355363 1.5417405 13
## [17924] {citrus_fruit,
## fruit/vegetable_juice,
## whole_milk} => {soda} 0.001321810 0.3095238 0.004270463 1.7750243 13
## [17925] {fruit/vegetable_juice,
## soda,
## whole_milk} => {citrus_fruit} 0.001321810 0.2166667 0.006100661 2.6178337 13
## [17926] {citrus_fruit,
## soda,
## whole_milk} => {fruit/vegetable_juice} 0.001321810 0.2954545 0.004473818 4.0869134 13
## [17927] {citrus_fruit,
## fruit/vegetable_juice,
## yogurt} => {other_vegetables} 0.001830198 0.5454545 0.003355363 2.8189939 18
## [17928] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables} => {yogurt} 0.001830198 0.3829787 0.004778851 2.7453322 18
## [17929] {fruit/vegetable_juice,
## other_vegetables,
## yogurt} => {citrus_fruit} 0.001830198 0.2222222 0.008235892 2.6849577 18
## [17930] {citrus_fruit,
## other_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.001830198 0.2400000 0.007625826 3.3198312 18
## [17931] {citrus_fruit,
## fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.001728521 0.5151515 0.003355363 2.0161222 17
## [17932] {citrus_fruit,
## fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.001728521 0.4047619 0.004270463 2.9014820 17
## [17933] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables} => {whole_milk} 0.002541942 0.5319149 0.004778851 2.0817282 25
## [17934] {citrus_fruit,
## fruit/vegetable_juice,
## whole_milk} => {other_vegetables} 0.002541942 0.5952381 0.004270463 3.0762831 25
## [17935] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.002541942 0.2427184 0.010472801 2.9325994 25
## [17936] {fruit/vegetable_juice,
## root_vegetables,
## shopping_bags} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [17937] {fruit/vegetable_juice,
## other_vegetables,
## shopping_bags} => {root_vegetables} 0.001016777 0.3571429 0.002846975 3.2765858 10
## [17938] {fruit/vegetable_juice,
## root_vegetables,
## shopping_bags} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [17939] {fruit/vegetable_juice,
## shopping_bags,
## whole_milk} => {root_vegetables} 0.001118454 0.2972973 0.003762074 2.7275363 11
## [17940] {root_vegetables,
## shopping_bags,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.2115385 0.005287239 2.9261333 11
## [17941] {fruit/vegetable_juice,
## shopping_bags,
## soda} => {whole_milk} 0.001423488 0.4000000 0.003558719 1.5654596 14
## [17942] {fruit/vegetable_juice,
## shopping_bags,
## whole_milk} => {soda} 0.001423488 0.3783784 0.003762074 2.1698842 14
## [17943] {fruit/vegetable_juice,
## soda,
## whole_milk} => {shopping_bags} 0.001423488 0.2333333 0.006100661 2.3682491 14
## [17944] {shopping_bags,
## soda,
## whole_milk} => {fruit/vegetable_juice} 0.001423488 0.2089552 0.006812405 2.8904003 14
## [17945] {fruit/vegetable_juice,
## shopping_bags,
## yogurt} => {whole_milk} 0.001016777 0.3333333 0.003050330 1.3045497 10
## [17946] {fruit/vegetable_juice,
## shopping_bags,
## whole_milk} => {yogurt} 0.001016777 0.2702703 0.003762074 1.9373966 10
## [17947] {fruit/vegetable_juice,
## other_vegetables,
## shopping_bags} => {whole_milk} 0.001220132 0.4285714 0.002846975 1.6772782 12
## [17948] {fruit/vegetable_juice,
## shopping_bags,
## whole_milk} => {other_vegetables} 0.001220132 0.3243243 0.003762074 1.6761586 12
## [17949] {fruit/vegetable_juice,
## sausage,
## tropical_fruit} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [17950] {fruit/vegetable_juice,
## sausage,
## whole_milk} => {tropical_fruit} 0.001220132 0.2500000 0.004880529 2.3825097 12
## [17951] {fruit/vegetable_juice,
## tropical_fruit,
## whole_milk} => {sausage} 0.001220132 0.2033898 0.005998983 2.1648690 12
## [17952] {fruit/vegetable_juice,
## root_vegetables,
## sausage} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [17953] {fruit/vegetable_juice,
## other_vegetables,
## sausage} => {root_vegetables} 0.001220132 0.3529412 0.003457041 3.2380378 12
## [17954] {fruit/vegetable_juice,
## root_vegetables,
## sausage} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [17955] {fruit/vegetable_juice,
## sausage,
## whole_milk} => {root_vegetables} 0.001423488 0.2916667 0.004880529 2.6758784 14
## [17956] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {sausage} 0.001423488 0.2187500 0.006507372 2.3283617 14
## [17957] {fruit/vegetable_juice,
## sausage,
## soda} => {whole_milk} 0.001220132 0.4137931 0.002948653 1.6194410 12
## [17958] {fruit/vegetable_juice,
## sausage,
## whole_milk} => {soda} 0.001220132 0.2500000 0.004880529 1.4336735 12
## [17959] {fruit/vegetable_juice,
## soda,
## whole_milk} => {sausage} 0.001220132 0.2000000 0.006100661 2.1287879 12
## [17960] {fruit/vegetable_juice,
## sausage,
## yogurt} => {other_vegetables} 0.001423488 0.5000000 0.002846975 2.5840778 14
## [17961] {fruit/vegetable_juice,
## other_vegetables,
## sausage} => {yogurt} 0.001423488 0.4117647 0.003457041 2.9516807 14
## [17962] {fruit/vegetable_juice,
## sausage,
## yogurt} => {whole_milk} 0.001220132 0.4285714 0.002846975 1.6772782 12
## [17963] {fruit/vegetable_juice,
## sausage,
## whole_milk} => {yogurt} 0.001220132 0.2500000 0.004880529 1.7920918 12
## [17964] {fruit/vegetable_juice,
## rolls/buns,
## sausage} => {whole_milk} 0.001016777 0.3846154 0.002643620 1.5052496 10
## [17965] {fruit/vegetable_juice,
## sausage,
## whole_milk} => {rolls/buns} 0.001016777 0.2083333 0.004880529 1.1326470 10
## [17966] {fruit/vegetable_juice,
## other_vegetables,
## sausage} => {whole_milk} 0.001321810 0.3823529 0.003457041 1.4963952 13
## [17967] {fruit/vegetable_juice,
## sausage,
## whole_milk} => {other_vegetables} 0.001321810 0.2708333 0.004880529 1.3997088 13
## [17968] {bottled_water,
## fruit/vegetable_juice,
## tropical_fruit} => {yogurt} 0.001016777 0.3448276 0.002948653 2.4718508 10
## [17969] {bottled_water,
## fruit/vegetable_juice,
## yogurt} => {tropical_fruit} 0.001016777 0.2325581 0.004372140 2.2162881 10
## [17970] {fruit/vegetable_juice,
## tropical_fruit,
## yogurt} => {bottled_water} 0.001016777 0.2083333 0.004880529 1.8849663 10
## [17971] {bottled_water,
## fruit/vegetable_juice,
## tropical_fruit} => {other_vegetables} 0.001220132 0.4137931 0.002948653 2.1385471 12
## [17972] {bottled_water,
## fruit/vegetable_juice,
## other_vegetables} => {tropical_fruit} 0.001220132 0.3000000 0.004067107 2.8590116 12
## [17973] {bottled_water,
## fruit/vegetable_juice,
## tropical_fruit} => {whole_milk} 0.001626843 0.5517241 0.002948653 2.1592546 16
## [17974] {bottled_water,
## fruit/vegetable_juice,
## whole_milk} => {tropical_fruit} 0.001626843 0.2807018 0.005795628 2.6750986 16
## [17975] {fruit/vegetable_juice,
## tropical_fruit,
## whole_milk} => {bottled_water} 0.001626843 0.2711864 0.005998983 2.4536510 16
## [17976] {bottled_water,
## tropical_fruit,
## whole_milk} => {fruit/vegetable_juice} 0.001626843 0.2025316 0.008032537 2.8015453 16
## [17977] {bottled_water,
## fruit/vegetable_juice,
## root_vegetables} => {other_vegetables} 0.001626843 0.5714286 0.002846975 2.9532317 16
## [17978] {bottled_water,
## fruit/vegetable_juice,
## other_vegetables} => {root_vegetables} 0.001626843 0.4000000 0.004067107 3.6697761 16
## [17979] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {bottled_water} 0.001626843 0.2461538 0.006609049 2.2271601 16
## [17980] {bottled_water,
## other_vegetables,
## root_vegetables} => {fruit/vegetable_juice} 0.001626843 0.2318841 0.007015760 3.2075664 16
## [17981] {bottled_water,
## fruit/vegetable_juice,
## root_vegetables} => {whole_milk} 0.001626843 0.5714286 0.002846975 2.2363709 16
## [17982] {bottled_water,
## fruit/vegetable_juice,
## whole_milk} => {root_vegetables} 0.001626843 0.2807018 0.005795628 2.5752815 16
## [17983] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {bottled_water} 0.001626843 0.2500000 0.006507372 2.2619595 16
## [17984] {bottled_water,
## root_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001626843 0.2222222 0.007320793 3.0739178 16
## [17985] {bottled_water,
## fruit/vegetable_juice,
## soda} => {yogurt} 0.001626843 0.3137255 0.005185562 2.2488996 16
## [17986] {bottled_water,
## fruit/vegetable_juice,
## yogurt} => {soda} 0.001626843 0.3720930 0.004372140 2.1338396 16
## [17987] {fruit/vegetable_juice,
## soda,
## yogurt} => {bottled_water} 0.001626843 0.3200000 0.005083884 2.8953082 16
## [17988] {bottled_water,
## soda,
## yogurt} => {fruit/vegetable_juice} 0.001626843 0.2191781 0.007422471 3.0318093 16
## [17989] {bottled_water,
## fruit/vegetable_juice,
## soda} => {rolls/buns} 0.001423488 0.2745098 0.005185562 1.4924289 14
## [17990] {bottled_water,
## fruit/vegetable_juice,
## rolls/buns} => {soda} 0.001423488 0.4242424 0.003355363 2.4329004 14
## [17991] {fruit/vegetable_juice,
## rolls/buns,
## soda} => {bottled_water} 0.001423488 0.3589744 0.003965430 3.2479419 14
## [17992] {bottled_water,
## rolls/buns,
## soda} => {fruit/vegetable_juice} 0.001423488 0.2089552 0.006812405 2.8904003 14
## [17993] {bottled_water,
## fruit/vegetable_juice,
## soda} => {whole_milk} 0.001525165 0.2941176 0.005185562 1.1510732 15
## [17994] {bottled_water,
## fruit/vegetable_juice,
## whole_milk} => {soda} 0.001525165 0.2631579 0.005795628 1.5091300 15
## [17995] {fruit/vegetable_juice,
## soda,
## whole_milk} => {bottled_water} 0.001525165 0.2500000 0.006100661 2.2619595 15
## [17996] {bottled_water,
## soda,
## whole_milk} => {fruit/vegetable_juice} 0.001525165 0.2027027 0.007524148 2.8039115 15
## [17997] {bottled_water,
## fruit/vegetable_juice,
## yogurt} => {rolls/buns} 0.001321810 0.3023256 0.004372140 1.6436551 13
## [17998] {bottled_water,
## fruit/vegetable_juice,
## rolls/buns} => {yogurt} 0.001321810 0.3939394 0.003355363 2.8239023 13
## [17999] {fruit/vegetable_juice,
## rolls/buns,
## yogurt} => {bottled_water} 0.001321810 0.3513514 0.003762074 3.1789701 13
## [18000] {bottled_water,
## fruit/vegetable_juice,
## yogurt} => {other_vegetables} 0.001728521 0.3953488 0.004372140 2.0432243 17
## [18001] {bottled_water,
## fruit/vegetable_juice,
## other_vegetables} => {yogurt} 0.001728521 0.4250000 0.004067107 3.0465561 17
## [18002] {fruit/vegetable_juice,
## other_vegetables,
## yogurt} => {bottled_water} 0.001728521 0.2098765 0.008235892 1.8989290 17
## [18003] {bottled_water,
## other_vegetables,
## yogurt} => {fruit/vegetable_juice} 0.001728521 0.2125000 0.008134215 2.9394339 17
## [18004] {bottled_water,
## fruit/vegetable_juice,
## yogurt} => {whole_milk} 0.002440264 0.5581395 0.004372140 2.1843622 24
## [18005] {bottled_water,
## fruit/vegetable_juice,
## whole_milk} => {yogurt} 0.002440264 0.4210526 0.005795628 3.0182599 24
## [18006] {fruit/vegetable_juice,
## whole_milk,
## yogurt} => {bottled_water} 0.002440264 0.2580645 0.009456024 2.3349260 24
## [18007] {bottled_water,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.002440264 0.2526316 0.009659380 3.4945592 24
## [18008] {bottled_water,
## fruit/vegetable_juice,
## rolls/buns} => {other_vegetables} 0.001220132 0.3636364 0.003355363 1.8793293 12
## [18009] {bottled_water,
## fruit/vegetable_juice,
## other_vegetables} => {rolls/buns} 0.001220132 0.3000000 0.004067107 1.6310116 12
## [18010] {fruit/vegetable_juice,
## other_vegetables,
## rolls/buns} => {bottled_water} 0.001220132 0.2790698 0.004372140 2.5249781 12
## [18011] {bottled_water,
## fruit/vegetable_juice,
## rolls/buns} => {whole_milk} 0.001118454 0.3333333 0.003355363 1.3045497 11
## [18012] {fruit/vegetable_juice,
## rolls/buns,
## whole_milk} => {bottled_water} 0.001118454 0.2000000 0.005592272 1.8095676 11
## [18013] {bottled_water,
## fruit/vegetable_juice,
## other_vegetables} => {whole_milk} 0.002236909 0.5500000 0.004067107 2.1525070 22
## [18014] {bottled_water,
## fruit/vegetable_juice,
## whole_milk} => {other_vegetables} 0.002236909 0.3859649 0.005795628 1.9947267 22
## [18015] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {bottled_water} 0.002236909 0.2135922 0.010472801 1.9325479 22
## [18016] {bottled_water,
## other_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.002236909 0.2075472 0.010777834 2.8709232 22
## [18017] {fruit/vegetable_juice,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001321810 0.4062500 0.003253686 2.9121492 13
## [18018] {fruit/vegetable_juice,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001321810 0.2708333 0.004880529 2.4847442 13
## [18019] {fruit/vegetable_juice,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001321810 0.3823529 0.003457041 3.6438383 13
## [18020] {fruit/vegetable_juice,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.002541942 0.7812500 0.003253686 4.0376215 25
## [18021] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.002541942 0.3846154 0.006609049 3.5286309 25
## [18022] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.002541942 0.3846154 0.006609049 3.6653995 25
## [18023] {other_vegetables,
## root_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.002541942 0.2066116 0.012302999 2.8579814 25
## [18024] {fruit/vegetable_juice,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001830198 0.5625000 0.003253686 2.2014276 18
## [18025] {fruit/vegetable_juice,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001830198 0.3050847 0.005998983 2.7989818 18
## [18026] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001830198 0.2812500 0.006507372 2.6803234 18
## [18027] {fruit/vegetable_juice,
## soda,
## tropical_fruit} => {yogurt} 0.001321810 0.3939394 0.003355363 2.8239023 13
## [18028] {fruit/vegetable_juice,
## tropical_fruit,
## yogurt} => {soda} 0.001321810 0.2708333 0.004880529 1.5531463 13
## [18029] {fruit/vegetable_juice,
## soda,
## yogurt} => {tropical_fruit} 0.001321810 0.2600000 0.005083884 2.4778101 13
## [18030] {soda,
## tropical_fruit,
## yogurt} => {fruit/vegetable_juice} 0.001321810 0.2000000 0.006609049 2.7665260 13
## [18031] {fruit/vegetable_juice,
## soda,
## tropical_fruit} => {other_vegetables} 0.001321810 0.3939394 0.003355363 2.0359401 13
## [18032] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit} => {soda} 0.001321810 0.2000000 0.006609049 1.1469388 13
## [18033] {fruit/vegetable_juice,
## other_vegetables,
## soda} => {tropical_fruit} 0.001321810 0.2954545 0.004473818 2.8156933 13
## [18034] {fruit/vegetable_juice,
## soda,
## tropical_fruit} => {whole_milk} 0.001220132 0.3636364 0.003355363 1.4231451 12
## [18035] {fruit/vegetable_juice,
## tropical_fruit,
## whole_milk} => {soda} 0.001220132 0.2033898 0.005998983 1.1663784 12
## [18036] {fruit/vegetable_juice,
## soda,
## whole_milk} => {tropical_fruit} 0.001220132 0.2000000 0.006100661 1.9060078 12
## [18037] {fruit/vegetable_juice,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.002846975 0.5833333 0.004880529 3.0147574 28
## [18038] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.002846975 0.4307692 0.006609049 3.0879121 28
## [18039] {fruit/vegetable_juice,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.002846975 0.3456790 0.008235892 3.2943344 28
## [18040] {other_vegetables,
## tropical_fruit,
## yogurt} => {fruit/vegetable_juice} 0.002846975 0.2314050 0.012302999 3.2009392 28
## [18041] {fruit/vegetable_juice,
## tropical_fruit,
## yogurt} => {whole_milk} 0.002745297 0.5625000 0.004880529 2.2014276 27
## [18042] {fruit/vegetable_juice,
## tropical_fruit,
## whole_milk} => {yogurt} 0.002745297 0.4576271 0.005998983 3.2804393 27
## [18043] {fruit/vegetable_juice,
## whole_milk,
## yogurt} => {tropical_fruit} 0.002745297 0.2903226 0.009456024 2.7667854 27
## [18044] {fruit/vegetable_juice,
## rolls/buns,
## tropical_fruit} => {other_vegetables} 0.001220132 0.4137931 0.002948653 2.1385471 12
## [18045] {fruit/vegetable_juice,
## other_vegetables,
## rolls/buns} => {tropical_fruit} 0.001220132 0.2790698 0.004372140 2.6595457 12
## [18046] {fruit/vegetable_juice,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001220132 0.4137931 0.002948653 1.6194410 12
## [18047] {fruit/vegetable_juice,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001220132 0.2033898 0.005998983 1.1057706 12
## [18048] {fruit/vegetable_juice,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001220132 0.2181818 0.005592272 2.0792812 12
## [18049] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.003253686 0.4923077 0.006609049 1.9267195 32
## [18050] {fruit/vegetable_juice,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.003253686 0.5423729 0.005998983 2.8030674 32
## [18051] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.003253686 0.3106796 0.010472801 2.9607887 32
## [18052] {fruit/vegetable_juice,
## root_vegetables,
## soda} => {yogurt} 0.001016777 0.3030303 0.003355363 2.1722325 10
## [18053] {fruit/vegetable_juice,
## root_vegetables,
## yogurt} => {soda} 0.001016777 0.2941176 0.003457041 1.6866747 10
## [18054] {fruit/vegetable_juice,
## soda,
## yogurt} => {root_vegetables} 0.001016777 0.2000000 0.005083884 1.8348881 10
## [18055] {root_vegetables,
## soda,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.2127660 0.004778851 2.9431128 10
## [18056] {fruit/vegetable_juice,
## root_vegetables,
## soda} => {other_vegetables} 0.001931876 0.5757576 0.003355363 2.9756047 19
## [18057] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {soda} 0.001931876 0.2923077 0.006609049 1.6762951 19
## [18058] {fruit/vegetable_juice,
## other_vegetables,
## soda} => {root_vegetables} 0.001931876 0.4318182 0.004473818 3.9616901 19
## [18059] {other_vegetables,
## root_vegetables,
## soda} => {fruit/vegetable_juice} 0.001931876 0.2345679 0.008235892 3.2446910 19
## [18060] {fruit/vegetable_juice,
## root_vegetables,
## soda} => {whole_milk} 0.001931876 0.5757576 0.003355363 2.2533131 19
## [18061] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {soda} 0.001931876 0.2968750 0.006507372 1.7024872 19
## [18062] {fruit/vegetable_juice,
## soda,
## whole_milk} => {root_vegetables} 0.001931876 0.3166667 0.006100661 2.9052394 19
## [18063] {root_vegetables,
## soda,
## whole_milk} => {fruit/vegetable_juice} 0.001931876 0.2375000 0.008134215 3.2852496 19
## [18064] {fruit/vegetable_juice,
## root_vegetables,
## yogurt} => {other_vegetables} 0.002440264 0.7058824 0.003457041 3.6481098 24
## [18065] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {yogurt} 0.002440264 0.3692308 0.006609049 2.6467818 24
## [18066] {fruit/vegetable_juice,
## other_vegetables,
## yogurt} => {root_vegetables} 0.002440264 0.2962963 0.008235892 2.7183527 24
## [18067] {fruit/vegetable_juice,
## root_vegetables,
## yogurt} => {whole_milk} 0.002541942 0.7352941 0.003457041 2.8776831 25
## [18068] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {yogurt} 0.002541942 0.3906250 0.006507372 2.8001435 25
## [18069] {fruit/vegetable_juice,
## whole_milk,
## yogurt} => {root_vegetables} 0.002541942 0.2688172 0.009456024 2.4662474 25
## [18070] {fruit/vegetable_juice,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001728521 0.6800000 0.002541942 3.5143458 17
## [18071] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.001728521 0.2615385 0.006609049 1.4219076 17
## [18072] {fruit/vegetable_juice,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.001728521 0.3953488 0.004372140 3.6271043 17
## [18073] {fruit/vegetable_juice,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001016777 0.4000000 0.002541942 1.5654596 10
## [18074] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.003965430 0.6000000 0.006609049 2.3481894 39
## [18075] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.003965430 0.6093750 0.006507372 3.1493448 39
## [18076] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.003965430 0.3786408 0.010472801 3.4738172 39
## [18077] {fruit/vegetable_juice,
## soda,
## yogurt} => {rolls/buns} 0.001321810 0.2600000 0.005083884 1.4135434 13
## [18078] {fruit/vegetable_juice,
## rolls/buns,
## soda} => {yogurt} 0.001321810 0.3333333 0.003965430 2.3894558 13
## [18079] {fruit/vegetable_juice,
## rolls/buns,
## yogurt} => {soda} 0.001321810 0.3513514 0.003762074 2.0148924 13
## [18080] {fruit/vegetable_juice,
## soda,
## yogurt} => {other_vegetables} 0.001728521 0.3400000 0.005083884 1.7571729 17
## [18081] {fruit/vegetable_juice,
## other_vegetables,
## soda} => {yogurt} 0.001728521 0.3863636 0.004473818 2.7695965 17
## [18082] {fruit/vegetable_juice,
## other_vegetables,
## yogurt} => {soda} 0.001728521 0.2098765 0.008235892 1.2035777 17
## [18083] {other_vegetables,
## soda,
## yogurt} => {fruit/vegetable_juice} 0.001728521 0.2073171 0.008337570 2.8677404 17
## [18084] {fruit/vegetable_juice,
## soda,
## yogurt} => {whole_milk} 0.002338587 0.4600000 0.005083884 1.8002786 23
## [18085] {fruit/vegetable_juice,
## soda,
## whole_milk} => {yogurt} 0.002338587 0.3833333 0.006100661 2.7478741 23
## [18086] {fruit/vegetable_juice,
## whole_milk,
## yogurt} => {soda} 0.002338587 0.2473118 0.009456024 1.4182576 23
## [18087] {soda,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.002338587 0.2233010 0.010472801 3.0888397 23
## [18088] {fruit/vegetable_juice,
## rolls/buns,
## soda} => {other_vegetables} 0.001220132 0.3076923 0.003965430 1.5902017 12
## [18089] {fruit/vegetable_juice,
## other_vegetables,
## soda} => {rolls/buns} 0.001220132 0.2727273 0.004473818 1.4827378 12
## [18090] {fruit/vegetable_juice,
## other_vegetables,
## rolls/buns} => {soda} 0.001220132 0.2790698 0.004372140 1.6003797 12
## [18091] {fruit/vegetable_juice,
## rolls/buns,
## soda} => {whole_milk} 0.001321810 0.3333333 0.003965430 1.3045497 13
## [18092] {fruit/vegetable_juice,
## soda,
## whole_milk} => {rolls/buns} 0.001321810 0.2166667 0.006100661 1.1779528 13
## [18093] {fruit/vegetable_juice,
## rolls/buns,
## whole_milk} => {soda} 0.001321810 0.2363636 0.005592272 1.3554731 13
## [18094] {fruit/vegetable_juice,
## other_vegetables,
## soda} => {whole_milk} 0.002745297 0.6136364 0.004473818 2.4015574 27
## [18095] {fruit/vegetable_juice,
## soda,
## whole_milk} => {other_vegetables} 0.002745297 0.4500000 0.006100661 2.3256700 27
## [18096] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {soda} 0.002745297 0.2621359 0.010472801 1.5032693 27
## [18097] {fruit/vegetable_juice,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001728521 0.4594595 0.003762074 2.3745580 17
## [18098] {fruit/vegetable_juice,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001728521 0.2098765 0.008235892 1.1410369 17
## [18099] {fruit/vegetable_juice,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001728521 0.3953488 0.004372140 2.8340057 17
## [18100] {fruit/vegetable_juice,
## rolls/buns,
## yogurt} => {whole_milk} 0.002135231 0.5675676 0.003762074 2.2212603 21
## [18101] {fruit/vegetable_juice,
## whole_milk,
## yogurt} => {rolls/buns} 0.002135231 0.2258065 0.009456024 1.2276431 21
## [18102] {fruit/vegetable_juice,
## rolls/buns,
## whole_milk} => {yogurt} 0.002135231 0.3818182 0.005592272 2.7370130 21
## [18103] {fruit/vegetable_juice,
## other_vegetables,
## yogurt} => {whole_milk} 0.005083884 0.6172840 0.008235892 2.4158327 50
## [18104] {fruit/vegetable_juice,
## whole_milk,
## yogurt} => {other_vegetables} 0.005083884 0.5376344 0.009456024 2.7785782 50
## [18105] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {yogurt} 0.005083884 0.4854369 0.010472801 3.4797900 50
## [18106] {other_vegetables,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.005083884 0.2283105 0.022267412 3.1581347 50
## [18107] {fruit/vegetable_juice,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.002135231 0.4883721 0.004372140 1.9113170 21
## [18108] {fruit/vegetable_juice,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.002135231 0.3818182 0.005592272 1.9732958 21
## [18109] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.002135231 0.2038835 0.010472801 1.1084545 21
## [18110] {citrus_fruit,
## pip_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.7857143 0.001423488 4.0606936 11
## [18111] {other_vegetables,
## pip_fruit,
## whipped/sour_cream} => {citrus_fruit} 0.001118454 0.2000000 0.005592272 2.4164619 11
## [18112] {citrus_fruit,
## pip_fruit,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [18113] {pip_fruit,
## shopping_bags,
## whipped/sour_cream} => {tropical_fruit} 0.001118454 0.6111111 0.001830198 5.8239126 11
## [18114] {pip_fruit,
## tropical_fruit,
## whipped/sour_cream} => {shopping_bags} 0.001118454 0.2972973 0.003762074 3.0174602 11
## [18115] {shopping_bags,
## tropical_fruit,
## whipped/sour_cream} => {pip_fruit} 0.001118454 0.6470588 0.001728521 8.5535262 11
## [18116] {pip_fruit,
## shopping_bags,
## tropical_fruit} => {whipped/sour_cream} 0.001118454 0.3437500 0.003253686 4.7954344 11
## [18117] {pip_fruit,
## shopping_bags,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [18118] {other_vegetables,
## pip_fruit,
## whipped/sour_cream} => {shopping_bags} 0.001220132 0.2181818 0.005592272 2.2144666 12
## [18119] {other_vegetables,
## shopping_bags,
## whipped/sour_cream} => {pip_fruit} 0.001220132 0.3333333 0.003660397 4.4063620 12
## [18120] {other_vegetables,
## pip_fruit,
## shopping_bags} => {whipped/sour_cream} 0.001220132 0.4137931 0.002948653 5.7725605 12
## [18121] {pip_fruit,
## sausage,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.8000000 0.001525165 3.1309192 12
## [18122] {pip_fruit,
## whipped/sour_cream,
## whole_milk} => {sausage} 0.001220132 0.2033898 0.005998983 2.1648690 12
## [18123] {sausage,
## whipped/sour_cream,
## whole_milk} => {pip_fruit} 0.001220132 0.2400000 0.005083884 3.1725806 12
## [18124] {pip_fruit,
## sausage,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.2181818 0.005592272 3.0437137 12
## [18125] {pip_fruit,
## tropical_fruit,
## whipped/sour_cream} => {root_vegetables} 0.001321810 0.3513514 0.003762074 3.2234520 13
## [18126] {pip_fruit,
## root_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001321810 0.4333333 0.003050330 4.1296835 13
## [18127] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {pip_fruit} 0.001321810 0.2888889 0.004575496 3.8188471 13
## [18128] {pip_fruit,
## root_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001321810 0.2500000 0.005287239 3.4875887 13
## [18129] {pip_fruit,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001728521 0.4594595 0.003762074 3.2935742 17
## [18130] {pip_fruit,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001728521 0.4722222 0.003660397 4.5002961 17
## [18131] {tropical_fruit,
## whipped/sour_cream,
## yogurt} => {pip_fruit} 0.001728521 0.2786885 0.006202339 3.6840076 17
## [18132] {pip_fruit,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001728521 0.2698413 0.006405694 3.7643814 17
## [18133] {pip_fruit,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.002745297 0.7297297 0.003762074 3.7713567 27
## [18134] {other_vegetables,
## pip_fruit,
## whipped/sour_cream} => {tropical_fruit} 0.002745297 0.4909091 0.005592272 4.6783827 27
## [18135] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {pip_fruit} 0.002745297 0.3506494 0.007829181 4.6352639 27
## [18136] {other_vegetables,
## pip_fruit,
## tropical_fruit} => {whipped/sour_cream} 0.002745297 0.2903226 0.009456024 4.0501030 27
## [18137] {pip_fruit,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.002033554 0.5405405 0.003762074 2.1154860 20
## [18138] {pip_fruit,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.002033554 0.3389831 0.005998983 3.2305216 20
## [18139] {tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {pip_fruit} 0.002033554 0.2564103 0.007930859 3.3895092 20
## [18140] {pip_fruit,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.002033554 0.2409639 0.008439248 3.3615312 20
## [18141] {pip_fruit,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001423488 0.4666667 0.003050330 3.3452381 14
## [18142] {pip_fruit,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001423488 0.3888889 0.003660397 3.5678379 14
## [18143] {root_vegetables,
## whipped/sour_cream,
## yogurt} => {pip_fruit} 0.001423488 0.2222222 0.006405694 2.9375747 14
## [18144] {pip_fruit,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001423488 0.2692308 0.005287239 3.7558647 14
## [18145] {pip_fruit,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.002033554 0.6666667 0.003050330 3.4454370 20
## [18146] {other_vegetables,
## pip_fruit,
## whipped/sour_cream} => {root_vegetables} 0.002033554 0.3636364 0.005592272 3.3361601 20
## [18147] {other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {pip_fruit} 0.002033554 0.2380952 0.008540925 3.1474014 20
## [18148] {other_vegetables,
## pip_fruit,
## root_vegetables} => {whipped/sour_cream} 0.002033554 0.2500000 0.008134215 3.4875887 20
## [18149] {pip_fruit,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.002338587 0.7666667 0.003050330 3.0004643 23
## [18150] {pip_fruit,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.002338587 0.3898305 0.005998983 3.5764767 23
## [18151] {root_vegetables,
## whipped/sour_cream,
## whole_milk} => {pip_fruit} 0.002338587 0.2473118 0.009456024 3.2692363 23
## [18152] {pip_fruit,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.002338587 0.2613636 0.008947636 3.6461154 23
## [18153] {pip_fruit,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.002236909 0.6111111 0.003660397 3.1583173 22
## [18154] {other_vegetables,
## pip_fruit,
## whipped/sour_cream} => {yogurt} 0.002236909 0.4000000 0.005592272 2.8673469 22
## [18155] {other_vegetables,
## whipped/sour_cream,
## yogurt} => {pip_fruit} 0.002236909 0.2200000 0.010167768 2.9081989 22
## [18156] {other_vegetables,
## pip_fruit,
## yogurt} => {whipped/sour_cream} 0.002236909 0.2750000 0.008134215 3.8363475 22
## [18157] {pip_fruit,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.002440264 0.6666667 0.003660397 2.6090994 24
## [18158] {pip_fruit,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.002440264 0.4067797 0.005998983 2.9159460 24
## [18159] {whipped/sour_cream,
## whole_milk,
## yogurt} => {pip_fruit} 0.002440264 0.2242991 0.010879512 2.9650286 24
## [18160] {pip_fruit,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.002440264 0.2553191 0.009557702 3.5617927 24
## [18161] {other_vegetables,
## pip_fruit,
## whipped/sour_cream} => {whole_milk} 0.003660397 0.6545455 0.005592272 2.5616612 36
## [18162] {pip_fruit,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.003660397 0.6101695 0.005998983 3.1534508 36
## [18163] {other_vegetables,
## whipped/sour_cream,
## whole_milk} => {pip_fruit} 0.003660397 0.2500000 0.014641586 3.3047715 36
## [18164] {other_vegetables,
## pip_fruit,
## whole_milk} => {whipped/sour_cream} 0.003660397 0.2706767 0.013523132 3.7760358 36
## [18165] {citrus_fruit,
## pastry,
## whipped/sour_cream} => {rolls/buns} 0.001016777 0.5882353 0.001728521 3.1980620 10
## [18166] {pastry,
## rolls/buns,
## whipped/sour_cream} => {citrus_fruit} 0.001016777 0.4166667 0.002440264 5.0342957 10
## [18167] {citrus_fruit,
## rolls/buns,
## whipped/sour_cream} => {pastry} 0.001016777 0.3571429 0.002846975 4.0142857 10
## [18168] {citrus_fruit,
## pastry,
## rolls/buns} => {whipped/sour_cream} 0.001016777 0.3333333 0.003050330 4.6501182 10
## [18169] {citrus_fruit,
## pastry,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.8823529 0.001728521 3.4532197 15
## [18170] {pastry,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.001525165 0.3658537 0.004168785 4.4203572 15
## [18171] {citrus_fruit,
## whipped/sour_cream,
## whole_milk} => {pastry} 0.001525165 0.2419355 0.006304016 2.7193548 15
## [18172] {citrus_fruit,
## pastry,
## whole_milk} => {whipped/sour_cream} 0.001525165 0.3125000 0.004880529 4.3594858 15
## [18173] {pastry,
## sausage,
## whipped/sour_cream} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [18174] {pastry,
## whipped/sour_cream,
## yogurt} => {sausage} 0.001016777 0.3703704 0.002745297 3.9421998 10
## [18175] {sausage,
## whipped/sour_cream,
## yogurt} => {pastry} 0.001016777 0.2857143 0.003558719 3.2114286 10
## [18176] {pastry,
## sausage,
## yogurt} => {whipped/sour_cream} 0.001016777 0.2380952 0.004270463 3.3215130 10
## [18177] {pastry,
## sausage,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [18178] {other_vegetables,
## pastry,
## whipped/sour_cream} => {sausage} 0.001220132 0.2926829 0.004168785 3.1152993 12
## [18179] {other_vegetables,
## sausage,
## whipped/sour_cream} => {pastry} 0.001220132 0.2500000 0.004880529 2.8100000 12
## [18180] {other_vegetables,
## pastry,
## sausage} => {whipped/sour_cream} 0.001220132 0.3076923 0.003965430 4.2924168 12
## [18181] {pastry,
## sausage,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [18182] {pastry,
## whipped/sour_cream,
## whole_milk} => {sausage} 0.001118454 0.2682927 0.004168785 2.8556911 11
## [18183] {sausage,
## whipped/sour_cream,
## whole_milk} => {pastry} 0.001118454 0.2200000 0.005083884 2.4728000 11
## [18184] {pastry,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001118454 0.6111111 0.001830198 4.3806689 11
## [18185] {pastry,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001118454 0.4074074 0.002745297 3.8826084 11
## [18186] {pastry,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001118454 0.2391304 0.004677173 3.3359544 11
## [18187] {pastry,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001321810 0.7222222 0.001830198 3.7325568 13
## [18188] {other_vegetables,
## pastry,
## whipped/sour_cream} => {tropical_fruit} 0.001321810 0.3170732 0.004168785 3.0217196 13
## [18189] {other_vegetables,
## pastry,
## tropical_fruit} => {whipped/sour_cream} 0.001321810 0.2600000 0.005083884 3.6270922 13
## [18190] {pastry,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [18191] {pastry,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001118454 0.2682927 0.004168785 2.5568397 11
## [18192] {pastry,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001321810 0.6500000 0.002033554 3.3593011 13
## [18193] {other_vegetables,
## pastry,
## whipped/sour_cream} => {root_vegetables} 0.001321810 0.3170732 0.004168785 2.9089689 13
## [18194] {other_vegetables,
## pastry,
## root_vegetables} => {whipped/sour_cream} 0.001321810 0.2241379 0.005897306 3.1268036 13
## [18195] {pastry,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.6500000 0.002033554 2.5438719 13
## [18196] {pastry,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001321810 0.3170732 0.004168785 2.9089689 13
## [18197] {pastry,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001321810 0.2321429 0.005693950 3.2384752 13
## [18198] {pastry,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001830198 0.6666667 0.002745297 3.4454370 18
## [18199] {other_vegetables,
## pastry,
## whipped/sour_cream} => {yogurt} 0.001830198 0.4390244 0.004168785 3.1470881 18
## [18200] {other_vegetables,
## pastry,
## yogurt} => {whipped/sour_cream} 0.001830198 0.2769231 0.006609049 3.8631751 18
## [18201] {pastry,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001626843 0.5925926 0.002745297 2.3191994 16
## [18202] {pastry,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001626843 0.3902439 0.004168785 2.7974116 16
## [18203] {pastry,
## rolls/buns,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.5833333 0.002440264 3.0147574 14
## [18204] {other_vegetables,
## pastry,
## whipped/sour_cream} => {rolls/buns} 0.001423488 0.3414634 0.004168785 1.8564360 14
## [18205] {other_vegetables,
## rolls/buns,
## whipped/sour_cream} => {pastry} 0.001423488 0.2121212 0.006710727 2.3842424 14
## [18206] {other_vegetables,
## pastry,
## rolls/buns} => {whipped/sour_cream} 0.001423488 0.2333333 0.006100661 3.2550827 14
## [18207] {pastry,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.6250000 0.002440264 2.4460306 15
## [18208] {pastry,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001525165 0.3658537 0.004168785 1.9890385 15
## [18209] {other_vegetables,
## pastry,
## whipped/sour_cream} => {whole_milk} 0.002440264 0.5853659 0.004168785 2.2909165 24
## [18210] {pastry,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.002440264 0.5853659 0.004168785 3.0252618 24
## [18211] {other_vegetables,
## pastry,
## whole_milk} => {whipped/sour_cream} 0.002440264 0.2307692 0.010574479 3.2193126 24
## [18212] {citrus_fruit,
## sausage,
## whipped/sour_cream} => {yogurt} 0.001321810 0.5652174 0.002338587 4.0516859 13
## [18213] {citrus_fruit,
## whipped/sour_cream,
## yogurt} => {sausage} 0.001321810 0.2888889 0.004575496 3.0749158 13
## [18214] {sausage,
## whipped/sour_cream,
## yogurt} => {citrus_fruit} 0.001321810 0.3714286 0.003558719 4.4877150 13
## [18215] {citrus_fruit,
## sausage,
## yogurt} => {whipped/sour_cream} 0.001321810 0.3421053 0.003863752 4.7724897 13
## [18216] {citrus_fruit,
## sausage,
## whipped/sour_cream} => {other_vegetables} 0.001525165 0.6521739 0.002338587 3.3705362 15
## [18217] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream} => {sausage} 0.001525165 0.2678571 0.005693950 2.8510552 15
## [18218] {other_vegetables,
## sausage,
## whipped/sour_cream} => {citrus_fruit} 0.001525165 0.3125000 0.004880529 3.7757217 15
## [18219] {citrus_fruit,
## other_vegetables,
## sausage} => {whipped/sour_cream} 0.001525165 0.3409091 0.004473818 4.7558027 15
## [18220] {citrus_fruit,
## sausage,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.6521739 0.002338587 2.5523798 15
## [18221] {citrus_fruit,
## whipped/sour_cream,
## whole_milk} => {sausage} 0.001525165 0.2419355 0.006304016 2.5751466 15
## [18222] {sausage,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.001525165 0.3000000 0.005083884 3.6246929 15
## [18223] {citrus_fruit,
## sausage,
## whole_milk} => {whipped/sour_cream} 0.001525165 0.3061224 0.004982206 4.2705167 15
## [18224] {bottled_water,
## citrus_fruit,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [18225] {bottled_water,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.001016777 0.2325581 0.004372140 2.8098394 10
## [18226] {citrus_fruit,
## tropical_fruit,
## whipped/sour_cream} => {root_vegetables} 0.001220132 0.3870968 0.003152008 3.5513962 12
## [18227] {citrus_fruit,
## root_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001220132 0.3636364 0.003355363 3.4654686 12
## [18228] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {citrus_fruit} 0.001220132 0.2666667 0.004575496 3.2219492 12
## [18229] {citrus_fruit,
## root_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001220132 0.2142857 0.005693950 2.9893617 12
## [18230] {citrus_fruit,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001525165 0.4838710 0.003152008 3.4685648 15
## [18231] {citrus_fruit,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001525165 0.3333333 0.004575496 3.1766796 15
## [18232] {tropical_fruit,
## whipped/sour_cream,
## yogurt} => {citrus_fruit} 0.001525165 0.2459016 0.006202339 2.9710597 15
## [18233] {citrus_fruit,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001525165 0.2419355 0.006304016 3.3750858 15
## [18234] {citrus_fruit,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.002135231 0.6774194 0.003152008 3.5010086 21
## [18235] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.002135231 0.3750000 0.005693950 3.5737645 21
## [18236] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {citrus_fruit} 0.002135231 0.2727273 0.007829181 3.2951753 21
## [18237] {citrus_fruit,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.002135231 0.2359551 0.009049314 3.2916567 21
## [18238] {citrus_fruit,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.002338587 0.7419355 0.003152008 2.9036751 23
## [18239] {citrus_fruit,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.002338587 0.3709677 0.006304016 3.5353370 23
## [18240] {tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.002338587 0.2948718 0.007930859 3.5627323 23
## [18241] {citrus_fruit,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.002338587 0.2584270 0.009049314 3.6051478 23
## [18242] {citrus_fruit,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001728521 0.5151515 0.003355363 3.6927953 17
## [18243] {citrus_fruit,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001728521 0.3777778 0.004575496 3.4658997 17
## [18244] {root_vegetables,
## whipped/sour_cream,
## yogurt} => {citrus_fruit} 0.001728521 0.2698413 0.006405694 3.2603058 17
## [18245] {citrus_fruit,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001728521 0.3541667 0.004880529 4.9407506 17
## [18246] {citrus_fruit,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.002338587 0.6969697 0.003355363 3.6020478 23
## [18247] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.002338587 0.4107143 0.005693950 3.7680737 23
## [18248] {other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {citrus_fruit} 0.002338587 0.2738095 0.008540925 3.3082514 23
## [18249] {citrus_fruit,
## other_vegetables,
## root_vegetables} => {whipped/sour_cream} 0.002338587 0.2254902 0.010371124 3.1456682 23
## [18250] {citrus_fruit,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.002033554 0.6060606 0.003355363 2.3719085 20
## [18251] {citrus_fruit,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.002033554 0.3225806 0.006304016 2.9594969 20
## [18252] {root_vegetables,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.002033554 0.2150538 0.009456024 2.5983461 20
## [18253] {citrus_fruit,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.002033554 0.2222222 0.009150991 3.1000788 20
## [18254] {citrus_fruit,
## soda,
## whipped/sour_cream} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [18255] {citrus_fruit,
## whipped/sour_cream,
## yogurt} => {soda} 0.001016777 0.2222222 0.004575496 1.2743764 10
## [18256] {soda,
## whipped/sour_cream,
## yogurt} => {citrus_fruit} 0.001016777 0.2500000 0.004067107 3.0205774 10
## [18257] {citrus_fruit,
## soda,
## yogurt} => {whipped/sour_cream} 0.001016777 0.2439024 0.004168785 3.4025255 10
## [18258] {citrus_fruit,
## soda,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [18259] {other_vegetables,
## soda,
## whipped/sour_cream} => {citrus_fruit} 0.001016777 0.2083333 0.004880529 2.5171478 10
## [18260] {citrus_fruit,
## other_vegetables,
## soda} => {whipped/sour_cream} 0.001016777 0.2439024 0.004168785 3.4025255 10
## [18261] {citrus_fruit,
## soda,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [18262] {citrus_fruit,
## soda,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2272727 0.004473818 3.1705351 10
## [18263] {citrus_fruit,
## whipped/sour_cream,
## yogurt} => {rolls/buns} 0.001220132 0.2666667 0.004575496 1.4497881 12
## [18264] {citrus_fruit,
## rolls/buns,
## whipped/sour_cream} => {yogurt} 0.001220132 0.4285714 0.002846975 3.0721574 12
## [18265] {rolls/buns,
## whipped/sour_cream,
## yogurt} => {citrus_fruit} 0.001220132 0.2553191 0.004778851 3.0848450 12
## [18266] {citrus_fruit,
## rolls/buns,
## yogurt} => {whipped/sour_cream} 0.001220132 0.2105263 0.005795628 2.9369168 12
## [18267] {citrus_fruit,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.002338587 0.5111111 0.004575496 2.6415017 23
## [18268] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.002338587 0.4107143 0.005693950 2.9441509 23
## [18269] {other_vegetables,
## whipped/sour_cream,
## yogurt} => {citrus_fruit} 0.002338587 0.2300000 0.010167768 2.7789312 23
## [18270] {citrus_fruit,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.002338587 0.3066667 0.007625826 4.2781087 23
## [18271] {citrus_fruit,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.002745297 0.6000000 0.004575496 2.3481894 27
## [18272] {citrus_fruit,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.002745297 0.4354839 0.006304016 3.1217084 27
## [18273] {whipped/sour_cream,
## whole_milk,
## yogurt} => {citrus_fruit} 0.002745297 0.2523364 0.010879512 3.0488071 27
## [18274] {citrus_fruit,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.002745297 0.2673267 0.010269446 3.7293027 27
## [18275] {citrus_fruit,
## rolls/buns,
## whipped/sour_cream} => {other_vegetables} 0.001321810 0.4642857 0.002846975 2.3995008 13
## [18276] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream} => {rolls/buns} 0.001321810 0.2321429 0.005693950 1.2620923 13
## [18277] {citrus_fruit,
## other_vegetables,
## rolls/buns} => {whipped/sour_cream} 0.001321810 0.2203390 0.005998983 3.0738069 13
## [18278] {citrus_fruit,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.002033554 0.7142857 0.002846975 2.7954636 20
## [18279] {citrus_fruit,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.002033554 0.3225806 0.006304016 1.7537759 20
## [18280] {rolls/buns,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.002033554 0.2597403 0.007829181 3.1382622 20
## [18281] {citrus_fruit,
## rolls/buns,
## whole_milk} => {whipped/sour_cream} 0.002033554 0.2816901 0.007219115 3.9296774 20
## [18282] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.003660397 0.6428571 0.005693950 2.5159172 36
## [18283] {citrus_fruit,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.003660397 0.5806452 0.006304016 3.0008645 36
## [18284] {other_vegetables,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.003660397 0.2500000 0.014641586 3.0205774 36
## [18285] {citrus_fruit,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.003660397 0.2812500 0.013014743 3.9235372 36
## [18286] {shopping_bags,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [18287] {other_vegetables,
## shopping_bags,
## whipped/sour_cream} => {tropical_fruit} 0.001220132 0.3333333 0.003660397 3.1766796 12
## [18288] {other_vegetables,
## shopping_bags,
## tropical_fruit} => {whipped/sour_cream} 0.001220132 0.2553191 0.004778851 3.5617927 12
## [18289] {root_vegetables,
## shopping_bags,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.6363636 0.002236909 3.2888263 14
## [18290] {other_vegetables,
## shopping_bags,
## whipped/sour_cream} => {root_vegetables} 0.001423488 0.3888889 0.003660397 3.5678379 14
## [18291] {other_vegetables,
## root_vegetables,
## shopping_bags} => {whipped/sour_cream} 0.001423488 0.2153846 0.006609049 3.0046918 14
## [18292] {root_vegetables,
## shopping_bags,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [18293] {shopping_bags,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001118454 0.4230769 0.002643620 3.8814940 11
## [18294] {root_vegetables,
## shopping_bags,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.2115385 0.005287239 2.9510366 11
## [18295] {shopping_bags,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [18296] {other_vegetables,
## shopping_bags,
## whipped/sour_cream} => {yogurt} 0.001118454 0.3055556 0.003660397 2.1903345 11
## [18297] {other_vegetables,
## shopping_bags,
## yogurt} => {whipped/sour_cream} 0.001118454 0.2075472 0.005388917 2.8953566 11
## [18298] {other_vegetables,
## shopping_bags,
## whipped/sour_cream} => {whole_milk} 0.001423488 0.3888889 0.003660397 1.5219746 14
## [18299] {shopping_bags,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001423488 0.5384615 0.002643620 2.7828530 14
## [18300] {bottled_water,
## sausage,
## whipped/sour_cream} => {other_vegetables} 0.001321810 0.8125000 0.001626843 4.1991264 13
## [18301] {other_vegetables,
## sausage,
## whipped/sour_cream} => {bottled_water} 0.001321810 0.2708333 0.004880529 2.4504561 13
## [18302] {bottled_water,
## other_vegetables,
## whipped/sour_cream} => {sausage} 0.001321810 0.3421053 0.003863752 3.6413477 13
## [18303] {bottled_water,
## other_vegetables,
## sausage} => {whipped/sour_cream} 0.001321810 0.2600000 0.005083884 3.6270922 13
## [18304] {sausage,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [18305] {sausage,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001016777 0.2857143 0.003558719 2.7228682 10
## [18306] {sausage,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001016777 0.2173913 0.004677173 3.0326858 10
## [18307] {sausage,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [18308] {other_vegetables,
## sausage,
## whipped/sour_cream} => {tropical_fruit} 0.001321810 0.2708333 0.004880529 2.5810522 13
## [18309] {other_vegetables,
## sausage,
## tropical_fruit} => {whipped/sour_cream} 0.001321810 0.2203390 0.005998983 3.0738069 13
## [18310] {sausage,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001626843 0.7619048 0.002135231 2.9818278 16
## [18311] {sausage,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001626843 0.3200000 0.005083884 3.0496124 16
## [18312] {tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {sausage} 0.001626843 0.2051282 0.007930859 2.1833722 16
## [18313] {sausage,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001626843 0.2253521 0.007219115 3.1437419 16
## [18314] {root_vegetables,
## sausage,
## whipped/sour_cream} => {yogurt} 0.001525165 0.7142857 0.002135231 5.1202624 15
## [18315] {sausage,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001525165 0.4285714 0.003558719 3.9319030 15
## [18316] {root_vegetables,
## whipped/sour_cream,
## yogurt} => {sausage} 0.001525165 0.2380952 0.006405694 2.5342713 15
## [18317] {root_vegetables,
## sausage,
## yogurt} => {whipped/sour_cream} 0.001525165 0.2941176 0.005185562 4.1030455 15
## [18318] {root_vegetables,
## sausage,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [18319] {other_vegetables,
## sausage,
## whipped/sour_cream} => {root_vegetables} 0.001118454 0.2291667 0.004880529 2.1024759 11
## [18320] {root_vegetables,
## sausage,
## whipped/sour_cream} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [18321] {sausage,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001423488 0.2800000 0.005083884 2.5688433 14
## [18322] {sausage,
## soda,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.6666667 0.002135231 3.4454370 14
## [18323] {other_vegetables,
## sausage,
## whipped/sour_cream} => {soda} 0.001423488 0.2916667 0.004880529 1.6726190 14
## [18324] {other_vegetables,
## soda,
## whipped/sour_cream} => {sausage} 0.001423488 0.2916667 0.004880529 3.1044823 14
## [18325] {sausage,
## soda,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [18326] {sausage,
## whipped/sour_cream,
## whole_milk} => {soda} 0.001321810 0.2600000 0.005083884 1.4910204 13
## [18327] {soda,
## whipped/sour_cream,
## whole_milk} => {sausage} 0.001321810 0.2407407 0.005490595 2.5624299 13
## [18328] {sausage,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.002033554 0.5714286 0.003558719 2.9532317 20
## [18329] {other_vegetables,
## sausage,
## whipped/sour_cream} => {yogurt} 0.002033554 0.4166667 0.004880529 2.9868197 20
## [18330] {other_vegetables,
## whipped/sour_cream,
## yogurt} => {sausage} 0.002033554 0.2000000 0.010167768 2.1287879 20
## [18331] {other_vegetables,
## sausage,
## yogurt} => {whipped/sour_cream} 0.002033554 0.2500000 0.008134215 3.4875887 20
## [18332] {sausage,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001931876 0.5428571 0.003558719 2.1245523 19
## [18333] {sausage,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001931876 0.3800000 0.005083884 2.7239796 19
## [18334] {sausage,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001931876 0.2209302 0.008744281 3.0820551 19
## [18335] {rolls/buns,
## sausage,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.5833333 0.002440264 3.0147574 14
## [18336] {other_vegetables,
## sausage,
## whipped/sour_cream} => {rolls/buns} 0.001423488 0.2916667 0.004880529 1.5857057 14
## [18337] {other_vegetables,
## rolls/buns,
## whipped/sour_cream} => {sausage} 0.001423488 0.2121212 0.006710727 2.2578053 14
## [18338] {rolls/buns,
## sausage,
## whipped/sour_cream} => {whole_milk} 0.001423488 0.5833333 0.002440264 2.2829619 14
## [18339] {sausage,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001423488 0.2800000 0.005083884 1.5222775 14
## [18340] {other_vegetables,
## sausage,
## whipped/sour_cream} => {whole_milk} 0.002948653 0.6041667 0.004880529 2.3644963 29
## [18341] {sausage,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.002948653 0.5800000 0.005083884 2.9975302 29
## [18342] {other_vegetables,
## whipped/sour_cream,
## whole_milk} => {sausage} 0.002948653 0.2013889 0.014641586 2.1435711 29
## [18343] {other_vegetables,
## sausage,
## whole_milk} => {whipped/sour_cream} 0.002948653 0.2900000 0.010167768 4.0456028 29
## [18344] {bottled_water,
## tropical_fruit,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.3846154 0.002643620 3.5286309 10
## [18345] {bottled_water,
## root_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001016777 0.4347826 0.002338587 4.1434951 10
## [18346] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {bottled_water} 0.001016777 0.2222222 0.004575496 2.0106307 10
## [18347] {bottled_water,
## root_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001016777 0.2222222 0.004575496 3.1000788 10
## [18348] {bottled_water,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001626843 0.6153846 0.002643620 4.4113030 16
## [18349] {bottled_water,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001626843 0.5333333 0.003050330 5.0826873 16
## [18350] {tropical_fruit,
## whipped/sour_cream,
## yogurt} => {bottled_water} 0.001626843 0.2622951 0.006202339 2.3732034 16
## [18351] {bottled_water,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001626843 0.2285714 0.007117438 3.1886525 16
## [18352] {bottled_water,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001525165 0.5769231 0.002643620 2.9816282 15
## [18353] {bottled_water,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001525165 0.3947368 0.003863752 3.7618574 15
## [18354] {bottled_water,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001525165 0.2459016 0.006202339 3.4304151 15
## [18355] {bottled_water,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.5769231 0.002643620 2.2578744 15
## [18356] {bottled_water,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001525165 0.3488372 0.004372140 3.3244321 15
## [18357] {bottled_water,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001016777 0.4347826 0.002338587 3.1166815 10
## [18358] {bottled_water,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001016777 0.3333333 0.003050330 3.0581468 10
## [18359] {bottled_water,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001016777 0.2631579 0.003863752 3.6711459 10
## [18360] {bottled_water,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [18361] {bottled_water,
## other_vegetables,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.2631579 0.003863752 2.4143264 10
## [18362] {bottled_water,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.6521739 0.002338587 2.5523798 15
## [18363] {bottled_water,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001525165 0.3488372 0.004372140 3.2003862 15
## [18364] {bottled_water,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001525165 0.2083333 0.007320793 2.9063239 15
## [18365] {bottled_water,
## soda,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [18366] {bottled_water,
## other_vegetables,
## whipped/sour_cream} => {soda} 0.001118454 0.2894737 0.003863752 1.6600430 11
## [18367] {other_vegetables,
## soda,
## whipped/sour_cream} => {bottled_water} 0.001118454 0.2291667 0.004880529 2.0734629 11
## [18368] {bottled_water,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001830198 0.6000000 0.003050330 3.1008933 18
## [18369] {bottled_water,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001830198 0.4736842 0.003863752 3.3955424 18
## [18370] {bottled_water,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001830198 0.2250000 0.008134215 3.1388298 18
## [18371] {bottled_water,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001626843 0.5333333 0.003050330 2.0872795 16
## [18372] {bottled_water,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001626843 0.3720930 0.004372140 2.6672995 16
## [18373] {bottled_water,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [18374] {bottled_water,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001220132 0.2790698 0.004372140 1.5172201 12
## [18375] {bottled_water,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001931876 0.5000000 0.003863752 1.9568245 19
## [18376] {bottled_water,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001931876 0.4418605 0.004372140 2.2836036 19
## [18377] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.002338587 0.5111111 0.004575496 3.6638322 23
## [18378] {tropical_fruit,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.002338587 0.3770492 0.006202339 3.4592152 23
## [18379] {root_vegetables,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.002338587 0.3650794 0.006405694 3.4792205 23
## [18380] {root_vegetables,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.002338587 0.2875000 0.008134215 4.0107270 23
## [18381] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {rolls/buns} 0.001525165 0.3333333 0.004575496 1.8122351 15
## [18382] {rolls/buns,
## tropical_fruit,
## whipped/sour_cream} => {root_vegetables} 0.001525165 0.4411765 0.003457041 4.0475472 15
## [18383] {rolls/buns,
## root_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001525165 0.3488372 0.004372140 3.3244321 15
## [18384] {rolls/buns,
## root_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001525165 0.2586207 0.005897306 3.6078503 15
## [18385] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.003355363 0.7333333 0.004575496 3.7899807 33
## [18386] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {root_vegetables} 0.003355363 0.4285714 0.007829181 3.9319030 33
## [18387] {other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.003355363 0.3928571 0.008540925 3.7439438 33
## [18388] {other_vegetables,
## root_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.003355363 0.2727273 0.012302999 3.8046422 33
## [18389] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.002745297 0.6000000 0.004575496 2.3481894 27
## [18390] {tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.002745297 0.3461538 0.007930859 3.1757678 27
## [18391] {root_vegetables,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.002745297 0.2903226 0.009456024 2.7667854 27
## [18392] {root_vegetables,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.002745297 0.2288136 0.011997966 3.1920303 27
## [18393] {soda,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001423488 0.5185185 0.002745297 3.7169312 14
## [18394] {tropical_fruit,
## whipped/sour_cream,
## yogurt} => {soda} 0.001423488 0.2295082 0.006202339 1.3161593 14
## [18395] {soda,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001423488 0.3500000 0.004067107 3.3355136 14
## [18396] {soda,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001423488 0.2153846 0.006609049 3.0046918 14
## [18397] {soda,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.5185185 0.002745297 2.6797844 14
## [18398] {other_vegetables,
## soda,
## whipped/sour_cream} => {tropical_fruit} 0.001423488 0.2916667 0.004880529 2.7795946 14
## [18399] {soda,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.4814815 0.002745297 1.8843495 13
## [18400] {soda,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001321810 0.2407407 0.005490595 2.2942686 13
## [18401] {tropical_fruit,
## whipped/sour_cream,
## yogurt} => {rolls/buns} 0.002135231 0.3442623 0.006202339 1.8716527 21
## [18402] {rolls/buns,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.002135231 0.6176471 0.003457041 4.4275210 21
## [18403] {rolls/buns,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.002135231 0.4468085 0.004778851 4.2581024 21
## [18404] {rolls/buns,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.002135231 0.2441860 0.008744281 3.4064819 21
## [18405] {tropical_fruit,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.003558719 0.5737705 0.006202339 2.9653351 35
## [18406] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.003558719 0.4545455 0.007829181 3.2583488 35
## [18407] {other_vegetables,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.003558719 0.3500000 0.010167768 3.3355136 35
## [18408] {other_vegetables,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.003558719 0.2892562 0.012302999 4.0352265 35
## [18409] {tropical_fruit,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.004372140 0.7049180 0.006202339 2.7588018 43
## [18410] {tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.004372140 0.5512821 0.007930859 3.9517923 43
## [18411] {whipped/sour_cream,
## whole_milk,
## yogurt} => {tropical_fruit} 0.004372140 0.4018692 0.010879512 3.8298287 43
## [18412] {tropical_fruit,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.004372140 0.2885906 0.015149975 4.0259413 43
## [18413] {rolls/buns,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001931876 0.5588235 0.003457041 2.8880869 19
## [18414] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {rolls/buns} 0.001931876 0.2467532 0.007829181 1.3415247 19
## [18415] {other_vegetables,
## rolls/buns,
## whipped/sour_cream} => {tropical_fruit} 0.001931876 0.2878788 0.006710727 2.7434960 19
## [18416] {other_vegetables,
## rolls/buns,
## tropical_fruit} => {whipped/sour_cream} 0.001931876 0.2467532 0.007829181 3.4422953 19
## [18417] {rolls/buns,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.002135231 0.6176471 0.003457041 2.4172538 21
## [18418] {tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.002135231 0.2692308 0.007930859 1.4637284 21
## [18419] {rolls/buns,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.002135231 0.2727273 0.007829181 2.5991015 21
## [18420] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.004473818 0.5714286 0.007829181 2.2363709 44
## [18421] {tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.004473818 0.5641026 0.007930859 2.9153698 44
## [18422] {other_vegetables,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.004473818 0.3055556 0.014641586 2.9119563 44
## [18423] {other_vegetables,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.004473818 0.2619048 0.017081851 3.6536643 44
## [18424] {root_vegetables,
## soda,
## whipped/sour_cream} => {yogurt} 0.001118454 0.4400000 0.002541942 3.1540816 11
## [18425] {soda,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001118454 0.2750000 0.004067107 2.5229711 11
## [18426] {root_vegetables,
## soda,
## yogurt} => {whipped/sour_cream} 0.001118454 0.2340426 0.004778851 3.2649766 11
## [18427] {root_vegetables,
## soda,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.5600000 0.002541942 2.8941671 14
## [18428] {other_vegetables,
## soda,
## whipped/sour_cream} => {root_vegetables} 0.001423488 0.2916667 0.004880529 2.6758784 14
## [18429] {root_vegetables,
## soda,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.5200000 0.002541942 2.0350975 13
## [18430] {soda,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001321810 0.2407407 0.005490595 2.2086616 13
## [18431] {root_vegetables,
## whipped/sour_cream,
## yogurt} => {rolls/buns} 0.001830198 0.2857143 0.006405694 1.5533444 18
## [18432] {rolls/buns,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001830198 0.4186047 0.004372140 3.0007119 18
## [18433] {rolls/buns,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001830198 0.3829787 0.004778851 3.5136154 18
## [18434] {rolls/buns,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001830198 0.2535211 0.007219115 3.5367096 18
## [18435] {root_vegetables,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.003457041 0.5396825 0.006405694 2.7891633 34
## [18436] {other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.003457041 0.4047619 0.008540925 2.9014820 34
## [18437] {other_vegetables,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.003457041 0.3400000 0.010167768 3.1193097 34
## [18438] {other_vegetables,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.003457041 0.2677165 0.012913066 3.7347406 34
## [18439] {root_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.003660397 0.5714286 0.006405694 2.2363709 36
## [18440] {root_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.003660397 0.3870968 0.009456024 2.7748519 36
## [18441] {whipped/sour_cream,
## whole_milk,
## yogurt} => {root_vegetables} 0.003660397 0.3364486 0.010879512 3.0867276 36
## [18442] {root_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.003660397 0.2517483 0.014539908 3.5119774 36
## [18443] {rolls/buns,
## root_vegetables,
## whipped/sour_cream} => {other_vegetables} 0.002541942 0.5813953 0.004372140 3.0047416 25
## [18444] {other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {rolls/buns} 0.002541942 0.2976190 0.008540925 1.6180671 25
## [18445] {other_vegetables,
## rolls/buns,
## whipped/sour_cream} => {root_vegetables} 0.002541942 0.3787879 0.006710727 3.4751668 25
## [18446] {other_vegetables,
## rolls/buns,
## root_vegetables} => {whipped/sour_cream} 0.002541942 0.2083333 0.012201322 2.9063239 25
## [18447] {rolls/buns,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.002846975 0.6511628 0.004372140 2.5484226 28
## [18448] {root_vegetables,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.002846975 0.3010753 0.009456024 1.6368575 28
## [18449] {rolls/buns,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.002846975 0.3636364 0.007829181 3.3361601 28
## [18450] {rolls/buns,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.002846975 0.2240000 0.012709710 3.1248794 28
## [18451] {other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.005185562 0.6071429 0.008540925 2.3761441 51
## [18452] {root_vegetables,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.005185562 0.5483871 0.009456024 2.8341498 51
## [18453] {other_vegetables,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.005185562 0.3541667 0.014641586 3.2492809 51
## [18454] {other_vegetables,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.005185562 0.2236842 0.023182511 3.1204741 51
## [18455] {soda,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.002033554 0.5000000 0.004067107 2.5840778 20
## [18456] {other_vegetables,
## soda,
## whipped/sour_cream} => {yogurt} 0.002033554 0.4166667 0.004880529 2.9868197 20
## [18457] {other_vegetables,
## whipped/sour_cream,
## yogurt} => {soda} 0.002033554 0.2000000 0.010167768 1.1469388 20
## [18458] {other_vegetables,
## soda,
## yogurt} => {whipped/sour_cream} 0.002033554 0.2439024 0.008337570 3.4025255 20
## [18459] {soda,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001931876 0.4750000 0.004067107 1.8589833 19
## [18460] {soda,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001931876 0.3518519 0.005490595 2.5222033 19
## [18461] {rolls/buns,
## soda,
## whipped/sour_cream} => {other_vegetables} 0.001423488 0.4516129 0.003152008 2.3340057 14
## [18462] {other_vegetables,
## soda,
## whipped/sour_cream} => {rolls/buns} 0.001423488 0.2916667 0.004880529 1.5857057 14
## [18463] {other_vegetables,
## rolls/buns,
## whipped/sour_cream} => {soda} 0.001423488 0.2121212 0.006710727 1.2164502 14
## [18464] {rolls/buns,
## soda,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.4838710 0.003152008 1.8937011 15
## [18465] {soda,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001525165 0.2777778 0.005490595 1.5101959 15
## [18466] {other_vegetables,
## soda,
## whipped/sour_cream} => {whole_milk} 0.002846975 0.5833333 0.004880529 2.2829619 28
## [18467] {soda,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.002846975 0.5185185 0.005490595 2.6797844 28
## [18468] {other_vegetables,
## soda,
## whole_milk} => {whipped/sour_cream} 0.002846975 0.2043796 0.013929842 2.8511674 28
## [18469] {rolls/buns,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.002440264 0.5106383 0.004778851 2.6390582 24
## [18470] {other_vegetables,
## whipped/sour_cream,
## yogurt} => {rolls/buns} 0.002440264 0.2400000 0.010167768 1.3048093 24
## [18471] {other_vegetables,
## rolls/buns,
## whipped/sour_cream} => {yogurt} 0.002440264 0.3636364 0.006710727 2.6066790 24
## [18472] {other_vegetables,
## rolls/buns,
## yogurt} => {whipped/sour_cream} 0.002440264 0.2123894 0.011489578 2.9629072 24
## [18473] {rolls/buns,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.003050330 0.6382979 0.004778851 2.4980738 30
## [18474] {whipped/sour_cream,
## whole_milk,
## yogurt} => {rolls/buns} 0.003050330 0.2803738 0.010879512 1.5243099 30
## [18475] {rolls/buns,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.003050330 0.3896104 0.007829181 2.7928704 30
## [18476] {other_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.005592272 0.5500000 0.010167768 2.1525070 55
## [18477] {whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.005592272 0.5140187 0.010879512 2.6565286 55
## [18478] {other_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.005592272 0.3819444 0.014641586 2.7379181 55
## [18479] {other_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.005592272 0.2511416 0.022267412 3.5035137 55
## [18480] {other_vegetables,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.003762074 0.5606061 0.006710727 2.1940154 37
## [18481] {rolls/buns,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.003762074 0.4805195 0.007829181 2.4833994 37
## [18482] {other_vegetables,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.003762074 0.2569444 0.014641586 1.3969312 37
## [18483] {other_vegetables,
## rolls/buns,
## whole_milk} => {whipped/sour_cream} 0.003762074 0.2102273 0.017895272 2.9327450 37
## [18484] {pastry,
## pip_fruit,
## sausage} => {tropical_fruit} 0.001220132 0.4800000 0.002541942 4.5744186 12
## [18485] {pastry,
## pip_fruit,
## tropical_fruit} => {sausage} 0.001220132 0.3243243 0.003762074 3.4520885 12
## [18486] {pip_fruit,
## sausage,
## tropical_fruit} => {pastry} 0.001220132 0.4000000 0.003050330 4.4960000 12
## [18487] {pastry,
## sausage,
## tropical_fruit} => {pip_fruit} 0.001220132 0.4137931 0.002948653 5.4699666 12
## [18488] {pastry,
## pip_fruit,
## sausage} => {yogurt} 0.001220132 0.4800000 0.002541942 3.4408163 12
## [18489] {pastry,
## pip_fruit,
## yogurt} => {sausage} 0.001220132 0.3428571 0.003558719 3.6493506 12
## [18490] {pip_fruit,
## sausage,
## yogurt} => {pastry} 0.001220132 0.3076923 0.003965430 3.4584615 12
## [18491] {pastry,
## sausage,
## yogurt} => {pip_fruit} 0.001220132 0.2857143 0.004270463 3.7768817 12
## [18492] {pastry,
## pip_fruit,
## sausage} => {other_vegetables} 0.001118454 0.4400000 0.002541942 2.2739884 11
## [18493] {other_vegetables,
## pastry,
## pip_fruit} => {sausage} 0.001118454 0.2391304 0.004677173 2.5452899 11
## [18494] {other_vegetables,
## pip_fruit,
## sausage} => {pastry} 0.001118454 0.3055556 0.003660397 3.4344444 11
## [18495] {other_vegetables,
## pastry,
## sausage} => {pip_fruit} 0.001118454 0.2820513 0.003965430 3.7284602 11
## [18496] {pastry,
## pip_fruit,
## sausage} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [18497] {pastry,
## pip_fruit,
## whole_milk} => {sausage} 0.001423488 0.2800000 0.005083884 2.9803030 14
## [18498] {pip_fruit,
## sausage,
## whole_milk} => {pastry} 0.001423488 0.2545455 0.005592272 2.8610909 14
## [18499] {pastry,
## sausage,
## whole_milk} => {pip_fruit} 0.001423488 0.2500000 0.005693950 3.3047715 14
## [18500] {pastry,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001220132 0.3243243 0.003762074 2.3248759 12
## [18501] {pastry,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001220132 0.3428571 0.003558719 3.2674419 12
## [18502] {pastry,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001220132 0.2608696 0.004677173 3.4484572 12
## [18503] {pastry,
## pip_fruit,
## tropical_fruit} => {rolls/buns} 0.001321810 0.3513514 0.003762074 1.9101938 13
## [18504] {pastry,
## pip_fruit,
## rolls/buns} => {tropical_fruit} 0.001321810 0.4814815 0.002745297 4.5885372 13
## [18505] {pip_fruit,
## rolls/buns,
## tropical_fruit} => {pastry} 0.001321810 0.2954545 0.004473818 3.3209091 13
## [18506] {pastry,
## rolls/buns,
## tropical_fruit} => {pip_fruit} 0.001321810 0.3250000 0.004067107 4.2962030 13
## [18507] {pastry,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001728521 0.4594595 0.003762074 2.3745580 17
## [18508] {other_vegetables,
## pastry,
## pip_fruit} => {tropical_fruit} 0.001728521 0.3695652 0.004677173 3.5219708 17
## [18509] {other_vegetables,
## pastry,
## tropical_fruit} => {pip_fruit} 0.001728521 0.3400000 0.005083884 4.4944892 17
## [18510] {pastry,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001626843 0.4324324 0.003762074 1.6923888 16
## [18511] {pastry,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001626843 0.3200000 0.005083884 3.0496124 16
## [18512] {pastry,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001626843 0.2424242 0.006710727 3.2046269 16
## [18513] {pastry,
## pip_fruit,
## root_vegetables} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [18514] {pastry,
## pip_fruit,
## yogurt} => {root_vegetables} 0.001016777 0.2857143 0.003558719 2.6212687 10
## [18515] {pastry,
## root_vegetables,
## yogurt} => {pip_fruit} 0.001016777 0.2702703 0.003762074 3.5727260 10
## [18516] {pastry,
## pip_fruit,
## root_vegetables} => {other_vegetables} 0.001423488 0.5833333 0.002440264 3.0147574 14
## [18517] {other_vegetables,
## pastry,
## pip_fruit} => {root_vegetables} 0.001423488 0.3043478 0.004677173 2.7922210 14
## [18518] {other_vegetables,
## pastry,
## root_vegetables} => {pip_fruit} 0.001423488 0.2413793 0.005897306 3.1908139 14
## [18519] {pastry,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001321810 0.5416667 0.002440264 2.1198932 13
## [18520] {pastry,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001321810 0.2600000 0.005083884 2.3853545 13
## [18521] {pastry,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001321810 0.2321429 0.005693950 3.0687164 13
## [18522] {pastry,
## pip_fruit,
## soda} => {other_vegetables} 0.001423488 0.6086957 0.002338587 3.1458338 14
## [18523] {other_vegetables,
## pastry,
## pip_fruit} => {soda} 0.001423488 0.3043478 0.004677173 1.7453416 14
## [18524] {other_vegetables,
## pip_fruit,
## soda} => {pastry} 0.001423488 0.3043478 0.004677173 3.4208696 14
## [18525] {other_vegetables,
## pastry,
## soda} => {pip_fruit} 0.001423488 0.2592593 0.005490595 3.4271705 14
## [18526] {pastry,
## pip_fruit,
## soda} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [18527] {pastry,
## pip_fruit,
## whole_milk} => {soda} 0.001118454 0.2200000 0.005083884 1.2616327 11
## [18528] {pip_fruit,
## soda,
## whole_milk} => {pastry} 0.001118454 0.2244898 0.004982206 2.5232653 11
## [18529] {pastry,
## pip_fruit,
## yogurt} => {rolls/buns} 0.001016777 0.2857143 0.003558719 1.5533444 10
## [18530] {pastry,
## pip_fruit,
## rolls/buns} => {yogurt} 0.001016777 0.3703704 0.002745297 2.6549509 10
## [18531] {pip_fruit,
## rolls/buns,
## yogurt} => {pastry} 0.001016777 0.2564103 0.003965430 2.8820513 10
## [18532] {pastry,
## pip_fruit,
## yogurt} => {other_vegetables} 0.001525165 0.4285714 0.003558719 2.2149238 15
## [18533] {other_vegetables,
## pastry,
## pip_fruit} => {yogurt} 0.001525165 0.3260870 0.004677173 2.3375111 15
## [18534] {other_vegetables,
## pastry,
## yogurt} => {pip_fruit} 0.001525165 0.2307692 0.006609049 3.0505583 15
## [18535] {pastry,
## pip_fruit,
## yogurt} => {whole_milk} 0.002135231 0.6000000 0.003558719 2.3481894 21
## [18536] {pastry,
## pip_fruit,
## whole_milk} => {yogurt} 0.002135231 0.4200000 0.005083884 3.0107143 21
## [18537] {pip_fruit,
## whole_milk,
## yogurt} => {pastry} 0.002135231 0.2234043 0.009557702 2.5110638 21
## [18538] {pastry,
## whole_milk,
## yogurt} => {pip_fruit} 0.002135231 0.2333333 0.009150991 3.0844534 21
## [18539] {pastry,
## pip_fruit,
## rolls/buns} => {other_vegetables} 0.001016777 0.3703704 0.002745297 1.9141317 10
## [18540] {other_vegetables,
## pastry,
## pip_fruit} => {rolls/buns} 0.001016777 0.2173913 0.004677173 1.1818925 10
## [18541] {other_vegetables,
## pip_fruit,
## rolls/buns} => {pastry} 0.001016777 0.2000000 0.005083884 2.2480000 10
## [18542] {pastry,
## pip_fruit,
## rolls/buns} => {whole_milk} 0.001321810 0.4814815 0.002745297 1.8843495 13
## [18543] {pastry,
## pip_fruit,
## whole_milk} => {rolls/buns} 0.001321810 0.2600000 0.005083884 1.4135434 13
## [18544] {pip_fruit,
## rolls/buns,
## whole_milk} => {pastry} 0.001321810 0.2131148 0.006202339 2.3954098 13
## [18545] {other_vegetables,
## pastry,
## pip_fruit} => {whole_milk} 0.002541942 0.5434783 0.004677173 2.1269832 25
## [18546] {pastry,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.002541942 0.5000000 0.005083884 2.5840778 25
## [18547] {other_vegetables,
## pastry,
## whole_milk} => {pip_fruit} 0.002541942 0.2403846 0.010574479 3.1776649 25
## [18548] {citrus_fruit,
## pip_fruit,
## sausage} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [18549] {citrus_fruit,
## pip_fruit,
## whole_milk} => {sausage} 0.001118454 0.2156863 0.005185562 2.2957516 11
## [18550] {pip_fruit,
## sausage,
## whole_milk} => {citrus_fruit} 0.001118454 0.2000000 0.005592272 2.4164619 11
## [18551] {citrus_fruit,
## sausage,
## whole_milk} => {pip_fruit} 0.001118454 0.2244898 0.004982206 2.9675499 11
## [18552] {bottled_water,
## citrus_fruit,
## pip_fruit} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [18553] {citrus_fruit,
## pip_fruit,
## whole_milk} => {bottled_water} 0.001118454 0.2156863 0.005185562 1.9514945 11
## [18554] {bottled_water,
## pip_fruit,
## whole_milk} => {citrus_fruit} 0.001118454 0.2444444 0.004575496 2.9534535 11
## [18555] {citrus_fruit,
## pip_fruit,
## tropical_fruit} => {root_vegetables} 0.001728521 0.3090909 0.005592272 2.8357361 17
## [18556] {citrus_fruit,
## pip_fruit,
## root_vegetables} => {tropical_fruit} 0.001728521 0.4473684 0.003863752 4.2634384 17
## [18557] {pip_fruit,
## root_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001728521 0.3269231 0.005287239 3.9499858 17
## [18558] {citrus_fruit,
## root_vegetables,
## tropical_fruit} => {pip_fruit} 0.001728521 0.3035714 0.005693950 4.0129368 17
## [18559] {citrus_fruit,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001626843 0.2909091 0.005592272 2.0853432 16
## [18560] {citrus_fruit,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001626843 0.5000000 0.003253686 4.7650194 16
## [18561] {pip_fruit,
## tropical_fruit,
## yogurt} => {citrus_fruit} 0.001626843 0.2539683 0.006405694 3.0685231 16
## [18562] {citrus_fruit,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001626843 0.2580645 0.006304016 3.4113770 16
## [18563] {citrus_fruit,
## pip_fruit,
## rolls/buns} => {tropical_fruit} 0.001016777 0.5882353 0.001728521 5.6059052 10
## [18564] {pip_fruit,
## rolls/buns,
## tropical_fruit} => {citrus_fruit} 0.001016777 0.2272727 0.004473818 2.7459795 10
## [18565] {citrus_fruit,
## rolls/buns,
## tropical_fruit} => {pip_fruit} 0.001016777 0.2325581 0.004372140 3.0742061 10
## [18566] {citrus_fruit,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.002846975 0.5090909 0.005592272 2.6310610 28
## [18567] {citrus_fruit,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.002846975 0.4827586 0.005897306 4.6007084 28
## [18568] {other_vegetables,
## pip_fruit,
## tropical_fruit} => {citrus_fruit} 0.002846975 0.3010753 0.009456024 3.6376846 28
## [18569] {citrus_fruit,
## other_vegetables,
## tropical_fruit} => {pip_fruit} 0.002846975 0.3146067 0.009049314 4.1588136 28
## [18570] {citrus_fruit,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.002033554 0.3636364 0.005592272 1.4231451 20
## [18571] {citrus_fruit,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.002033554 0.3921569 0.005185562 3.7372701 20
## [18572] {pip_fruit,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.002033554 0.2409639 0.008439248 2.9113999 20
## [18573] {citrus_fruit,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.002033554 0.2247191 0.009049314 2.9705811 20
## [18574] {citrus_fruit,
## pip_fruit,
## root_vegetables} => {yogurt} 0.001118454 0.2894737 0.003863752 2.0750537 11
## [18575] {citrus_fruit,
## pip_fruit,
## yogurt} => {root_vegetables} 0.001118454 0.3437500 0.003253686 3.1537139 11
## [18576] {pip_fruit,
## root_vegetables,
## yogurt} => {citrus_fruit} 0.001118454 0.2115385 0.005287239 2.5558732 11
## [18577] {citrus_fruit,
## root_vegetables,
## yogurt} => {pip_fruit} 0.001118454 0.2291667 0.004880529 3.0293739 11
## [18578] {citrus_fruit,
## pip_fruit,
## root_vegetables} => {other_vegetables} 0.002643620 0.6842105 0.003863752 3.5361064 26
## [18579] {citrus_fruit,
## other_vegetables,
## pip_fruit} => {root_vegetables} 0.002643620 0.4482759 0.005897306 4.1126801 26
## [18580] {other_vegetables,
## pip_fruit,
## root_vegetables} => {citrus_fruit} 0.002643620 0.3250000 0.008134215 3.9267506 26
## [18581] {citrus_fruit,
## other_vegetables,
## root_vegetables} => {pip_fruit} 0.002643620 0.2549020 0.010371124 3.3695709 26
## [18582] {citrus_fruit,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.002338587 0.6052632 0.003863752 2.3687876 23
## [18583] {citrus_fruit,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.002338587 0.4509804 0.005185562 4.1374927 23
## [18584] {pip_fruit,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.002338587 0.2613636 0.008947636 3.1578764 23
## [18585] {citrus_fruit,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.002338587 0.2555556 0.009150991 3.3782109 23
## [18586] {citrus_fruit,
## pip_fruit,
## yogurt} => {other_vegetables} 0.001626843 0.5000000 0.003253686 2.5840778 16
## [18587] {citrus_fruit,
## other_vegetables,
## pip_fruit} => {yogurt} 0.001626843 0.2758621 0.005897306 1.9774806 16
## [18588] {other_vegetables,
## pip_fruit,
## yogurt} => {citrus_fruit} 0.001626843 0.2000000 0.008134215 2.4164619 16
## [18589] {citrus_fruit,
## other_vegetables,
## yogurt} => {pip_fruit} 0.001626843 0.2133333 0.007625826 2.8200717 16
## [18590] {citrus_fruit,
## pip_fruit,
## yogurt} => {whole_milk} 0.001626843 0.5000000 0.003253686 1.9568245 16
## [18591] {citrus_fruit,
## pip_fruit,
## whole_milk} => {yogurt} 0.001626843 0.3137255 0.005185562 2.2488996 16
## [18592] {citrus_fruit,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.002846975 0.4827586 0.005897306 1.8893478 28
## [18593] {citrus_fruit,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.002846975 0.5490196 0.005185562 2.8374187 28
## [18594] {other_vegetables,
## pip_fruit,
## whole_milk} => {citrus_fruit} 0.002846975 0.2105263 0.013523132 2.5436441 28
## [18595] {citrus_fruit,
## other_vegetables,
## whole_milk} => {pip_fruit} 0.002846975 0.2187500 0.013014743 2.8916751 28
## [18596] {pip_fruit,
## shopping_bags,
## tropical_fruit} => {root_vegetables} 0.001016777 0.3125000 0.003253686 2.8670126 10
## [18597] {pip_fruit,
## root_vegetables,
## shopping_bags} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [18598] {root_vegetables,
## shopping_bags,
## tropical_fruit} => {pip_fruit} 0.001016777 0.4347826 0.002338587 5.7474287 10
## [18599] {pip_fruit,
## shopping_bags,
## tropical_fruit} => {other_vegetables} 0.001220132 0.3750000 0.003253686 1.9380583 12
## [18600] {other_vegetables,
## pip_fruit,
## shopping_bags} => {tropical_fruit} 0.001220132 0.4137931 0.002948653 3.9434643 12
## [18601] {other_vegetables,
## shopping_bags,
## tropical_fruit} => {pip_fruit} 0.001220132 0.2553191 0.004778851 3.3750858 12
## [18602] {pip_fruit,
## shopping_bags,
## tropical_fruit} => {whole_milk} 0.001118454 0.3437500 0.003253686 1.3453169 11
## [18603] {pip_fruit,
## shopping_bags,
## whole_milk} => {tropical_fruit} 0.001118454 0.3333333 0.003355363 3.1766796 11
## [18604] {shopping_bags,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001118454 0.2244898 0.004982206 2.9675499 11
## [18605] {pip_fruit,
## root_vegetables,
## shopping_bags} => {other_vegetables} 0.001423488 0.5600000 0.002541942 2.8941671 14
## [18606] {other_vegetables,
## pip_fruit,
## shopping_bags} => {root_vegetables} 0.001423488 0.4827586 0.002948653 4.4290401 14
## [18607] {other_vegetables,
## root_vegetables,
## shopping_bags} => {pip_fruit} 0.001423488 0.2153846 0.006609049 2.8471878 14
## [18608] {pip_fruit,
## root_vegetables,
## shopping_bags} => {whole_milk} 0.001321810 0.5200000 0.002541942 2.0350975 13
## [18609] {pip_fruit,
## shopping_bags,
## whole_milk} => {root_vegetables} 0.001321810 0.3939394 0.003355363 3.6141735 13
## [18610] {root_vegetables,
## shopping_bags,
## whole_milk} => {pip_fruit} 0.001321810 0.2500000 0.005287239 3.3047715 13
## [18611] {pip_fruit,
## shopping_bags,
## yogurt} => {whole_milk} 0.001016777 0.4347826 0.002338587 1.7015865 10
## [18612] {pip_fruit,
## shopping_bags,
## whole_milk} => {yogurt} 0.001016777 0.3030303 0.003355363 2.1722325 10
## [18613] {other_vegetables,
## pip_fruit,
## shopping_bags} => {whole_milk} 0.001525165 0.5172414 0.002948653 2.0243012 15
## [18614] {pip_fruit,
## shopping_bags,
## whole_milk} => {other_vegetables} 0.001525165 0.4545455 0.003355363 2.3491616 15
## [18615] {other_vegetables,
## shopping_bags,
## whole_milk} => {pip_fruit} 0.001525165 0.2000000 0.007625826 2.6438172 15
## [18616] {bottled_water,
## pip_fruit,
## sausage} => {yogurt} 0.001118454 0.5000000 0.002236909 3.5841837 11
## [18617] {pip_fruit,
## sausage,
## yogurt} => {bottled_water} 0.001118454 0.2820513 0.003965430 2.5519543 11
## [18618] {bottled_water,
## pip_fruit,
## yogurt} => {sausage} 0.001118454 0.3666667 0.003050330 3.9027778 11
## [18619] {bottled_water,
## sausage,
## yogurt} => {pip_fruit} 0.001118454 0.2820513 0.003965430 3.7284602 11
## [18620] {pip_fruit,
## sausage,
## tropical_fruit} => {yogurt} 0.001118454 0.3666667 0.003050330 2.6284014 11
## [18621] {pip_fruit,
## sausage,
## yogurt} => {tropical_fruit} 0.001118454 0.2820513 0.003965430 2.6879597 11
## [18622] {sausage,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001118454 0.2391304 0.004677173 3.1610858 11
## [18623] {pip_fruit,
## sausage,
## tropical_fruit} => {other_vegetables} 0.001321810 0.4333333 0.003050330 2.2395341 13
## [18624] {other_vegetables,
## pip_fruit,
## sausage} => {tropical_fruit} 0.001321810 0.3611111 0.003660397 3.4414029 13
## [18625] {other_vegetables,
## sausage,
## tropical_fruit} => {pip_fruit} 0.001321810 0.2203390 0.005998983 2.9126800 13
## [18626] {pip_fruit,
## sausage,
## tropical_fruit} => {whole_milk} 0.001728521 0.5666667 0.003050330 2.2177344 17
## [18627] {pip_fruit,
## sausage,
## whole_milk} => {tropical_fruit} 0.001728521 0.3090909 0.005592272 2.9456483 17
## [18628] {pip_fruit,
## tropical_fruit,
## whole_milk} => {sausage} 0.001728521 0.2048193 0.008439248 2.1800840 17
## [18629] {sausage,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001728521 0.2394366 0.007219115 3.1651333 17
## [18630] {pip_fruit,
## root_vegetables,
## sausage} => {yogurt} 0.001321810 0.5200000 0.002541942 3.7275510 13
## [18631] {pip_fruit,
## sausage,
## yogurt} => {root_vegetables} 0.001321810 0.3333333 0.003965430 3.0581468 13
## [18632] {pip_fruit,
## root_vegetables,
## yogurt} => {sausage} 0.001321810 0.2500000 0.005287239 2.6609848 13
## [18633] {root_vegetables,
## sausage,
## yogurt} => {pip_fruit} 0.001321810 0.2549020 0.005185562 3.3695709 13
## [18634] {pip_fruit,
## root_vegetables,
## sausage} => {other_vegetables} 0.001016777 0.4000000 0.002541942 2.0672622 10
## [18635] {other_vegetables,
## pip_fruit,
## sausage} => {root_vegetables} 0.001016777 0.2777778 0.003660397 2.5484556 10
## [18636] {pip_fruit,
## root_vegetables,
## sausage} => {whole_milk} 0.001931876 0.7600000 0.002541942 2.9743733 19
## [18637] {pip_fruit,
## sausage,
## whole_milk} => {root_vegetables} 0.001931876 0.3454545 0.005592272 3.1693521 19
## [18638] {pip_fruit,
## root_vegetables,
## whole_milk} => {sausage} 0.001931876 0.2159091 0.008947636 2.2981233 19
## [18639] {root_vegetables,
## sausage,
## whole_milk} => {pip_fruit} 0.001931876 0.2500000 0.007727504 3.3047715 19
## [18640] {pip_fruit,
## sausage,
## soda} => {yogurt} 0.001321810 0.4482759 0.002948653 3.2134061 13
## [18641] {pip_fruit,
## sausage,
## yogurt} => {soda} 0.001321810 0.3333333 0.003965430 1.9115646 13
## [18642] {pip_fruit,
## soda,
## yogurt} => {sausage} 0.001321810 0.3421053 0.003863752 3.6413477 13
## [18643] {sausage,
## soda,
## yogurt} => {pip_fruit} 0.001321810 0.2363636 0.005592272 3.1245112 13
## [18644] {pip_fruit,
## sausage,
## soda} => {whole_milk} 0.001321810 0.4482759 0.002948653 1.7543944 13
## [18645] {pip_fruit,
## sausage,
## whole_milk} => {soda} 0.001321810 0.2363636 0.005592272 1.3554731 13
## [18646] {pip_fruit,
## soda,
## whole_milk} => {sausage} 0.001321810 0.2653061 0.004982206 2.8239023 13
## [18647] {pip_fruit,
## sausage,
## yogurt} => {rolls/buns} 0.001220132 0.3076923 0.003965430 1.6728324 12
## [18648] {pip_fruit,
## rolls/buns,
## sausage} => {yogurt} 0.001220132 0.4444444 0.002745297 3.1859410 12
## [18649] {pip_fruit,
## rolls/buns,
## yogurt} => {sausage} 0.001220132 0.3076923 0.003965430 3.2750583 12
## [18650] {rolls/buns,
## sausage,
## yogurt} => {pip_fruit} 0.001220132 0.2033898 0.005998983 2.6886277 12
## [18651] {pip_fruit,
## sausage,
## yogurt} => {other_vegetables} 0.001830198 0.4615385 0.003965430 2.3853026 18
## [18652] {other_vegetables,
## pip_fruit,
## sausage} => {yogurt} 0.001830198 0.5000000 0.003660397 3.5841837 18
## [18653] {other_vegetables,
## pip_fruit,
## yogurt} => {sausage} 0.001830198 0.2250000 0.008134215 2.3948864 18
## [18654] {other_vegetables,
## sausage,
## yogurt} => {pip_fruit} 0.001830198 0.2250000 0.008134215 2.9742944 18
## [18655] {pip_fruit,
## sausage,
## yogurt} => {whole_milk} 0.002236909 0.5641026 0.003965430 2.2076995 22
## [18656] {pip_fruit,
## sausage,
## whole_milk} => {yogurt} 0.002236909 0.4000000 0.005592272 2.8673469 22
## [18657] {pip_fruit,
## whole_milk,
## yogurt} => {sausage} 0.002236909 0.2340426 0.009557702 2.4911348 22
## [18658] {sausage,
## whole_milk,
## yogurt} => {pip_fruit} 0.002236909 0.2558140 0.008744281 3.3816267 22
## [18659] {pip_fruit,
## rolls/buns,
## sausage} => {whole_milk} 0.001321810 0.4814815 0.002745297 1.8843495 13
## [18660] {pip_fruit,
## sausage,
## whole_milk} => {rolls/buns} 0.001321810 0.2363636 0.005592272 1.2850394 13
## [18661] {pip_fruit,
## rolls/buns,
## whole_milk} => {sausage} 0.001321810 0.2131148 0.006202339 2.2683805 13
## [18662] {other_vegetables,
## pip_fruit,
## sausage} => {whole_milk} 0.002033554 0.5555556 0.003660397 2.1742495 20
## [18663] {pip_fruit,
## sausage,
## whole_milk} => {other_vegetables} 0.002033554 0.3636364 0.005592272 1.8793293 20
## [18664] {other_vegetables,
## sausage,
## whole_milk} => {pip_fruit} 0.002033554 0.2000000 0.010167768 2.6438172 20
## [18665] {bottled_water,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001423488 0.5000000 0.002846975 3.5841837 14
## [18666] {bottled_water,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001423488 0.4666667 0.003050330 4.4473514 14
## [18667] {pip_fruit,
## tropical_fruit,
## yogurt} => {bottled_water} 0.001423488 0.2222222 0.006405694 2.0106307 14
## [18668] {bottled_water,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001423488 0.2000000 0.007117438 2.6438172 14
## [18669] {bottled_water,
## pip_fruit,
## tropical_fruit} => {other_vegetables} 0.001118454 0.3928571 0.002846975 2.0303468 11
## [18670] {bottled_water,
## other_vegetables,
## pip_fruit} => {tropical_fruit} 0.001118454 0.3666667 0.003050330 3.4943475 11
## [18671] {bottled_water,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001321810 0.4642857 0.002846975 1.8170513 13
## [18672] {bottled_water,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001321810 0.2888889 0.004575496 2.7531223 13
## [18673] {bottled_water,
## pip_fruit,
## root_vegetables} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [18674] {bottled_water,
## other_vegetables,
## pip_fruit} => {root_vegetables} 0.001118454 0.3666667 0.003050330 3.3639614 11
## [18675] {bottled_water,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001626843 0.7272727 0.002236909 2.8462902 16
## [18676] {bottled_water,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001626843 0.3555556 0.004575496 3.2620232 16
## [18677] {bottled_water,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001626843 0.2222222 0.007320793 2.9375747 16
## [18678] {bottled_water,
## pip_fruit,
## soda} => {yogurt} 0.001118454 0.4230769 0.002643620 3.0327708 11
## [18679] {bottled_water,
## pip_fruit,
## yogurt} => {soda} 0.001118454 0.3666667 0.003050330 2.1027211 11
## [18680] {pip_fruit,
## soda,
## yogurt} => {bottled_water} 0.001118454 0.2894737 0.003863752 2.6191110 11
## [18681] {bottled_water,
## pip_fruit,
## yogurt} => {other_vegetables} 0.001118454 0.3666667 0.003050330 1.8949904 11
## [18682] {bottled_water,
## other_vegetables,
## pip_fruit} => {yogurt} 0.001118454 0.3666667 0.003050330 2.6284014 11
## [18683] {bottled_water,
## pip_fruit,
## yogurt} => {whole_milk} 0.001423488 0.4666667 0.003050330 1.8263695 14
## [18684] {bottled_water,
## pip_fruit,
## whole_milk} => {yogurt} 0.001423488 0.3111111 0.004575496 2.2301587 14
## [18685] {bottled_water,
## pip_fruit,
## rolls/buns} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [18686] {bottled_water,
## other_vegetables,
## pip_fruit} => {rolls/buns} 0.001118454 0.3666667 0.003050330 1.9934586 11
## [18687] {other_vegetables,
## pip_fruit,
## rolls/buns} => {bottled_water} 0.001118454 0.2200000 0.005083884 1.9905244 11
## [18688] {bottled_water,
## other_vegetables,
## pip_fruit} => {whole_milk} 0.002033554 0.6666667 0.003050330 2.6090994 20
## [18689] {bottled_water,
## pip_fruit,
## whole_milk} => {other_vegetables} 0.002033554 0.4444444 0.004575496 2.2969580 20
## [18690] {pip_fruit,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.002440264 0.4615385 0.005287239 3.3084772 24
## [18691] {pip_fruit,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.002440264 0.3809524 0.006405694 3.4950249 24
## [18692] {pip_fruit,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.002440264 0.4615385 0.005287239 4.3984794 24
## [18693] {root_vegetables,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.002440264 0.3000000 0.008134215 3.9657258 24
## [18694] {pip_fruit,
## root_vegetables,
## tropical_fruit} => {rolls/buns} 0.001626843 0.3076923 0.005287239 1.6728324 16
## [18695] {pip_fruit,
## rolls/buns,
## tropical_fruit} => {root_vegetables} 0.001626843 0.3636364 0.004473818 3.3361601 16
## [18696] {pip_fruit,
## rolls/buns,
## root_vegetables} => {tropical_fruit} 0.001626843 0.5000000 0.003253686 4.7650194 16
## [18697] {rolls/buns,
## root_vegetables,
## tropical_fruit} => {pip_fruit} 0.001626843 0.2758621 0.005897306 3.6466444 16
## [18698] {pip_fruit,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.003355363 0.6346154 0.005287239 3.2797910 33
## [18699] {other_vegetables,
## pip_fruit,
## tropical_fruit} => {root_vegetables} 0.003355363 0.3548387 0.009456024 3.2554466 33
## [18700] {other_vegetables,
## pip_fruit,
## root_vegetables} => {tropical_fruit} 0.003355363 0.4125000 0.008134215 3.9311410 33
## [18701] {other_vegetables,
## root_vegetables,
## tropical_fruit} => {pip_fruit} 0.003355363 0.2727273 0.012302999 3.6052053 33
## [18702] {pip_fruit,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.003152008 0.5961538 0.005287239 2.3331369 31
## [18703] {pip_fruit,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.003152008 0.3734940 0.008439248 3.4265982 31
## [18704] {pip_fruit,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.003152008 0.3522727 0.008947636 3.3571727 31
## [18705] {root_vegetables,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.003152008 0.2627119 0.011997966 3.4728107 31
## [18706] {pip_fruit,
## soda,
## tropical_fruit} => {yogurt} 0.001220132 0.3157895 0.003863752 2.2636950 12
## [18707] {pip_fruit,
## soda,
## yogurt} => {tropical_fruit} 0.001220132 0.3157895 0.003863752 3.0094859 12
## [18708] {pip_fruit,
## soda,
## tropical_fruit} => {rolls/buns} 0.001321810 0.3421053 0.003863752 1.8599255 13
## [18709] {pip_fruit,
## rolls/buns,
## tropical_fruit} => {soda} 0.001321810 0.2954545 0.004473818 1.6943414 13
## [18710] {pip_fruit,
## rolls/buns,
## soda} => {tropical_fruit} 0.001321810 0.3714286 0.003558719 3.5397287 13
## [18711] {rolls/buns,
## soda,
## tropical_fruit} => {pip_fruit} 0.001321810 0.2452830 0.005388917 3.2424173 13
## [18712] {pip_fruit,
## soda,
## tropical_fruit} => {other_vegetables} 0.001626843 0.4210526 0.003863752 2.1760655 16
## [18713] {other_vegetables,
## pip_fruit,
## soda} => {tropical_fruit} 0.001626843 0.3478261 0.004677173 3.3147961 16
## [18714] {other_vegetables,
## soda,
## tropical_fruit} => {pip_fruit} 0.001626843 0.2253521 0.007219115 2.9789490 16
## [18715] {pip_fruit,
## soda,
## tropical_fruit} => {whole_milk} 0.001423488 0.3684211 0.003863752 1.4418707 14
## [18716] {pip_fruit,
## soda,
## whole_milk} => {tropical_fruit} 0.001423488 0.2857143 0.004982206 2.7228682 14
## [18717] {pip_fruit,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001525165 0.2380952 0.006405694 1.2944537 15
## [18718] {pip_fruit,
## rolls/buns,
## tropical_fruit} => {yogurt} 0.001525165 0.3409091 0.004473818 2.4437616 15
## [18719] {pip_fruit,
## rolls/buns,
## yogurt} => {tropical_fruit} 0.001525165 0.3846154 0.003965430 3.6653995 15
## [18720] {pip_fruit,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.003558719 0.5555556 0.006405694 2.8711975 35
## [18721] {other_vegetables,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.003558719 0.3763441 0.009456024 2.6977727 35
## [18722] {other_vegetables,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.003558719 0.4375000 0.008134215 4.1693920 35
## [18723] {other_vegetables,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.003558719 0.2892562 0.012302999 3.8237026 35
## [18724] {pip_fruit,
## tropical_fruit,
## yogurt} => {whole_milk} 0.003762074 0.5873016 0.006405694 2.2984923 37
## [18725] {pip_fruit,
## tropical_fruit,
## whole_milk} => {yogurt} 0.003762074 0.4457831 0.008439248 3.1955373 37
## [18726] {pip_fruit,
## whole_milk,
## yogurt} => {tropical_fruit} 0.003762074 0.3936170 0.009557702 3.7511855 37
## [18727] {tropical_fruit,
## whole_milk,
## yogurt} => {pip_fruit} 0.003762074 0.2483221 0.015149975 3.2825918 37
## [18728] {pip_fruit,
## rolls/buns,
## tropical_fruit} => {other_vegetables} 0.001830198 0.4090909 0.004473818 2.1142454 18
## [18729] {other_vegetables,
## pip_fruit,
## rolls/buns} => {tropical_fruit} 0.001830198 0.3600000 0.005083884 3.4308140 18
## [18730] {other_vegetables,
## rolls/buns,
## tropical_fruit} => {pip_fruit} 0.001830198 0.2337662 0.007829181 3.0901760 18
## [18731] {pip_fruit,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001931876 0.4318182 0.004473818 1.6899848 19
## [18732] {pip_fruit,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001931876 0.2289157 0.008439248 1.2445470 19
## [18733] {pip_fruit,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001931876 0.3114754 0.006202339 2.9683727 19
## [18734] {other_vegetables,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.004778851 0.5053763 0.009456024 1.9778656 47
## [18735] {pip_fruit,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.004778851 0.5662651 0.008439248 2.9265459 47
## [18736] {other_vegetables,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.004778851 0.3533835 0.013523132 3.3677581 47
## [18737] {other_vegetables,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.004778851 0.2797619 0.017081851 3.6981967 47
## [18738] {pip_fruit,
## root_vegetables,
## soda} => {yogurt} 0.001423488 0.5000000 0.002846975 3.5841837 14
## [18739] {pip_fruit,
## root_vegetables,
## yogurt} => {soda} 0.001423488 0.2692308 0.005287239 1.5439560 14
## [18740] {pip_fruit,
## soda,
## yogurt} => {root_vegetables} 0.001423488 0.3684211 0.003863752 3.3800570 14
## [18741] {root_vegetables,
## soda,
## yogurt} => {pip_fruit} 0.001423488 0.2978723 0.004778851 3.9376001 14
## [18742] {pip_fruit,
## root_vegetables,
## soda} => {other_vegetables} 0.001626843 0.5714286 0.002846975 2.9532317 16
## [18743] {other_vegetables,
## pip_fruit,
## root_vegetables} => {soda} 0.001626843 0.2000000 0.008134215 1.1469388 16
## [18744] {other_vegetables,
## pip_fruit,
## soda} => {root_vegetables} 0.001626843 0.3478261 0.004677173 3.1911097 16
## [18745] {pip_fruit,
## root_vegetables,
## soda} => {whole_milk} 0.001830198 0.6428571 0.002846975 2.5159172 18
## [18746] {pip_fruit,
## root_vegetables,
## whole_milk} => {soda} 0.001830198 0.2045455 0.008947636 1.1730056 18
## [18747] {pip_fruit,
## soda,
## whole_milk} => {root_vegetables} 0.001830198 0.3673469 0.004982206 3.3702026 18
## [18748] {root_vegetables,
## soda,
## whole_milk} => {pip_fruit} 0.001830198 0.2250000 0.008134215 2.9742944 18
## [18749] {pip_fruit,
## rolls/buns,
## root_vegetables} => {yogurt} 0.001016777 0.3125000 0.003253686 2.2401148 10
## [18750] {pip_fruit,
## rolls/buns,
## yogurt} => {root_vegetables} 0.001016777 0.2564103 0.003965430 2.3524206 10
## [18751] {pip_fruit,
## root_vegetables,
## yogurt} => {other_vegetables} 0.002948653 0.5576923 0.005287239 2.8822406 29
## [18752] {other_vegetables,
## pip_fruit,
## root_vegetables} => {yogurt} 0.002948653 0.3625000 0.008134215 2.5985332 29
## [18753] {other_vegetables,
## pip_fruit,
## yogurt} => {root_vegetables} 0.002948653 0.3625000 0.008134215 3.3257346 29
## [18754] {other_vegetables,
## root_vegetables,
## yogurt} => {pip_fruit} 0.002948653 0.2283465 0.012913066 3.0185315 29
## [18755] {pip_fruit,
## root_vegetables,
## yogurt} => {whole_milk} 0.003558719 0.6730769 0.005287239 2.6341868 35
## [18756] {pip_fruit,
## root_vegetables,
## whole_milk} => {yogurt} 0.003558719 0.3977273 0.008947636 2.8510552 35
## [18757] {pip_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.003558719 0.3723404 0.009557702 3.4160150 35
## [18758] {root_vegetables,
## whole_milk,
## yogurt} => {pip_fruit} 0.003558719 0.2447552 0.014539908 3.2354406 35
## [18759] {pip_fruit,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001525165 0.4687500 0.003253686 2.4225729 15
## [18760] {other_vegetables,
## pip_fruit,
## rolls/buns} => {root_vegetables} 0.001525165 0.3000000 0.005083884 2.7523321 15
## [18761] {pip_fruit,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001830198 0.5625000 0.003253686 2.2014276 18
## [18762] {pip_fruit,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001830198 0.2045455 0.008947636 1.1120534 18
## [18763] {pip_fruit,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001830198 0.2950820 0.006202339 2.7072119 18
## [18764] {other_vegetables,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.005490595 0.6750000 0.008134215 2.6417131 54
## [18765] {pip_fruit,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.005490595 0.6136364 0.008947636 3.1713682 54
## [18766] {other_vegetables,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.005490595 0.4060150 0.013523132 3.7249607 54
## [18767] {other_vegetables,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.005490595 0.2368421 0.023182511 3.1308362 54
## [18768] {pip_fruit,
## soda,
## yogurt} => {rolls/buns} 0.001220132 0.3157895 0.003863752 1.7168543 12
## [18769] {pip_fruit,
## rolls/buns,
## soda} => {yogurt} 0.001220132 0.3428571 0.003558719 2.4577259 12
## [18770] {pip_fruit,
## rolls/buns,
## yogurt} => {soda} 0.001220132 0.3076923 0.003965430 1.7645212 12
## [18771] {pip_fruit,
## soda,
## yogurt} => {other_vegetables} 0.001830198 0.4736842 0.003863752 2.4480737 18
## [18772] {other_vegetables,
## pip_fruit,
## soda} => {yogurt} 0.001830198 0.3913043 0.004677173 2.8050133 18
## [18773] {other_vegetables,
## pip_fruit,
## yogurt} => {soda} 0.001830198 0.2250000 0.008134215 1.2903061 18
## [18774] {other_vegetables,
## soda,
## yogurt} => {pip_fruit} 0.001830198 0.2195122 0.008337570 2.9017506 18
## [18775] {pip_fruit,
## soda,
## yogurt} => {whole_milk} 0.002033554 0.5263158 0.003863752 2.0598153 20
## [18776] {pip_fruit,
## soda,
## whole_milk} => {yogurt} 0.002033554 0.4081633 0.004982206 2.9258642 20
## [18777] {pip_fruit,
## whole_milk,
## yogurt} => {soda} 0.002033554 0.2127660 0.009557702 1.2201476 20
## [18778] {pip_fruit,
## rolls/buns,
## soda} => {other_vegetables} 0.001423488 0.4000000 0.003558719 2.0672622 14
## [18779] {other_vegetables,
## pip_fruit,
## soda} => {rolls/buns} 0.001423488 0.3043478 0.004677173 1.6546495 14
## [18780] {other_vegetables,
## pip_fruit,
## rolls/buns} => {soda} 0.001423488 0.2800000 0.005083884 1.6057143 14
## [18781] {pip_fruit,
## rolls/buns,
## soda} => {whole_milk} 0.001423488 0.4000000 0.003558719 1.5654596 14
## [18782] {pip_fruit,
## soda,
## whole_milk} => {rolls/buns} 0.001423488 0.2857143 0.004982206 1.5533444 14
## [18783] {pip_fruit,
## rolls/buns,
## whole_milk} => {soda} 0.001423488 0.2295082 0.006202339 1.3161593 14
## [18784] {other_vegetables,
## pip_fruit,
## soda} => {whole_milk} 0.002541942 0.5434783 0.004677173 2.1269832 25
## [18785] {pip_fruit,
## soda,
## whole_milk} => {other_vegetables} 0.002541942 0.5102041 0.004982206 2.6368141 25
## [18786] {pip_fruit,
## rolls/buns,
## yogurt} => {other_vegetables} 0.002033554 0.5128205 0.003965430 2.6503362 20
## [18787] {other_vegetables,
## pip_fruit,
## yogurt} => {rolls/buns} 0.002033554 0.2500000 0.008134215 1.3591763 20
## [18788] {other_vegetables,
## pip_fruit,
## rolls/buns} => {yogurt} 0.002033554 0.4000000 0.005083884 2.8673469 20
## [18789] {pip_fruit,
## rolls/buns,
## yogurt} => {whole_milk} 0.002338587 0.5897436 0.003965430 2.3080494 23
## [18790] {pip_fruit,
## whole_milk,
## yogurt} => {rolls/buns} 0.002338587 0.2446809 0.009557702 1.3302577 23
## [18791] {pip_fruit,
## rolls/buns,
## whole_milk} => {yogurt} 0.002338587 0.3770492 0.006202339 2.7028270 23
## [18792] {other_vegetables,
## pip_fruit,
## yogurt} => {whole_milk} 0.005083884 0.6250000 0.008134215 2.4460306 50
## [18793] {pip_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.005083884 0.5319149 0.009557702 2.7490189 50
## [18794] {other_vegetables,
## pip_fruit,
## whole_milk} => {yogurt} 0.005083884 0.3759398 0.013523132 2.6948749 50
## [18795] {other_vegetables,
## whole_milk,
## yogurt} => {pip_fruit} 0.005083884 0.2283105 0.022267412 3.0180562 50
## [18796] {other_vegetables,
## pip_fruit,
## rolls/buns} => {whole_milk} 0.002643620 0.5200000 0.005083884 2.0350975 26
## [18797] {pip_fruit,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.002643620 0.4262295 0.006202339 2.2028204 26
## [18798] {citrus_fruit,
## pastry,
## sausage} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [18799] {citrus_fruit,
## other_vegetables,
## pastry} => {sausage} 0.001118454 0.3437500 0.003253686 3.6588542 11
## [18800] {other_vegetables,
## pastry,
## sausage} => {citrus_fruit} 0.001118454 0.2820513 0.003965430 3.4078309 11
## [18801] {citrus_fruit,
## other_vegetables,
## sausage} => {pastry} 0.001118454 0.2500000 0.004473818 2.8100000 11
## [18802] {citrus_fruit,
## pastry,
## sausage} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [18803] {citrus_fruit,
## pastry,
## whole_milk} => {sausage} 0.001220132 0.2500000 0.004880529 2.6609848 12
## [18804] {pastry,
## sausage,
## whole_milk} => {citrus_fruit} 0.001220132 0.2142857 0.005693950 2.5890663 12
## [18805] {citrus_fruit,
## sausage,
## whole_milk} => {pastry} 0.001220132 0.2448980 0.004982206 2.7526531 12
## [18806] {citrus_fruit,
## pastry,
## tropical_fruit} => {yogurt} 0.001118454 0.4230769 0.002643620 3.0327708 11
## [18807] {citrus_fruit,
## pastry,
## yogurt} => {tropical_fruit} 0.001118454 0.3793103 0.002948653 3.6148423 11
## [18808] {pastry,
## tropical_fruit,
## yogurt} => {citrus_fruit} 0.001118454 0.2391304 0.004677173 2.8892479 11
## [18809] {citrus_fruit,
## pastry,
## tropical_fruit} => {rolls/buns} 0.001016777 0.3846154 0.002643620 2.0910405 10
## [18810] {citrus_fruit,
## pastry,
## rolls/buns} => {tropical_fruit} 0.001016777 0.3333333 0.003050330 3.1766796 10
## [18811] {pastry,
## rolls/buns,
## tropical_fruit} => {citrus_fruit} 0.001016777 0.2500000 0.004067107 3.0205774 10
## [18812] {citrus_fruit,
## rolls/buns,
## tropical_fruit} => {pastry} 0.001016777 0.2325581 0.004372140 2.6139535 10
## [18813] {citrus_fruit,
## pastry,
## tropical_fruit} => {other_vegetables} 0.001321810 0.5000000 0.002643620 2.5840778 13
## [18814] {citrus_fruit,
## other_vegetables,
## pastry} => {tropical_fruit} 0.001321810 0.4062500 0.003253686 3.8715782 13
## [18815] {other_vegetables,
## pastry,
## tropical_fruit} => {citrus_fruit} 0.001321810 0.2600000 0.005083884 3.1414005 13
## [18816] {citrus_fruit,
## pastry,
## tropical_fruit} => {whole_milk} 0.001525165 0.5769231 0.002643620 2.2578744 15
## [18817] {citrus_fruit,
## pastry,
## whole_milk} => {tropical_fruit} 0.001525165 0.3125000 0.004880529 2.9781371 15
## [18818] {pastry,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001525165 0.2272727 0.006710727 2.7459795 15
## [18819] {citrus_fruit,
## pastry,
## root_vegetables} => {other_vegetables} 0.001525165 0.8823529 0.001728521 4.5601372 15
## [18820] {citrus_fruit,
## other_vegetables,
## pastry} => {root_vegetables} 0.001525165 0.4687500 0.003253686 4.3005189 15
## [18821] {other_vegetables,
## pastry,
## root_vegetables} => {citrus_fruit} 0.001525165 0.2586207 0.005897306 3.1247352 15
## [18822] {citrus_fruit,
## pastry,
## root_vegetables} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [18823] {citrus_fruit,
## pastry,
## whole_milk} => {root_vegetables} 0.001118454 0.2291667 0.004880529 2.1024759 11
## [18824] {citrus_fruit,
## pastry,
## soda} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [18825] {citrus_fruit,
## pastry,
## whole_milk} => {soda} 0.001118454 0.2291667 0.004880529 1.3142007 11
## [18826] {citrus_fruit,
## soda,
## whole_milk} => {pastry} 0.001118454 0.2500000 0.004473818 2.8100000 11
## [18827] {citrus_fruit,
## pastry,
## yogurt} => {other_vegetables} 0.001118454 0.3793103 0.002948653 1.9603349 11
## [18828] {citrus_fruit,
## other_vegetables,
## pastry} => {yogurt} 0.001118454 0.3437500 0.003253686 2.4641263 11
## [18829] {citrus_fruit,
## pastry,
## yogurt} => {whole_milk} 0.001626843 0.5517241 0.002948653 2.1592546 16
## [18830] {citrus_fruit,
## pastry,
## whole_milk} => {yogurt} 0.001626843 0.3333333 0.004880529 2.3894558 16
## [18831] {citrus_fruit,
## pastry,
## rolls/buns} => {other_vegetables} 0.001016777 0.3333333 0.003050330 1.7227185 10
## [18832] {citrus_fruit,
## other_vegetables,
## pastry} => {rolls/buns} 0.001016777 0.3125000 0.003253686 1.6989704 10
## [18833] {citrus_fruit,
## pastry,
## rolls/buns} => {whole_milk} 0.002033554 0.6666667 0.003050330 2.6090994 20
## [18834] {citrus_fruit,
## pastry,
## whole_milk} => {rolls/buns} 0.002033554 0.4166667 0.004880529 2.2652939 20
## [18835] {pastry,
## rolls/buns,
## whole_milk} => {citrus_fruit} 0.002033554 0.2380952 0.008540925 2.8767404 20
## [18836] {citrus_fruit,
## rolls/buns,
## whole_milk} => {pastry} 0.002033554 0.2816901 0.007219115 3.1661972 20
## [18837] {citrus_fruit,
## other_vegetables,
## pastry} => {whole_milk} 0.001830198 0.5625000 0.003253686 2.2014276 18
## [18838] {citrus_fruit,
## pastry,
## whole_milk} => {other_vegetables} 0.001830198 0.3750000 0.004880529 1.9380583 18
## [18839] {pastry,
## sausage,
## shopping_bags} => {soda} 0.001016777 0.4761905 0.002135231 2.7308066 10
## [18840] {pastry,
## shopping_bags,
## soda} => {sausage} 0.001016777 0.2439024 0.004168785 2.5960828 10
## [18841] {pastry,
## sausage,
## soda} => {shopping_bags} 0.001016777 0.2941176 0.003457041 2.9851879 10
## [18842] {pastry,
## sausage,
## shopping_bags} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [18843] {other_vegetables,
## pastry,
## shopping_bags} => {sausage} 0.001016777 0.3030303 0.003355363 3.2254362 10
## [18844] {other_vegetables,
## pastry,
## sausage} => {shopping_bags} 0.001016777 0.2564103 0.003965430 2.6024715 10
## [18845] {pastry,
## shopping_bags,
## tropical_fruit} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [18846] {other_vegetables,
## pastry,
## shopping_bags} => {tropical_fruit} 0.001016777 0.3030303 0.003355363 2.8878905 10
## [18847] {other_vegetables,
## pastry,
## tropical_fruit} => {shopping_bags} 0.001016777 0.2000000 0.005083884 2.0299278 10
## [18848] {other_vegetables,
## shopping_bags,
## tropical_fruit} => {pastry} 0.001016777 0.2127660 0.004778851 2.3914894 10
## [18849] {pastry,
## shopping_bags,
## tropical_fruit} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [18850] {pastry,
## shopping_bags,
## whole_milk} => {tropical_fruit} 0.001118454 0.2444444 0.004575496 2.3295650 11
## [18851] {shopping_bags,
## tropical_fruit,
## whole_milk} => {pastry} 0.001118454 0.2244898 0.004982206 2.5232653 11
## [18852] {pastry,
## root_vegetables,
## shopping_bags} => {other_vegetables} 0.001118454 0.8461538 0.001321810 4.3730547 11
## [18853] {other_vegetables,
## pastry,
## shopping_bags} => {root_vegetables} 0.001118454 0.3333333 0.003355363 3.0581468 11
## [18854] {pastry,
## shopping_bags,
## soda} => {yogurt} 0.001016777 0.2439024 0.004168785 1.7483823 10
## [18855] {pastry,
## shopping_bags,
## yogurt} => {soda} 0.001016777 0.3703704 0.002745297 2.1239607 10
## [18856] {pastry,
## soda,
## yogurt} => {shopping_bags} 0.001016777 0.2040816 0.004982206 2.0713549 10
## [18857] {shopping_bags,
## soda,
## yogurt} => {pastry} 0.001016777 0.2380952 0.004270463 2.6761905 10
## [18858] {pastry,
## shopping_bags,
## soda} => {rolls/buns} 0.001016777 0.2439024 0.004168785 1.3260257 10
## [18859] {pastry,
## rolls/buns,
## shopping_bags} => {soda} 0.001016777 0.4000000 0.002541942 2.2938776 10
## [18860] {pastry,
## shopping_bags,
## soda} => {other_vegetables} 0.001016777 0.2439024 0.004168785 1.2605257 10
## [18861] {other_vegetables,
## pastry,
## shopping_bags} => {soda} 0.001016777 0.3030303 0.003355363 1.7377860 10
## [18862] {pastry,
## shopping_bags,
## soda} => {whole_milk} 0.001321810 0.3170732 0.004168785 1.2409131 13
## [18863] {pastry,
## shopping_bags,
## whole_milk} => {soda} 0.001321810 0.2888889 0.004575496 1.6566893 13
## [18864] {pastry,
## shopping_bags,
## yogurt} => {whole_milk} 0.001525165 0.5555556 0.002745297 2.1742495 15
## [18865] {pastry,
## shopping_bags,
## whole_milk} => {yogurt} 0.001525165 0.3333333 0.004575496 2.3894558 15
## [18866] {shopping_bags,
## whole_milk,
## yogurt} => {pastry} 0.001525165 0.2884615 0.005287239 3.2423077 15
## [18867] {pastry,
## rolls/buns,
## shopping_bags} => {whole_milk} 0.001016777 0.4000000 0.002541942 1.5654596 10
## [18868] {pastry,
## shopping_bags,
## whole_milk} => {rolls/buns} 0.001016777 0.2222222 0.004575496 1.2081567 10
## [18869] {other_vegetables,
## pastry,
## shopping_bags} => {whole_milk} 0.001830198 0.5454545 0.003355363 2.1347177 18
## [18870] {pastry,
## shopping_bags,
## whole_milk} => {other_vegetables} 0.001830198 0.4000000 0.004575496 2.0672622 18
## [18871] {other_vegetables,
## shopping_bags,
## whole_milk} => {pastry} 0.001830198 0.2400000 0.007625826 2.6976000 18
## [18872] {pastry,
## sausage,
## tropical_fruit} => {yogurt} 0.001118454 0.3793103 0.002948653 2.7190359 11
## [18873] {pastry,
## sausage,
## yogurt} => {tropical_fruit} 0.001118454 0.2619048 0.004270463 2.4959625 11
## [18874] {pastry,
## tropical_fruit,
## yogurt} => {sausage} 0.001118454 0.2391304 0.004677173 2.5452899 11
## [18875] {sausage,
## tropical_fruit,
## yogurt} => {pastry} 0.001118454 0.2391304 0.004677173 2.6878261 11
## [18876] {pastry,
## sausage,
## tropical_fruit} => {rolls/buns} 0.001016777 0.3448276 0.002948653 1.8747260 10
## [18877] {pastry,
## rolls/buns,
## sausage} => {tropical_fruit} 0.001016777 0.2631579 0.003863752 2.5079049 10
## [18878] {pastry,
## rolls/buns,
## tropical_fruit} => {sausage} 0.001016777 0.2500000 0.004067107 2.6609848 10
## [18879] {rolls/buns,
## sausage,
## tropical_fruit} => {pastry} 0.001016777 0.2702703 0.003762074 3.0378378 10
## [18880] {pastry,
## sausage,
## tropical_fruit} => {other_vegetables} 0.001118454 0.3793103 0.002948653 1.9603349 11
## [18881] {other_vegetables,
## pastry,
## sausage} => {tropical_fruit} 0.001118454 0.2820513 0.003965430 2.6879597 11
## [18882] {other_vegetables,
## pastry,
## tropical_fruit} => {sausage} 0.001118454 0.2200000 0.005083884 2.3416667 11
## [18883] {pastry,
## sausage,
## tropical_fruit} => {whole_milk} 0.001423488 0.4827586 0.002948653 1.8893478 14
## [18884] {pastry,
## sausage,
## whole_milk} => {tropical_fruit} 0.001423488 0.2500000 0.005693950 2.3825097 14
## [18885] {pastry,
## tropical_fruit,
## whole_milk} => {sausage} 0.001423488 0.2121212 0.006710727 2.2578053 14
## [18886] {pastry,
## root_vegetables,
## sausage} => {yogurt} 0.001626843 0.6956522 0.002338587 4.9866903 16
## [18887] {pastry,
## sausage,
## yogurt} => {root_vegetables} 0.001626843 0.3809524 0.004270463 3.4950249 16
## [18888] {pastry,
## root_vegetables,
## yogurt} => {sausage} 0.001626843 0.4324324 0.003762074 4.6027846 16
## [18889] {root_vegetables,
## sausage,
## yogurt} => {pastry} 0.001626843 0.3137255 0.005185562 3.5262745 16
## [18890] {pastry,
## root_vegetables,
## sausage} => {rolls/buns} 0.001016777 0.4347826 0.002338587 2.3637849 10
## [18891] {pastry,
## rolls/buns,
## sausage} => {root_vegetables} 0.001016777 0.2631579 0.003863752 2.4143264 10
## [18892] {pastry,
## rolls/buns,
## root_vegetables} => {sausage} 0.001016777 0.2702703 0.003762074 2.8767404 10
## [18893] {rolls/buns,
## root_vegetables,
## sausage} => {pastry} 0.001016777 0.2040816 0.004982206 2.2938776 10
## [18894] {pastry,
## root_vegetables,
## sausage} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [18895] {other_vegetables,
## pastry,
## sausage} => {root_vegetables} 0.001118454 0.2820513 0.003965430 2.5876626 11
## [18896] {pastry,
## root_vegetables,
## sausage} => {whole_milk} 0.001626843 0.6956522 0.002338587 2.7225385 16
## [18897] {pastry,
## sausage,
## whole_milk} => {root_vegetables} 0.001626843 0.2857143 0.005693950 2.6212687 16
## [18898] {pastry,
## root_vegetables,
## whole_milk} => {sausage} 0.001626843 0.2857143 0.005693950 3.0411255 16
## [18899] {root_vegetables,
## sausage,
## whole_milk} => {pastry} 0.001626843 0.2105263 0.007727504 2.3663158 16
## [18900] {pastry,
## sausage,
## soda} => {yogurt} 0.001118454 0.3235294 0.003457041 2.3191777 11
## [18901] {pastry,
## sausage,
## yogurt} => {soda} 0.001118454 0.2619048 0.004270463 1.5019436 11
## [18902] {pastry,
## soda,
## yogurt} => {sausage} 0.001118454 0.2244898 0.004982206 2.3894558 11
## [18903] {sausage,
## soda,
## yogurt} => {pastry} 0.001118454 0.2000000 0.005592272 2.2480000 11
## [18904] {pastry,
## sausage,
## soda} => {rolls/buns} 0.001016777 0.2941176 0.003457041 1.5990310 10
## [18905] {pastry,
## rolls/buns,
## sausage} => {soda} 0.001016777 0.2631579 0.003863752 1.5091300 10
## [18906] {pastry,
## sausage,
## soda} => {other_vegetables} 0.001525165 0.4411765 0.003457041 2.2800686 15
## [18907] {other_vegetables,
## pastry,
## sausage} => {soda} 0.001525165 0.3846154 0.003965430 2.2056515 15
## [18908] {other_vegetables,
## pastry,
## soda} => {sausage} 0.001525165 0.2777778 0.005490595 2.9566498 15
## [18909] {other_vegetables,
## sausage,
## soda} => {pastry} 0.001525165 0.2112676 0.007219115 2.3746479 15
## [18910] {pastry,
## sausage,
## soda} => {whole_milk} 0.001626843 0.4705882 0.003457041 1.8417172 16
## [18911] {pastry,
## sausage,
## whole_milk} => {soda} 0.001626843 0.2857143 0.005693950 1.6384840 16
## [18912] {sausage,
## soda,
## whole_milk} => {pastry} 0.001626843 0.2424242 0.006710727 2.7248485 16
## [18913] {pastry,
## sausage,
## yogurt} => {rolls/buns} 0.001830198 0.4285714 0.004270463 2.3300166 18
## [18914] {pastry,
## rolls/buns,
## sausage} => {yogurt} 0.001830198 0.4736842 0.003863752 3.3955424 18
## [18915] {pastry,
## rolls/buns,
## yogurt} => {sausage} 0.001830198 0.3157895 0.005795628 3.3612440 18
## [18916] {rolls/buns,
## sausage,
## yogurt} => {pastry} 0.001830198 0.3050847 0.005998983 3.4291525 18
## [18917] {pastry,
## sausage,
## yogurt} => {other_vegetables} 0.001525165 0.3571429 0.004270463 1.8457698 15
## [18918] {other_vegetables,
## pastry,
## sausage} => {yogurt} 0.001525165 0.3846154 0.003965430 2.7570644 15
## [18919] {other_vegetables,
## pastry,
## yogurt} => {sausage} 0.001525165 0.2307692 0.006609049 2.4562937 15
## [18920] {pastry,
## sausage,
## yogurt} => {whole_milk} 0.002338587 0.5476190 0.004270463 2.1431888 23
## [18921] {pastry,
## sausage,
## whole_milk} => {yogurt} 0.002338587 0.4107143 0.005693950 2.9441509 23
## [18922] {pastry,
## whole_milk,
## yogurt} => {sausage} 0.002338587 0.2555556 0.009150991 2.7201178 23
## [18923] {sausage,
## whole_milk,
## yogurt} => {pastry} 0.002338587 0.2674419 0.008744281 3.0060465 23
## [18924] {pastry,
## rolls/buns,
## sausage} => {other_vegetables} 0.001220132 0.3157895 0.003863752 1.6320491 12
## [18925] {other_vegetables,
## pastry,
## sausage} => {rolls/buns} 0.001220132 0.3076923 0.003965430 1.6728324 12
## [18926] {other_vegetables,
## pastry,
## rolls/buns} => {sausage} 0.001220132 0.2000000 0.006100661 2.1287879 12
## [18927] {pastry,
## rolls/buns,
## sausage} => {whole_milk} 0.001626843 0.4210526 0.003863752 1.6478522 16
## [18928] {pastry,
## sausage,
## whole_milk} => {rolls/buns} 0.001626843 0.2857143 0.005693950 1.5533444 16
## [18929] {other_vegetables,
## pastry,
## sausage} => {whole_milk} 0.001931876 0.4871795 0.003965430 1.9066495 19
## [18930] {pastry,
## sausage,
## whole_milk} => {other_vegetables} 0.001931876 0.3392857 0.005693950 1.7534813 19
## [18931] {bottled_water,
## pastry,
## tropical_fruit} => {yogurt} 0.001118454 0.5789474 0.001931876 4.1501074 11
## [18932] {bottled_water,
## pastry,
## yogurt} => {tropical_fruit} 0.001118454 0.3548387 0.003152008 3.3816267 11
## [18933] {pastry,
## tropical_fruit,
## yogurt} => {bottled_water} 0.001118454 0.2391304 0.004677173 2.1636135 11
## [18934] {bottled_water,
## pastry,
## soda} => {yogurt} 0.001321810 0.4482759 0.002948653 3.2134061 13
## [18935] {bottled_water,
## pastry,
## yogurt} => {soda} 0.001321810 0.4193548 0.003152008 2.4048716 13
## [18936] {pastry,
## soda,
## yogurt} => {bottled_water} 0.001321810 0.2653061 0.004982206 2.4004468 13
## [18937] {bottled_water,
## pastry,
## soda} => {rolls/buns} 0.001423488 0.4827586 0.002948653 2.6246164 14
## [18938] {bottled_water,
## pastry,
## rolls/buns} => {soda} 0.001423488 0.4666667 0.003050330 2.6761905 14
## [18939] {pastry,
## rolls/buns,
## soda} => {bottled_water} 0.001423488 0.2641509 0.005388917 2.3899950 14
## [18940] {bottled_water,
## rolls/buns,
## soda} => {pastry} 0.001423488 0.2089552 0.006812405 2.3486567 14
## [18941] {bottled_water,
## pastry,
## soda} => {other_vegetables} 0.001220132 0.4137931 0.002948653 2.1385471 12
## [18942] {bottled_water,
## other_vegetables,
## pastry} => {soda} 0.001220132 0.4285714 0.002846975 2.4577259 12
## [18943] {other_vegetables,
## pastry,
## soda} => {bottled_water} 0.001220132 0.2222222 0.005490595 2.0106307 12
## [18944] {bottled_water,
## other_vegetables,
## soda} => {pastry} 0.001220132 0.2142857 0.005693950 2.4085714 12
## [18945] {bottled_water,
## pastry,
## soda} => {whole_milk} 0.001830198 0.6206897 0.002948653 2.4291615 18
## [18946] {bottled_water,
## pastry,
## whole_milk} => {soda} 0.001830198 0.4500000 0.004067107 2.5806122 18
## [18947] {pastry,
## soda,
## whole_milk} => {bottled_water} 0.001830198 0.2222222 0.008235892 2.0106307 18
## [18948] {bottled_water,
## soda,
## whole_milk} => {pastry} 0.001830198 0.2432432 0.007524148 2.7340541 18
## [18949] {bottled_water,
## pastry,
## yogurt} => {rolls/buns} 0.001118454 0.3548387 0.003152008 1.9291535 11
## [18950] {bottled_water,
## pastry,
## rolls/buns} => {yogurt} 0.001118454 0.3666667 0.003050330 2.6284014 11
## [18951] {bottled_water,
## pastry,
## yogurt} => {other_vegetables} 0.001321810 0.4193548 0.003152008 2.1672910 13
## [18952] {bottled_water,
## other_vegetables,
## pastry} => {yogurt} 0.001321810 0.4642857 0.002846975 3.3281706 13
## [18953] {other_vegetables,
## pastry,
## yogurt} => {bottled_water} 0.001321810 0.2000000 0.006609049 1.8095676 13
## [18954] {bottled_water,
## pastry,
## yogurt} => {whole_milk} 0.001626843 0.5161290 0.003152008 2.0199479 16
## [18955] {bottled_water,
## pastry,
## whole_milk} => {yogurt} 0.001626843 0.4000000 0.004067107 2.8673469 16
## [18956] {bottled_water,
## pastry,
## rolls/buns} => {other_vegetables} 0.001016777 0.3333333 0.003050330 1.7227185 10
## [18957] {bottled_water,
## other_vegetables,
## pastry} => {rolls/buns} 0.001016777 0.3571429 0.002846975 1.9416805 10
## [18958] {bottled_water,
## pastry,
## rolls/buns} => {whole_milk} 0.001321810 0.4333333 0.003050330 1.6959146 13
## [18959] {bottled_water,
## pastry,
## whole_milk} => {rolls/buns} 0.001321810 0.3250000 0.004067107 1.7669292 13
## [18960] {bottled_water,
## other_vegetables,
## pastry} => {whole_milk} 0.001525165 0.5357143 0.002846975 2.0965977 15
## [18961] {bottled_water,
## pastry,
## whole_milk} => {other_vegetables} 0.001525165 0.3750000 0.004067107 1.9380583 15
## [18962] {pastry,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [18963] {pastry,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001118454 0.2391304 0.004677173 2.1938879 11
## [18964] {pastry,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001118454 0.2972973 0.003762074 2.8332548 11
## [18965] {pastry,
## root_vegetables,
## tropical_fruit} => {rolls/buns} 0.001118454 0.4782609 0.002338587 2.6001634 11
## [18966] {pastry,
## rolls/buns,
## tropical_fruit} => {root_vegetables} 0.001118454 0.2750000 0.004067107 2.5229711 11
## [18967] {pastry,
## rolls/buns,
## root_vegetables} => {tropical_fruit} 0.001118454 0.2972973 0.003762074 2.8332548 11
## [18968] {pastry,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001423488 0.6086957 0.002338587 3.1458338 14
## [18969] {other_vegetables,
## pastry,
## tropical_fruit} => {root_vegetables} 0.001423488 0.2800000 0.005083884 2.5688433 14
## [18970] {other_vegetables,
## pastry,
## root_vegetables} => {tropical_fruit} 0.001423488 0.2413793 0.005897306 2.3003542 14
## [18971] {pastry,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001626843 0.6956522 0.002338587 2.7225385 16
## [18972] {pastry,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001626843 0.2424242 0.006710727 2.2241067 16
## [18973] {pastry,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001626843 0.2857143 0.005693950 2.7228682 16
## [18974] {pastry,
## soda,
## tropical_fruit} => {other_vegetables} 0.001423488 0.4516129 0.003152008 2.3340057 14
## [18975] {other_vegetables,
## pastry,
## tropical_fruit} => {soda} 0.001423488 0.2800000 0.005083884 1.6057143 14
## [18976] {other_vegetables,
## pastry,
## soda} => {tropical_fruit} 0.001423488 0.2592593 0.005490595 2.4707508 14
## [18977] {pastry,
## soda,
## tropical_fruit} => {whole_milk} 0.001830198 0.5806452 0.003152008 2.2724414 18
## [18978] {pastry,
## tropical_fruit,
## whole_milk} => {soda} 0.001830198 0.2727273 0.006710727 1.5640074 18
## [18979] {pastry,
## soda,
## whole_milk} => {tropical_fruit} 0.001830198 0.2222222 0.008235892 2.1177864 18
## [18980] {soda,
## tropical_fruit,
## whole_milk} => {pastry} 0.001830198 0.2337662 0.007829181 2.6275325 18
## [18981] {pastry,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.002135231 0.4565217 0.004677173 2.4819742 21
## [18982] {pastry,
## rolls/buns,
## tropical_fruit} => {yogurt} 0.002135231 0.5250000 0.004067107 3.7633929 21
## [18983] {pastry,
## rolls/buns,
## yogurt} => {tropical_fruit} 0.002135231 0.3684211 0.005795628 3.5110669 21
## [18984] {rolls/buns,
## tropical_fruit,
## yogurt} => {pastry} 0.002135231 0.2441860 0.008744281 2.7446512 21
## [18985] {pastry,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001931876 0.4130435 0.004677173 2.1346729 19
## [18986] {other_vegetables,
## pastry,
## tropical_fruit} => {yogurt} 0.001931876 0.3800000 0.005083884 2.7239796 19
## [18987] {other_vegetables,
## pastry,
## yogurt} => {tropical_fruit} 0.001931876 0.2923077 0.006609049 2.7857036 19
## [18988] {pastry,
## tropical_fruit,
## yogurt} => {whole_milk} 0.003050330 0.6521739 0.004677173 2.5523798 30
## [18989] {pastry,
## tropical_fruit,
## whole_milk} => {yogurt} 0.003050330 0.4545455 0.006710727 3.2583488 30
## [18990] {pastry,
## whole_milk,
## yogurt} => {tropical_fruit} 0.003050330 0.3333333 0.009150991 3.1766796 30
## [18991] {tropical_fruit,
## whole_milk,
## yogurt} => {pastry} 0.003050330 0.2013423 0.015149975 2.2630872 30
## [18992] {pastry,
## rolls/buns,
## tropical_fruit} => {other_vegetables} 0.001423488 0.3500000 0.004067107 1.8088544 14
## [18993] {other_vegetables,
## pastry,
## tropical_fruit} => {rolls/buns} 0.001423488 0.2800000 0.005083884 1.5222775 14
## [18994] {other_vegetables,
## pastry,
## rolls/buns} => {tropical_fruit} 0.001423488 0.2333333 0.006100661 2.2236757 14
## [18995] {pastry,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001931876 0.4750000 0.004067107 1.8589833 19
## [18996] {pastry,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001931876 0.2878788 0.006710727 1.5651121 19
## [18997] {pastry,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001931876 0.2261905 0.008540925 2.1556040 19
## [18998] {other_vegetables,
## pastry,
## tropical_fruit} => {whole_milk} 0.002440264 0.4800000 0.005083884 1.8785515 24
## [18999] {pastry,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.002440264 0.3636364 0.006710727 1.8793293 24
## [19000] {other_vegetables,
## pastry,
## whole_milk} => {tropical_fruit} 0.002440264 0.2307692 0.010574479 2.1992397 24
## [19001] {pastry,
## root_vegetables,
## soda} => {other_vegetables} 0.001525165 0.6250000 0.002440264 3.2300972 15
## [19002] {other_vegetables,
## pastry,
## root_vegetables} => {soda} 0.001525165 0.2586207 0.005897306 1.4831105 15
## [19003] {other_vegetables,
## pastry,
## soda} => {root_vegetables} 0.001525165 0.2777778 0.005490595 2.5484556 15
## [19004] {pastry,
## root_vegetables,
## soda} => {whole_milk} 0.001626843 0.6666667 0.002440264 2.6090994 16
## [19005] {pastry,
## root_vegetables,
## whole_milk} => {soda} 0.001626843 0.2857143 0.005693950 1.6384840 16
## [19006] {root_vegetables,
## soda,
## whole_milk} => {pastry} 0.001626843 0.2000000 0.008134215 2.2480000 16
## [19007] {pastry,
## root_vegetables,
## yogurt} => {rolls/buns} 0.001220132 0.3243243 0.003762074 1.7632558 12
## [19008] {pastry,
## rolls/buns,
## root_vegetables} => {yogurt} 0.001220132 0.3243243 0.003762074 2.3248759 12
## [19009] {pastry,
## rolls/buns,
## yogurt} => {root_vegetables} 0.001220132 0.2105263 0.005795628 1.9314611 12
## [19010] {pastry,
## root_vegetables,
## yogurt} => {other_vegetables} 0.002236909 0.5945946 0.003762074 3.0729574 22
## [19011] {other_vegetables,
## pastry,
## root_vegetables} => {yogurt} 0.002236909 0.3793103 0.005897306 2.7190359 22
## [19012] {other_vegetables,
## pastry,
## yogurt} => {root_vegetables} 0.002236909 0.3384615 0.006609049 3.1051952 22
## [19013] {pastry,
## root_vegetables,
## yogurt} => {whole_milk} 0.002541942 0.6756757 0.003762074 2.6443574 25
## [19014] {pastry,
## root_vegetables,
## whole_milk} => {yogurt} 0.002541942 0.4464286 0.005693950 3.2001640 25
## [19015] {pastry,
## whole_milk,
## yogurt} => {root_vegetables} 0.002541942 0.2777778 0.009150991 2.5484556 25
## [19016] {pastry,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.001931876 0.5135135 0.003762074 2.6539177 19
## [19017] {other_vegetables,
## pastry,
## root_vegetables} => {rolls/buns} 0.001931876 0.3275862 0.005897306 1.7809897 19
## [19018] {other_vegetables,
## pastry,
## rolls/buns} => {root_vegetables} 0.001931876 0.3166667 0.006100661 2.9052394 19
## [19019] {pastry,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.002236909 0.5945946 0.003762074 2.3270346 22
## [19020] {pastry,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.002236909 0.3928571 0.005693950 2.1358485 22
## [19021] {pastry,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.002236909 0.2619048 0.008540925 2.4028296 22
## [19022] {other_vegetables,
## pastry,
## root_vegetables} => {whole_milk} 0.003050330 0.5172414 0.005897306 2.0243012 30
## [19023] {pastry,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.003050330 0.5357143 0.005693950 2.7686548 30
## [19024] {other_vegetables,
## pastry,
## whole_milk} => {root_vegetables} 0.003050330 0.2884615 0.010574479 2.6464732 30
## [19025] {pastry,
## soda,
## yogurt} => {rolls/buns} 0.001728521 0.3469388 0.004982206 1.8862039 17
## [19026] {pastry,
## rolls/buns,
## soda} => {yogurt} 0.001728521 0.3207547 0.005388917 2.2992876 17
## [19027] {pastry,
## rolls/buns,
## yogurt} => {soda} 0.001728521 0.2982456 0.005795628 1.7103473 17
## [19028] {rolls/buns,
## soda,
## yogurt} => {pastry} 0.001728521 0.2000000 0.008642603 2.2480000 17
## [19029] {pastry,
## soda,
## yogurt} => {other_vegetables} 0.001525165 0.3061224 0.004982206 1.5820884 15
## [19030] {other_vegetables,
## pastry,
## soda} => {yogurt} 0.001525165 0.2777778 0.005490595 1.9912132 15
## [19031] {other_vegetables,
## pastry,
## yogurt} => {soda} 0.001525165 0.2307692 0.006609049 1.3233909 15
## [19032] {pastry,
## soda,
## yogurt} => {whole_milk} 0.002541942 0.5102041 0.004982206 1.9967597 25
## [19033] {pastry,
## soda,
## whole_milk} => {yogurt} 0.002541942 0.3086420 0.008235892 2.2124591 25
## [19034] {pastry,
## whole_milk,
## yogurt} => {soda} 0.002541942 0.2777778 0.009150991 1.5929705 25
## [19035] {soda,
## whole_milk,
## yogurt} => {pastry} 0.002541942 0.2427184 0.010472801 2.7281553 25
## [19036] {pastry,
## rolls/buns,
## soda} => {other_vegetables} 0.001525165 0.2830189 0.005388917 1.4626855 15
## [19037] {other_vegetables,
## pastry,
## soda} => {rolls/buns} 0.001525165 0.2777778 0.005490595 1.5101959 15
## [19038] {other_vegetables,
## pastry,
## rolls/buns} => {soda} 0.001525165 0.2500000 0.006100661 1.4336735 15
## [19039] {pastry,
## rolls/buns,
## soda} => {whole_milk} 0.001728521 0.3207547 0.005388917 1.2553214 17
## [19040] {pastry,
## soda,
## whole_milk} => {rolls/buns} 0.001728521 0.2098765 0.008235892 1.1410369 17
## [19041] {pastry,
## rolls/buns,
## whole_milk} => {soda} 0.001728521 0.2023810 0.008540925 1.1605928 17
## [19042] {other_vegetables,
## pastry,
## soda} => {whole_milk} 0.002846975 0.5185185 0.005490595 2.0292995 28
## [19043] {pastry,
## soda,
## whole_milk} => {other_vegetables} 0.002846975 0.3456790 0.008235892 1.7865229 28
## [19044] {other_vegetables,
## pastry,
## whole_milk} => {soda} 0.002846975 0.2692308 0.010574479 1.5439560 28
## [19045] {other_vegetables,
## soda,
## whole_milk} => {pastry} 0.002846975 0.2043796 0.013929842 2.2972263 28
## [19046] {pastry,
## rolls/buns,
## yogurt} => {other_vegetables} 0.002135231 0.3684211 0.005795628 1.9040573 21
## [19047] {other_vegetables,
## pastry,
## yogurt} => {rolls/buns} 0.002135231 0.3230769 0.006609049 1.7564740 21
## [19048] {other_vegetables,
## pastry,
## rolls/buns} => {yogurt} 0.002135231 0.3500000 0.006100661 2.5089286 21
## [19049] {pastry,
## rolls/buns,
## yogurt} => {whole_milk} 0.003050330 0.5263158 0.005795628 2.0598153 30
## [19050] {pastry,
## whole_milk,
## yogurt} => {rolls/buns} 0.003050330 0.3333333 0.009150991 1.8122351 30
## [19051] {pastry,
## rolls/buns,
## whole_milk} => {yogurt} 0.003050330 0.3571429 0.008540925 2.5601312 30
## [19052] {other_vegetables,
## pastry,
## yogurt} => {whole_milk} 0.004067107 0.6153846 0.006609049 2.4083994 40
## [19053] {pastry,
## whole_milk,
## yogurt} => {other_vegetables} 0.004067107 0.4444444 0.009150991 2.2969580 40
## [19054] {other_vegetables,
## pastry,
## whole_milk} => {yogurt} 0.004067107 0.3846154 0.010574479 2.7570644 40
## [19055] {other_vegetables,
## pastry,
## rolls/buns} => {whole_milk} 0.002745297 0.4500000 0.006100661 1.7611421 27
## [19056] {pastry,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.002745297 0.3214286 0.008540925 1.6611929 27
## [19057] {other_vegetables,
## pastry,
## whole_milk} => {rolls/buns} 0.002745297 0.2596154 0.010574479 1.4114524 27
## [19058] {citrus_fruit,
## shopping_bags,
## tropical_fruit} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [19059] {citrus_fruit,
## other_vegetables,
## shopping_bags} => {tropical_fruit} 0.001016777 0.3448276 0.002948653 3.2862203 10
## [19060] {other_vegetables,
## shopping_bags,
## tropical_fruit} => {citrus_fruit} 0.001016777 0.2127660 0.004778851 2.5707042 10
## [19061] {citrus_fruit,
## root_vegetables,
## shopping_bags} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [19062] {citrus_fruit,
## other_vegetables,
## shopping_bags} => {root_vegetables} 0.001220132 0.4137931 0.002948653 3.7963201 12
## [19063] {citrus_fruit,
## shopping_bags,
## soda} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [19064] {citrus_fruit,
## shopping_bags,
## whole_milk} => {soda} 0.001016777 0.3448276 0.002948653 1.9774806 10
## [19065] {citrus_fruit,
## soda,
## whole_milk} => {shopping_bags} 0.001016777 0.2272727 0.004473818 2.3067361 10
## [19066] {bottled_water,
## citrus_fruit,
## sausage} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [19067] {citrus_fruit,
## other_vegetables,
## sausage} => {bottled_water} 0.001016777 0.2272727 0.004473818 2.0563268 10
## [19068] {bottled_water,
## citrus_fruit,
## other_vegetables} => {sausage} 0.001016777 0.2000000 0.005083884 2.1287879 10
## [19069] {bottled_water,
## other_vegetables,
## sausage} => {citrus_fruit} 0.001016777 0.2000000 0.005083884 2.4164619 10
## [19070] {citrus_fruit,
## sausage,
## tropical_fruit} => {other_vegetables} 0.001321810 0.5416667 0.002440264 2.7994176 13
## [19071] {citrus_fruit,
## other_vegetables,
## sausage} => {tropical_fruit} 0.001321810 0.2954545 0.004473818 2.8156933 13
## [19072] {other_vegetables,
## sausage,
## tropical_fruit} => {citrus_fruit} 0.001321810 0.2203390 0.005998983 2.6622038 13
## [19073] {citrus_fruit,
## sausage,
## tropical_fruit} => {whole_milk} 0.001423488 0.5833333 0.002440264 2.2829619 14
## [19074] {citrus_fruit,
## sausage,
## whole_milk} => {tropical_fruit} 0.001423488 0.2857143 0.004982206 2.7228682 14
## [19075] {citrus_fruit,
## root_vegetables,
## sausage} => {yogurt} 0.001321810 0.4482759 0.002948653 3.2134061 13
## [19076] {citrus_fruit,
## sausage,
## yogurt} => {root_vegetables} 0.001321810 0.3421053 0.003863752 3.1386243 13
## [19077] {citrus_fruit,
## root_vegetables,
## yogurt} => {sausage} 0.001321810 0.2708333 0.004880529 2.8827336 13
## [19078] {root_vegetables,
## sausage,
## yogurt} => {citrus_fruit} 0.001321810 0.2549020 0.005185562 3.0798044 13
## [19079] {citrus_fruit,
## root_vegetables,
## sausage} => {other_vegetables} 0.001728521 0.5862069 0.002948653 3.0296084 17
## [19080] {citrus_fruit,
## other_vegetables,
## sausage} => {root_vegetables} 0.001728521 0.3863636 0.004473818 3.5446701 17
## [19081] {other_vegetables,
## root_vegetables,
## sausage} => {citrus_fruit} 0.001728521 0.2537313 0.006812405 3.0656606 17
## [19082] {citrus_fruit,
## root_vegetables,
## sausage} => {whole_milk} 0.001728521 0.5862069 0.002948653 2.2942080 17
## [19083] {citrus_fruit,
## sausage,
## whole_milk} => {root_vegetables} 0.001728521 0.3469388 0.004982206 3.1829691 17
## [19084] {root_vegetables,
## sausage,
## whole_milk} => {citrus_fruit} 0.001728521 0.2236842 0.007727504 2.7026219 17
## [19085] {citrus_fruit,
## sausage,
## soda} => {yogurt} 0.001321810 0.4062500 0.003253686 2.9121492 13
## [19086] {citrus_fruit,
## sausage,
## yogurt} => {soda} 0.001321810 0.3421053 0.003863752 1.9618690 13
## [19087] {citrus_fruit,
## soda,
## yogurt} => {sausage} 0.001321810 0.3170732 0.004168785 3.3749076 13
## [19088] {sausage,
## soda,
## yogurt} => {citrus_fruit} 0.001321810 0.2363636 0.005592272 2.8558186 13
## [19089] {citrus_fruit,
## sausage,
## soda} => {other_vegetables} 0.001321810 0.4062500 0.003253686 2.0995632 13
## [19090] {citrus_fruit,
## other_vegetables,
## sausage} => {soda} 0.001321810 0.2954545 0.004473818 1.6943414 13
## [19091] {citrus_fruit,
## other_vegetables,
## soda} => {sausage} 0.001321810 0.3170732 0.004168785 3.3749076 13
## [19092] {citrus_fruit,
## sausage,
## soda} => {whole_milk} 0.001220132 0.3750000 0.003253686 1.4676184 12
## [19093] {citrus_fruit,
## sausage,
## whole_milk} => {soda} 0.001220132 0.2448980 0.004982206 1.4044148 12
## [19094] {citrus_fruit,
## soda,
## whole_milk} => {sausage} 0.001220132 0.2727273 0.004473818 2.9028926 12
## [19095] {citrus_fruit,
## sausage,
## yogurt} => {rolls/buns} 0.001118454 0.2894737 0.003863752 1.5737831 11
## [19096] {citrus_fruit,
## rolls/buns,
## sausage} => {yogurt} 0.001118454 0.4400000 0.002541942 3.1540816 11
## [19097] {citrus_fruit,
## sausage,
## yogurt} => {other_vegetables} 0.001626843 0.4210526 0.003863752 2.1760655 16
## [19098] {citrus_fruit,
## other_vegetables,
## sausage} => {yogurt} 0.001626843 0.3636364 0.004473818 2.6066790 16
## [19099] {citrus_fruit,
## other_vegetables,
## yogurt} => {sausage} 0.001626843 0.2133333 0.007625826 2.2707071 16
## [19100] {other_vegetables,
## sausage,
## yogurt} => {citrus_fruit} 0.001626843 0.2000000 0.008134215 2.4164619 16
## [19101] {citrus_fruit,
## sausage,
## yogurt} => {whole_milk} 0.001525165 0.3947368 0.003863752 1.5448615 15
## [19102] {citrus_fruit,
## sausage,
## whole_milk} => {yogurt} 0.001525165 0.3061224 0.004982206 2.1943982 15
## [19103] {citrus_fruit,
## rolls/buns,
## sausage} => {other_vegetables} 0.001423488 0.5600000 0.002541942 2.8941671 14
## [19104] {citrus_fruit,
## other_vegetables,
## sausage} => {rolls/buns} 0.001423488 0.3181818 0.004473818 1.7298608 14
## [19105] {citrus_fruit,
## other_vegetables,
## rolls/buns} => {sausage} 0.001423488 0.2372881 0.005998983 2.5256805 14
## [19106] {citrus_fruit,
## rolls/buns,
## sausage} => {whole_milk} 0.001220132 0.4800000 0.002541942 1.8785515 12
## [19107] {citrus_fruit,
## sausage,
## whole_milk} => {rolls/buns} 0.001220132 0.2448980 0.004982206 1.3314380 12
## [19108] {citrus_fruit,
## other_vegetables,
## sausage} => {whole_milk} 0.002338587 0.5227273 0.004473818 2.0457711 23
## [19109] {citrus_fruit,
## sausage,
## whole_milk} => {other_vegetables} 0.002338587 0.4693878 0.004982206 2.4258689 23
## [19110] {other_vegetables,
## sausage,
## whole_milk} => {citrus_fruit} 0.002338587 0.2300000 0.010167768 2.7789312 23
## [19111] {bottled_water,
## citrus_fruit,
## tropical_fruit} => {root_vegetables} 0.001220132 0.2926829 0.004168785 2.6852020 12
## [19112] {bottled_water,
## citrus_fruit,
## root_vegetables} => {tropical_fruit} 0.001220132 0.3636364 0.003355363 3.4654686 12
## [19113] {citrus_fruit,
## root_vegetables,
## tropical_fruit} => {bottled_water} 0.001220132 0.2142857 0.005693950 1.9388224 12
## [19114] {bottled_water,
## root_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001220132 0.2666667 0.004575496 3.2219492 12
## [19115] {bottled_water,
## citrus_fruit,
## tropical_fruit} => {yogurt} 0.001626843 0.3902439 0.004168785 2.7974116 16
## [19116] {bottled_water,
## citrus_fruit,
## yogurt} => {tropical_fruit} 0.001626843 0.4000000 0.004067107 3.8120155 16
## [19117] {citrus_fruit,
## tropical_fruit,
## yogurt} => {bottled_water} 0.001626843 0.2580645 0.006304016 2.3349260 16
## [19118] {bottled_water,
## tropical_fruit,
## yogurt} => {citrus_fruit} 0.001626843 0.2285714 0.007117438 2.7616708 16
## [19119] {bottled_water,
## citrus_fruit,
## tropical_fruit} => {other_vegetables} 0.001525165 0.3658537 0.004168785 1.8907886 15
## [19120] {bottled_water,
## citrus_fruit,
## other_vegetables} => {tropical_fruit} 0.001525165 0.3000000 0.005083884 2.8590116 15
## [19121] {bottled_water,
## other_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001525165 0.2459016 0.006202339 2.9710597 15
## [19122] {bottled_water,
## citrus_fruit,
## tropical_fruit} => {whole_milk} 0.002236909 0.5365854 0.004168785 2.1000068 22
## [19123] {bottled_water,
## citrus_fruit,
## whole_milk} => {tropical_fruit} 0.002236909 0.3793103 0.005897306 3.6148423 22
## [19124] {citrus_fruit,
## tropical_fruit,
## whole_milk} => {bottled_water} 0.002236909 0.2471910 0.009049314 2.2365442 22
## [19125] {bottled_water,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.002236909 0.2784810 0.008032537 3.3646938 22
## [19126] {bottled_water,
## citrus_fruit,
## root_vegetables} => {other_vegetables} 0.001830198 0.5454545 0.003355363 2.8189939 18
## [19127] {bottled_water,
## citrus_fruit,
## other_vegetables} => {root_vegetables} 0.001830198 0.3600000 0.005083884 3.3027985 18
## [19128] {bottled_water,
## other_vegetables,
## root_vegetables} => {citrus_fruit} 0.001830198 0.2608696 0.007015760 3.1519068 18
## [19129] {bottled_water,
## citrus_fruit,
## root_vegetables} => {whole_milk} 0.002033554 0.6060606 0.003355363 2.3719085 20
## [19130] {bottled_water,
## citrus_fruit,
## whole_milk} => {root_vegetables} 0.002033554 0.3448276 0.005897306 3.1636001 20
## [19131] {citrus_fruit,
## root_vegetables,
## whole_milk} => {bottled_water} 0.002033554 0.2222222 0.009150991 2.0106307 20
## [19132] {bottled_water,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.002033554 0.2777778 0.007320793 3.3561971 20
## [19133] {bottled_water,
## citrus_fruit,
## yogurt} => {rolls/buns} 0.001321810 0.3250000 0.004067107 1.7669292 13
## [19134] {bottled_water,
## citrus_fruit,
## rolls/buns} => {yogurt} 0.001321810 0.4193548 0.003152008 3.0060895 13
## [19135] {citrus_fruit,
## rolls/buns,
## yogurt} => {bottled_water} 0.001321810 0.2280702 0.005795628 2.0635420 13
## [19136] {bottled_water,
## citrus_fruit,
## yogurt} => {other_vegetables} 0.001626843 0.4000000 0.004067107 2.0672622 16
## [19137] {bottled_water,
## citrus_fruit,
## other_vegetables} => {yogurt} 0.001626843 0.3200000 0.005083884 2.2938776 16
## [19138] {citrus_fruit,
## other_vegetables,
## yogurt} => {bottled_water} 0.001626843 0.2133333 0.007625826 1.9302055 16
## [19139] {bottled_water,
## other_vegetables,
## yogurt} => {citrus_fruit} 0.001626843 0.2000000 0.008134215 2.4164619 16
## [19140] {bottled_water,
## citrus_fruit,
## yogurt} => {whole_milk} 0.001830198 0.4500000 0.004067107 1.7611421 18
## [19141] {bottled_water,
## citrus_fruit,
## whole_milk} => {yogurt} 0.001830198 0.3103448 0.005897306 2.2246657 18
## [19142] {bottled_water,
## citrus_fruit,
## rolls/buns} => {other_vegetables} 0.001016777 0.3225806 0.003152008 1.6671469 10
## [19143] {bottled_water,
## citrus_fruit,
## other_vegetables} => {rolls/buns} 0.001016777 0.2000000 0.005083884 1.0873411 10
## [19144] {bottled_water,
## citrus_fruit,
## rolls/buns} => {whole_milk} 0.001321810 0.4193548 0.003152008 1.6412077 13
## [19145] {bottled_water,
## citrus_fruit,
## whole_milk} => {rolls/buns} 0.001321810 0.2241379 0.005897306 1.2185719 13
## [19146] {bottled_water,
## citrus_fruit,
## other_vegetables} => {whole_milk} 0.002948653 0.5800000 0.005083884 2.2699164 29
## [19147] {bottled_water,
## citrus_fruit,
## whole_milk} => {other_vegetables} 0.002948653 0.5000000 0.005897306 2.5840778 29
## [19148] {citrus_fruit,
## other_vegetables,
## whole_milk} => {bottled_water} 0.002948653 0.2265625 0.013014743 2.0499008 29
## [19149] {bottled_water,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.002948653 0.2735849 0.010777834 3.3055375 29
## [19150] {citrus_fruit,
## soda,
## tropical_fruit} => {root_vegetables} 0.001016777 0.2941176 0.003457041 2.6983648 10
## [19151] {citrus_fruit,
## root_vegetables,
## soda} => {tropical_fruit} 0.001016777 0.3333333 0.003050330 3.1766796 10
## [19152] {root_vegetables,
## soda,
## tropical_fruit} => {citrus_fruit} 0.001016777 0.2702703 0.003762074 3.2654891 10
## [19153] {citrus_fruit,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.002135231 0.3750000 0.005693950 2.6881378 21
## [19154] {citrus_fruit,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.002135231 0.3387097 0.006304016 3.1074717 21
## [19155] {citrus_fruit,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.002135231 0.4375000 0.004880529 4.1693920 21
## [19156] {root_vegetables,
## tropical_fruit,
## yogurt} => {citrus_fruit} 0.002135231 0.2625000 0.008134215 3.1716063 21
## [19157] {citrus_fruit,
## root_vegetables,
## tropical_fruit} => {rolls/buns} 0.001321810 0.2321429 0.005693950 1.2620923 13
## [19158] {citrus_fruit,
## rolls/buns,
## tropical_fruit} => {root_vegetables} 0.001321810 0.3023256 0.004372140 2.7736680 13
## [19159] {citrus_fruit,
## rolls/buns,
## root_vegetables} => {tropical_fruit} 0.001321810 0.3823529 0.003457041 3.6438383 13
## [19160] {rolls/buns,
## root_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001321810 0.2241379 0.005897306 2.7081039 13
## [19161] {citrus_fruit,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.004473818 0.7857143 0.005693950 4.0606936 44
## [19162] {citrus_fruit,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.004473818 0.4943820 0.009049314 4.5356783 44
## [19163] {citrus_fruit,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.004473818 0.4313725 0.010371124 4.1109971 44
## [19164] {other_vegetables,
## root_vegetables,
## tropical_fruit} => {citrus_fruit} 0.004473818 0.3636364 0.012302999 4.3935671 44
## [19165] {citrus_fruit,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.003558719 0.6250000 0.005693950 2.4460306 35
## [19166] {citrus_fruit,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.003558719 0.3932584 0.009049314 3.6079260 35
## [19167] {citrus_fruit,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.003558719 0.3888889 0.009150991 3.7061262 35
## [19168] {root_vegetables,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.003558719 0.2966102 0.011997966 3.5837359 35
## [19169] {citrus_fruit,
## soda,
## tropical_fruit} => {yogurt} 0.001423488 0.4117647 0.003457041 2.9516807 14
## [19170] {citrus_fruit,
## tropical_fruit,
## yogurt} => {soda} 0.001423488 0.2258065 0.006304016 1.2949309 14
## [19171] {citrus_fruit,
## soda,
## yogurt} => {tropical_fruit} 0.001423488 0.3414634 0.004168785 3.2541596 14
## [19172] {soda,
## tropical_fruit,
## yogurt} => {citrus_fruit} 0.001423488 0.2153846 0.006609049 2.6023436 14
## [19173] {citrus_fruit,
## soda,
## tropical_fruit} => {rolls/buns} 0.001118454 0.3235294 0.003457041 1.7589341 11
## [19174] {citrus_fruit,
## rolls/buns,
## tropical_fruit} => {soda} 0.001118454 0.2558140 0.004372140 1.4670147 11
## [19175] {citrus_fruit,
## rolls/buns,
## soda} => {tropical_fruit} 0.001118454 0.3333333 0.003355363 3.1766796 11
## [19176] {rolls/buns,
## soda,
## tropical_fruit} => {citrus_fruit} 0.001118454 0.2075472 0.005388917 2.5076492 11
## [19177] {citrus_fruit,
## soda,
## tropical_fruit} => {other_vegetables} 0.001118454 0.3235294 0.003457041 1.6720503 11
## [19178] {citrus_fruit,
## other_vegetables,
## soda} => {tropical_fruit} 0.001118454 0.2682927 0.004168785 2.5568397 11
## [19179] {citrus_fruit,
## soda,
## tropical_fruit} => {whole_milk} 0.001321810 0.3823529 0.003457041 1.4963952 13
## [19180] {citrus_fruit,
## soda,
## whole_milk} => {tropical_fruit} 0.001321810 0.2954545 0.004473818 2.8156933 13
## [19181] {citrus_fruit,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001728521 0.2741935 0.006304016 1.4907095 17
## [19182] {citrus_fruit,
## rolls/buns,
## tropical_fruit} => {yogurt} 0.001728521 0.3953488 0.004372140 2.8340057 17
## [19183] {citrus_fruit,
## rolls/buns,
## yogurt} => {tropical_fruit} 0.001728521 0.2982456 0.005795628 2.8422923 17
## [19184] {citrus_fruit,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.003152008 0.5000000 0.006304016 2.5840778 31
## [19185] {citrus_fruit,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.003152008 0.3483146 0.009049314 2.4968471 31
## [19186] {citrus_fruit,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.003152008 0.4133333 0.007625826 3.9390827 31
## [19187] {other_vegetables,
## tropical_fruit,
## yogurt} => {citrus_fruit} 0.003152008 0.2561983 0.012302999 3.0954677 31
## [19188] {citrus_fruit,
## tropical_fruit,
## yogurt} => {whole_milk} 0.003863752 0.6129032 0.006304016 2.3986881 38
## [19189] {citrus_fruit,
## tropical_fruit,
## whole_milk} => {yogurt} 0.003863752 0.4269663 0.009049314 3.0606512 38
## [19190] {citrus_fruit,
## whole_milk,
## yogurt} => {tropical_fruit} 0.003863752 0.3762376 0.010269446 3.5855591 38
## [19191] {tropical_fruit,
## whole_milk,
## yogurt} => {citrus_fruit} 0.003863752 0.2550336 0.015149975 3.0813944 38
## [19192] {citrus_fruit,
## rolls/buns,
## tropical_fruit} => {other_vegetables} 0.001830198 0.4186047 0.004372140 2.1634139 18
## [19193] {citrus_fruit,
## other_vegetables,
## tropical_fruit} => {rolls/buns} 0.001830198 0.2022472 0.009049314 1.0995584 18
## [19194] {citrus_fruit,
## other_vegetables,
## rolls/buns} => {tropical_fruit} 0.001830198 0.3050847 0.005998983 2.9074695 18
## [19195] {other_vegetables,
## rolls/buns,
## tropical_fruit} => {citrus_fruit} 0.001830198 0.2337662 0.007829181 2.8244360 18
## [19196] {citrus_fruit,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.002236909 0.5116279 0.004372140 2.0023321 22
## [19197] {citrus_fruit,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.002236909 0.2471910 0.009049314 1.3439047 22
## [19198] {citrus_fruit,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.002236909 0.3098592 0.007219115 2.9529698 22
## [19199] {rolls/buns,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.002236909 0.2037037 0.010981190 2.4612112 22
## [19200] {citrus_fruit,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.004982206 0.5505618 0.009049314 2.1547056 49
## [19201] {citrus_fruit,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.004982206 0.5505618 0.009049314 2.8453890 49
## [19202] {citrus_fruit,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.004982206 0.3828125 0.013014743 3.6482180 49
## [19203] {other_vegetables,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.004982206 0.2916667 0.017081851 3.5240070 49
## [19204] {citrus_fruit,
## root_vegetables,
## soda} => {yogurt} 0.001118454 0.3666667 0.003050330 2.6284014 11
## [19205] {citrus_fruit,
## root_vegetables,
## yogurt} => {soda} 0.001118454 0.2291667 0.004880529 1.3142007 11
## [19206] {citrus_fruit,
## soda,
## yogurt} => {root_vegetables} 0.001118454 0.2682927 0.004168785 2.4614352 11
## [19207] {root_vegetables,
## soda,
## yogurt} => {citrus_fruit} 0.001118454 0.2340426 0.004778851 2.8277746 11
## [19208] {citrus_fruit,
## root_vegetables,
## soda} => {other_vegetables} 0.002135231 0.7000000 0.003050330 3.6177089 21
## [19209] {citrus_fruit,
## other_vegetables,
## root_vegetables} => {soda} 0.002135231 0.2058824 0.010371124 1.1806723 21
## [19210] {citrus_fruit,
## other_vegetables,
## soda} => {root_vegetables} 0.002135231 0.5121951 0.004168785 4.6991036 21
## [19211] {other_vegetables,
## root_vegetables,
## soda} => {citrus_fruit} 0.002135231 0.2592593 0.008235892 3.1324506 21
## [19212] {citrus_fruit,
## root_vegetables,
## soda} => {whole_milk} 0.001626843 0.5333333 0.003050330 2.0872795 16
## [19213] {citrus_fruit,
## soda,
## whole_milk} => {root_vegetables} 0.001626843 0.3636364 0.004473818 3.3361601 16
## [19214] {root_vegetables,
## soda,
## whole_milk} => {citrus_fruit} 0.001626843 0.2000000 0.008134215 2.4164619 16
## [19215] {citrus_fruit,
## root_vegetables,
## yogurt} => {rolls/buns} 0.001016777 0.2083333 0.004880529 1.1326470 10
## [19216] {citrus_fruit,
## rolls/buns,
## root_vegetables} => {yogurt} 0.001016777 0.2941176 0.003457041 2.1083433 10
## [19217] {citrus_fruit,
## root_vegetables,
## yogurt} => {other_vegetables} 0.002846975 0.5833333 0.004880529 3.0147574 28
## [19218] {citrus_fruit,
## other_vegetables,
## root_vegetables} => {yogurt} 0.002846975 0.2745098 0.010371124 1.9677871 28
## [19219] {citrus_fruit,
## other_vegetables,
## yogurt} => {root_vegetables} 0.002846975 0.3733333 0.007625826 3.4251244 28
## [19220] {other_vegetables,
## root_vegetables,
## yogurt} => {citrus_fruit} 0.002846975 0.2204724 0.012913066 2.6638163 28
## [19221] {citrus_fruit,
## root_vegetables,
## yogurt} => {whole_milk} 0.003152008 0.6458333 0.004880529 2.5275650 31
## [19222] {citrus_fruit,
## root_vegetables,
## whole_milk} => {yogurt} 0.003152008 0.3444444 0.009150991 2.4691043 31
## [19223] {citrus_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.003152008 0.3069307 0.010269446 2.8159173 31
## [19224] {root_vegetables,
## whole_milk,
## yogurt} => {citrus_fruit} 0.003152008 0.2167832 0.014539908 2.6192419 31
## [19225] {citrus_fruit,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.002236909 0.6470588 0.003457041 3.3441006 22
## [19226] {citrus_fruit,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.002236909 0.2156863 0.010371124 1.1726227 22
## [19227] {citrus_fruit,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.002236909 0.3728814 0.005998983 3.4209777 22
## [19228] {citrus_fruit,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001931876 0.5588235 0.003457041 2.1870392 19
## [19229] {citrus_fruit,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001931876 0.2111111 0.009150991 1.1477489 19
## [19230] {citrus_fruit,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001931876 0.2676056 0.007219115 2.4551319 19
## [19231] {citrus_fruit,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.005795628 0.5588235 0.010371124 2.1870392 57
## [19232] {citrus_fruit,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.005795628 0.6333333 0.009150991 3.2731652 57
## [19233] {citrus_fruit,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.005795628 0.4453125 0.013014743 4.0854929 57
## [19234] {other_vegetables,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.005795628 0.2500000 0.023182511 3.0205774 57
## [19235] {citrus_fruit,
## soda,
## yogurt} => {rolls/buns} 0.001118454 0.2682927 0.004168785 1.4586283 11
## [19236] {citrus_fruit,
## rolls/buns,
## soda} => {yogurt} 0.001118454 0.3333333 0.003355363 2.3894558 11
## [19237] {citrus_fruit,
## soda,
## yogurt} => {other_vegetables} 0.001220132 0.2926829 0.004168785 1.5126309 12
## [19238] {citrus_fruit,
## other_vegetables,
## soda} => {yogurt} 0.001220132 0.2926829 0.004168785 2.0980587 12
## [19239] {citrus_fruit,
## soda,
## yogurt} => {whole_milk} 0.001931876 0.4634146 0.004168785 1.8136422 19
## [19240] {citrus_fruit,
## soda,
## whole_milk} => {yogurt} 0.001931876 0.4318182 0.004473818 3.0954314 19
## [19241] {citrus_fruit,
## rolls/buns,
## soda} => {other_vegetables} 0.001220132 0.3636364 0.003355363 1.8793293 12
## [19242] {citrus_fruit,
## other_vegetables,
## soda} => {rolls/buns} 0.001220132 0.2926829 0.004168785 1.5912308 12
## [19243] {citrus_fruit,
## other_vegetables,
## rolls/buns} => {soda} 0.001220132 0.2033898 0.005998983 1.1663784 12
## [19244] {citrus_fruit,
## rolls/buns,
## soda} => {whole_milk} 0.001220132 0.3636364 0.003355363 1.4231451 12
## [19245] {citrus_fruit,
## soda,
## whole_milk} => {rolls/buns} 0.001220132 0.2727273 0.004473818 1.4827378 12
## [19246] {citrus_fruit,
## other_vegetables,
## soda} => {whole_milk} 0.002135231 0.5121951 0.004168785 2.0045519 21
## [19247] {citrus_fruit,
## soda,
## whole_milk} => {other_vegetables} 0.002135231 0.4772727 0.004473818 2.4666197 21
## [19248] {citrus_fruit,
## rolls/buns,
## yogurt} => {other_vegetables} 0.001728521 0.2982456 0.005795628 1.5413797 17
## [19249] {citrus_fruit,
## other_vegetables,
## yogurt} => {rolls/buns} 0.001728521 0.2266667 0.007625826 1.2323199 17
## [19250] {citrus_fruit,
## other_vegetables,
## rolls/buns} => {yogurt} 0.001728521 0.2881356 0.005998983 2.0654618 17
## [19251] {citrus_fruit,
## rolls/buns,
## yogurt} => {whole_milk} 0.002643620 0.4561404 0.005795628 1.7851732 26
## [19252] {citrus_fruit,
## whole_milk,
## yogurt} => {rolls/buns} 0.002643620 0.2574257 0.010269446 1.3995479 26
## [19253] {citrus_fruit,
## rolls/buns,
## whole_milk} => {yogurt} 0.002643620 0.3661972 0.007219115 2.6250359 26
## [19254] {citrus_fruit,
## other_vegetables,
## yogurt} => {whole_milk} 0.004778851 0.6266667 0.007625826 2.4525534 47
## [19255] {citrus_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.004778851 0.4653465 0.010269446 2.4049833 47
## [19256] {citrus_fruit,
## other_vegetables,
## whole_milk} => {yogurt} 0.004778851 0.3671875 0.013014743 2.6321349 47
## [19257] {other_vegetables,
## whole_milk,
## yogurt} => {citrus_fruit} 0.004778851 0.2146119 0.022267412 2.5930071 47
## [19258] {citrus_fruit,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.003050330 0.5084746 0.005998983 1.9899910 30
## [19259] {citrus_fruit,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.003050330 0.4225352 0.007219115 2.1837277 30
## [19260] {citrus_fruit,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.003050330 0.2343750 0.013014743 1.2742278 30
## [19261] {bottled_water,
## sausage,
## shopping_bags} => {soda} 0.001118454 0.4400000 0.002541942 2.5232653 11
## [19262] {bottled_water,
## shopping_bags,
## soda} => {sausage} 0.001118454 0.2750000 0.004067107 2.9270833 11
## [19263] {bottled_water,
## sausage,
## soda} => {shopping_bags} 0.001118454 0.2750000 0.004067107 2.7911507 11
## [19264] {bottled_water,
## sausage,
## shopping_bags} => {rolls/buns} 0.001016777 0.4000000 0.002541942 2.1746821 10
## [19265] {bottled_water,
## rolls/buns,
## shopping_bags} => {sausage} 0.001016777 0.3333333 0.003050330 3.5479798 10
## [19266] {bottled_water,
## rolls/buns,
## sausage} => {shopping_bags} 0.001016777 0.2564103 0.003965430 2.6024715 10
## [19267] {bottled_water,
## sausage,
## shopping_bags} => {other_vegetables} 0.001423488 0.5600000 0.002541942 2.8941671 14
## [19268] {other_vegetables,
## sausage,
## shopping_bags} => {bottled_water} 0.001423488 0.2641509 0.005388917 2.3899950 14
## [19269] {bottled_water,
## other_vegetables,
## shopping_bags} => {sausage} 0.001423488 0.4666667 0.003050330 4.9671717 14
## [19270] {bottled_water,
## other_vegetables,
## sausage} => {shopping_bags} 0.001423488 0.2800000 0.005083884 2.8418989 14
## [19271] {sausage,
## shopping_bags,
## soda} => {yogurt} 0.001220132 0.2142857 0.005693950 1.5360787 12
## [19272] {sausage,
## shopping_bags,
## yogurt} => {soda} 0.001220132 0.3529412 0.003457041 2.0240096 12
## [19273] {shopping_bags,
## soda,
## yogurt} => {sausage} 0.001220132 0.2857143 0.004270463 3.0411255 12
## [19274] {sausage,
## soda,
## yogurt} => {shopping_bags} 0.001220132 0.2181818 0.005592272 2.2144666 12
## [19275] {sausage,
## shopping_bags,
## soda} => {rolls/buns} 0.002440264 0.4285714 0.005693950 2.3300166 24
## [19276] {rolls/buns,
## sausage,
## shopping_bags} => {soda} 0.002440264 0.4067797 0.005998983 2.3327568 24
## [19277] {rolls/buns,
## shopping_bags,
## soda} => {sausage} 0.002440264 0.3870968 0.006304016 4.1202346 24
## [19278] {rolls/buns,
## sausage,
## soda} => {shopping_bags} 0.002440264 0.2526316 0.009659380 2.5641193 24
## [19279] {sausage,
## shopping_bags,
## soda} => {other_vegetables} 0.001728521 0.3035714 0.005693950 1.5689044 17
## [19280] {other_vegetables,
## sausage,
## shopping_bags} => {soda} 0.001728521 0.3207547 0.005388917 1.8394301 17
## [19281] {other_vegetables,
## shopping_bags,
## soda} => {sausage} 0.001728521 0.3207547 0.005388917 3.4140938 17
## [19282] {other_vegetables,
## sausage,
## soda} => {shopping_bags} 0.001728521 0.2394366 0.007219115 2.4301952 17
## [19283] {sausage,
## shopping_bags,
## whole_milk} => {soda} 0.001118454 0.3437500 0.003253686 1.9713010 11
## [19284] {sausage,
## shopping_bags,
## yogurt} => {other_vegetables} 0.001728521 0.5000000 0.003457041 2.5840778 17
## [19285] {other_vegetables,
## sausage,
## shopping_bags} => {yogurt} 0.001728521 0.3207547 0.005388917 2.2992876 17
## [19286] {other_vegetables,
## shopping_bags,
## yogurt} => {sausage} 0.001728521 0.3207547 0.005388917 3.4140938 17
## [19287] {other_vegetables,
## sausage,
## yogurt} => {shopping_bags} 0.001728521 0.2125000 0.008134215 2.1567982 17
## [19288] {sausage,
## shopping_bags,
## yogurt} => {whole_milk} 0.001220132 0.3529412 0.003457041 1.3812879 12
## [19289] {sausage,
## shopping_bags,
## whole_milk} => {yogurt} 0.001220132 0.3750000 0.003253686 2.6881378 12
## [19290] {shopping_bags,
## whole_milk,
## yogurt} => {sausage} 0.001220132 0.2307692 0.005287239 2.4562937 12
## [19291] {rolls/buns,
## sausage,
## shopping_bags} => {other_vegetables} 0.001728521 0.2881356 0.005998983 1.4891296 17
## [19292] {other_vegetables,
## sausage,
## shopping_bags} => {rolls/buns} 0.001728521 0.3207547 0.005388917 1.7438489 17
## [19293] {other_vegetables,
## rolls/buns,
## shopping_bags} => {sausage} 0.001728521 0.3269231 0.005287239 3.4797494 17
## [19294] {rolls/buns,
## sausage,
## shopping_bags} => {whole_milk} 0.001423488 0.2372881 0.005998983 0.9286625 14
## [19295] {sausage,
## shopping_bags,
## whole_milk} => {rolls/buns} 0.001423488 0.4375000 0.003253686 2.3785586 14
## [19296] {rolls/buns,
## shopping_bags,
## whole_milk} => {sausage} 0.001423488 0.2692308 0.005287239 2.8656760 14
## [19297] {other_vegetables,
## sausage,
## shopping_bags} => {whole_milk} 0.001118454 0.2075472 0.005388917 0.8122668 11
## [19298] {sausage,
## shopping_bags,
## whole_milk} => {other_vegetables} 0.001118454 0.3437500 0.003253686 1.7765535 11
## [19299] {bottled_water,
## shopping_bags,
## soda} => {yogurt} 0.001220132 0.3000000 0.004067107 2.1505102 12
## [19300] {bottled_water,
## shopping_bags,
## yogurt} => {soda} 0.001220132 0.4285714 0.002846975 2.4577259 12
## [19301] {shopping_bags,
## soda,
## yogurt} => {bottled_water} 0.001220132 0.2857143 0.004270463 2.5850966 12
## [19302] {bottled_water,
## shopping_bags,
## soda} => {rolls/buns} 0.001321810 0.3250000 0.004067107 1.7669292 13
## [19303] {bottled_water,
## rolls/buns,
## shopping_bags} => {soda} 0.001321810 0.4333333 0.003050330 2.4850340 13
## [19304] {rolls/buns,
## shopping_bags,
## soda} => {bottled_water} 0.001321810 0.2096774 0.006304016 1.8971273 13
## [19305] {bottled_water,
## shopping_bags,
## soda} => {whole_milk} 0.001016777 0.2500000 0.004067107 0.9784123 10
## [19306] {bottled_water,
## shopping_bags,
## whole_milk} => {soda} 0.001016777 0.4761905 0.002135231 2.7308066 10
## [19307] {bottled_water,
## shopping_bags,
## yogurt} => {rolls/buns} 0.001321810 0.4642857 0.002846975 2.5241846 13
## [19308] {bottled_water,
## rolls/buns,
## shopping_bags} => {yogurt} 0.001321810 0.4333333 0.003050330 3.1062925 13
## [19309] {rolls/buns,
## shopping_bags,
## yogurt} => {bottled_water} 0.001321810 0.3333333 0.003965430 3.0159460 13
## [19310] {bottled_water,
## shopping_bags,
## yogurt} => {other_vegetables} 0.001321810 0.4642857 0.002846975 2.3995008 13
## [19311] {bottled_water,
## other_vegetables,
## shopping_bags} => {yogurt} 0.001321810 0.4333333 0.003050330 3.1062925 13
## [19312] {other_vegetables,
## shopping_bags,
## yogurt} => {bottled_water} 0.001321810 0.2452830 0.005388917 2.2192810 13
## [19313] {bottled_water,
## rolls/buns,
## shopping_bags} => {other_vegetables} 0.001118454 0.3666667 0.003050330 1.8949904 11
## [19314] {bottled_water,
## other_vegetables,
## shopping_bags} => {rolls/buns} 0.001118454 0.3666667 0.003050330 1.9934586 11
## [19315] {other_vegetables,
## rolls/buns,
## shopping_bags} => {bottled_water} 0.001118454 0.2115385 0.005287239 1.9139657 11
## [19316] {root_vegetables,
## shopping_bags,
## tropical_fruit} => {other_vegetables} 0.001423488 0.6086957 0.002338587 3.1458338 14
## [19317] {other_vegetables,
## shopping_bags,
## tropical_fruit} => {root_vegetables} 0.001423488 0.2978723 0.004778851 2.7328120 14
## [19318] {other_vegetables,
## root_vegetables,
## shopping_bags} => {tropical_fruit} 0.001423488 0.2153846 0.006609049 2.0526237 14
## [19319] {shopping_bags,
## soda,
## tropical_fruit} => {yogurt} 0.001118454 0.3055556 0.003660397 2.1903345 11
## [19320] {shopping_bags,
## tropical_fruit,
## yogurt} => {soda} 0.001118454 0.3333333 0.003355363 1.9115646 11
## [19321] {shopping_bags,
## soda,
## yogurt} => {tropical_fruit} 0.001118454 0.2619048 0.004270463 2.4959625 11
## [19322] {shopping_bags,
## soda,
## tropical_fruit} => {other_vegetables} 0.001118454 0.3055556 0.003660397 1.5791586 11
## [19323] {other_vegetables,
## shopping_bags,
## tropical_fruit} => {soda} 0.001118454 0.2340426 0.004778851 1.3421624 11
## [19324] {other_vegetables,
## shopping_bags,
## soda} => {tropical_fruit} 0.001118454 0.2075472 0.005388917 1.9779326 11
## [19325] {shopping_bags,
## soda,
## tropical_fruit} => {whole_milk} 0.001728521 0.4722222 0.003660397 1.8481120 17
## [19326] {shopping_bags,
## tropical_fruit,
## whole_milk} => {soda} 0.001728521 0.3469388 0.004982206 1.9895877 17
## [19327] {shopping_bags,
## soda,
## whole_milk} => {tropical_fruit} 0.001728521 0.2537313 0.006812405 2.4180695 17
## [19328] {soda,
## tropical_fruit,
## whole_milk} => {shopping_bags} 0.001728521 0.2207792 0.007829181 2.2408293 17
## [19329] {shopping_bags,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001626843 0.4848485 0.003355363 2.6359784 16
## [19330] {rolls/buns,
## shopping_bags,
## tropical_fruit} => {yogurt} 0.001626843 0.4848485 0.003355363 3.4755720 16
## [19331] {rolls/buns,
## shopping_bags,
## yogurt} => {tropical_fruit} 0.001626843 0.4102564 0.003965430 3.9097595 16
## [19332] {shopping_bags,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001220132 0.3636364 0.003355363 1.8793293 12
## [19333] {other_vegetables,
## shopping_bags,
## tropical_fruit} => {yogurt} 0.001220132 0.2553191 0.004778851 1.8302215 12
## [19334] {other_vegetables,
## shopping_bags,
## yogurt} => {tropical_fruit} 0.001220132 0.2264151 0.005388917 2.1577446 12
## [19335] {shopping_bags,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001525165 0.4545455 0.003355363 1.7789314 15
## [19336] {shopping_bags,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001525165 0.3061224 0.004982206 2.1943982 15
## [19337] {shopping_bags,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001525165 0.2884615 0.005287239 2.7490496 15
## [19338] {rolls/buns,
## shopping_bags,
## tropical_fruit} => {other_vegetables} 0.001016777 0.3030303 0.003355363 1.5661077 10
## [19339] {other_vegetables,
## shopping_bags,
## tropical_fruit} => {rolls/buns} 0.001016777 0.2127660 0.004778851 1.1567458 10
## [19340] {rolls/buns,
## shopping_bags,
## tropical_fruit} => {whole_milk} 0.001016777 0.3030303 0.003355363 1.1859543 10
## [19341] {shopping_bags,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001016777 0.2040816 0.004982206 1.1095317 10
## [19342] {other_vegetables,
## shopping_bags,
## tropical_fruit} => {whole_milk} 0.001728521 0.3617021 0.004778851 1.4155752 17
## [19343] {shopping_bags,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001728521 0.3469388 0.004982206 1.7930336 17
## [19344] {other_vegetables,
## shopping_bags,
## whole_milk} => {tropical_fruit} 0.001728521 0.2266667 0.007625826 2.1601421 17
## [19345] {root_vegetables,
## shopping_bags,
## soda} => {other_vegetables} 0.001423488 0.5833333 0.002440264 3.0147574 14
## [19346] {other_vegetables,
## root_vegetables,
## shopping_bags} => {soda} 0.001423488 0.2153846 0.006609049 1.2351648 14
## [19347] {other_vegetables,
## shopping_bags,
## soda} => {root_vegetables} 0.001423488 0.2641509 0.005388917 2.4234371 14
## [19348] {root_vegetables,
## shopping_bags,
## soda} => {whole_milk} 0.001423488 0.5833333 0.002440264 2.2829619 14
## [19349] {root_vegetables,
## shopping_bags,
## whole_milk} => {soda} 0.001423488 0.2692308 0.005287239 1.5439560 14
## [19350] {shopping_bags,
## soda,
## whole_milk} => {root_vegetables} 0.001423488 0.2089552 0.006812405 1.9170472 14
## [19351] {root_vegetables,
## shopping_bags,
## yogurt} => {other_vegetables} 0.002135231 0.7241379 0.002948653 3.7424575 21
## [19352] {other_vegetables,
## root_vegetables,
## shopping_bags} => {yogurt} 0.002135231 0.3230769 0.006609049 2.3159341 21
## [19353] {other_vegetables,
## shopping_bags,
## yogurt} => {root_vegetables} 0.002135231 0.3962264 0.005388917 3.6351556 21
## [19354] {root_vegetables,
## shopping_bags,
## yogurt} => {whole_milk} 0.001525165 0.5172414 0.002948653 2.0243012 15
## [19355] {root_vegetables,
## shopping_bags,
## whole_milk} => {yogurt} 0.001525165 0.2884615 0.005287239 2.0677983 15
## [19356] {shopping_bags,
## whole_milk,
## yogurt} => {root_vegetables} 0.001525165 0.2884615 0.005287239 2.6464732 15
## [19357] {rolls/buns,
## root_vegetables,
## shopping_bags} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [19358] {other_vegetables,
## rolls/buns,
## shopping_bags} => {root_vegetables} 0.001220132 0.2307692 0.005287239 2.1171785 12
## [19359] {rolls/buns,
## root_vegetables,
## shopping_bags} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [19360] {root_vegetables,
## shopping_bags,
## whole_milk} => {rolls/buns} 0.001118454 0.2115385 0.005287239 1.1500723 11
## [19361] {rolls/buns,
## shopping_bags,
## whole_milk} => {root_vegetables} 0.001118454 0.2115385 0.005287239 1.9407470 11
## [19362] {other_vegetables,
## root_vegetables,
## shopping_bags} => {whole_milk} 0.002948653 0.4461538 0.006609049 1.7460896 29
## [19363] {root_vegetables,
## shopping_bags,
## whole_milk} => {other_vegetables} 0.002948653 0.5576923 0.005287239 2.8822406 29
## [19364] {other_vegetables,
## shopping_bags,
## whole_milk} => {root_vegetables} 0.002948653 0.3866667 0.007625826 3.5474502 29
## [19365] {shopping_bags,
## soda,
## yogurt} => {rolls/buns} 0.001423488 0.3333333 0.004270463 1.8122351 14
## [19366] {rolls/buns,
## shopping_bags,
## soda} => {yogurt} 0.001423488 0.2258065 0.006304016 1.6186636 14
## [19367] {rolls/buns,
## shopping_bags,
## yogurt} => {soda} 0.001423488 0.3589744 0.003965430 2.0586081 14
## [19368] {shopping_bags,
## soda,
## yogurt} => {other_vegetables} 0.001321810 0.3095238 0.004270463 1.5996672 13
## [19369] {other_vegetables,
## shopping_bags,
## soda} => {yogurt} 0.001321810 0.2452830 0.005388917 1.7582788 13
## [19370] {other_vegetables,
## shopping_bags,
## yogurt} => {soda} 0.001321810 0.2452830 0.005388917 1.4066230 13
## [19371] {shopping_bags,
## soda,
## yogurt} => {whole_milk} 0.001830198 0.4285714 0.004270463 1.6772782 18
## [19372] {shopping_bags,
## soda,
## whole_milk} => {yogurt} 0.001830198 0.2686567 0.006812405 1.9258300 18
## [19373] {shopping_bags,
## whole_milk,
## yogurt} => {soda} 0.001830198 0.3461538 0.005287239 1.9850863 18
## [19374] {rolls/buns,
## shopping_bags,
## soda} => {other_vegetables} 0.001728521 0.2741935 0.006304016 1.4170749 17
## [19375] {other_vegetables,
## shopping_bags,
## soda} => {rolls/buns} 0.001728521 0.3207547 0.005388917 1.7438489 17
## [19376] {other_vegetables,
## rolls/buns,
## shopping_bags} => {soda} 0.001728521 0.3269231 0.005287239 1.8748038 17
## [19377] {rolls/buns,
## shopping_bags,
## soda} => {whole_milk} 0.001423488 0.2258065 0.006304016 0.8837272 14
## [19378] {shopping_bags,
## soda,
## whole_milk} => {rolls/buns} 0.001423488 0.2089552 0.006812405 1.1360280 14
## [19379] {rolls/buns,
## shopping_bags,
## whole_milk} => {soda} 0.001423488 0.2692308 0.005287239 1.5439560 14
## [19380] {other_vegetables,
## shopping_bags,
## soda} => {whole_milk} 0.002338587 0.4339623 0.005388917 1.6983760 23
## [19381] {shopping_bags,
## soda,
## whole_milk} => {other_vegetables} 0.002338587 0.3432836 0.006812405 1.7741429 23
## [19382] {other_vegetables,
## shopping_bags,
## whole_milk} => {soda} 0.002338587 0.3066667 0.007625826 1.7586395 23
## [19383] {rolls/buns,
## shopping_bags,
## yogurt} => {other_vegetables} 0.001525165 0.3846154 0.003965430 1.9877521 15
## [19384] {other_vegetables,
## shopping_bags,
## yogurt} => {rolls/buns} 0.001525165 0.2830189 0.005388917 1.5386902 15
## [19385] {other_vegetables,
## rolls/buns,
## shopping_bags} => {yogurt} 0.001525165 0.2884615 0.005287239 2.0677983 15
## [19386] {rolls/buns,
## shopping_bags,
## yogurt} => {whole_milk} 0.001525165 0.3846154 0.003965430 1.5052496 15
## [19387] {shopping_bags,
## whole_milk,
## yogurt} => {rolls/buns} 0.001525165 0.2884615 0.005287239 1.5682804 15
## [19388] {rolls/buns,
## shopping_bags,
## whole_milk} => {yogurt} 0.001525165 0.2884615 0.005287239 2.0677983 15
## [19389] {other_vegetables,
## shopping_bags,
## yogurt} => {whole_milk} 0.002033554 0.3773585 0.005388917 1.4768487 20
## [19390] {shopping_bags,
## whole_milk,
## yogurt} => {other_vegetables} 0.002033554 0.3846154 0.005287239 1.9877521 20
## [19391] {other_vegetables,
## shopping_bags,
## whole_milk} => {yogurt} 0.002033554 0.2666667 0.007625826 1.9115646 20
## [19392] {other_vegetables,
## rolls/buns,
## shopping_bags} => {whole_milk} 0.001830198 0.3461538 0.005287239 1.3547247 18
## [19393] {rolls/buns,
## shopping_bags,
## whole_milk} => {other_vegetables} 0.001830198 0.3461538 0.005287239 1.7889769 18
## [19394] {other_vegetables,
## shopping_bags,
## whole_milk} => {rolls/buns} 0.001830198 0.2400000 0.007625826 1.3048093 18
## [19395] {bottled_water,
## sausage,
## tropical_fruit} => {yogurt} 0.001321810 0.4814815 0.002745297 3.4514361 13
## [19396] {bottled_water,
## sausage,
## yogurt} => {tropical_fruit} 0.001321810 0.3333333 0.003965430 3.1766796 13
## [19397] {sausage,
## tropical_fruit,
## yogurt} => {bottled_water} 0.001321810 0.2826087 0.004677173 2.5569977 13
## [19398] {bottled_water,
## sausage,
## tropical_fruit} => {other_vegetables} 0.001220132 0.4444444 0.002745297 2.2969580 12
## [19399] {bottled_water,
## other_vegetables,
## sausage} => {tropical_fruit} 0.001220132 0.2400000 0.005083884 2.2872093 12
## [19400] {other_vegetables,
## sausage,
## tropical_fruit} => {bottled_water} 0.001220132 0.2033898 0.005998983 1.8402383 12
## [19401] {bottled_water,
## sausage,
## tropical_fruit} => {whole_milk} 0.001118454 0.4074074 0.002745297 1.5944496 11
## [19402] {bottled_water,
## sausage,
## whole_milk} => {tropical_fruit} 0.001118454 0.2972973 0.003762074 2.8332548 11
## [19403] {bottled_water,
## root_vegetables,
## sausage} => {rolls/buns} 0.001016777 0.5263158 0.001931876 2.8614239 10
## [19404] {bottled_water,
## rolls/buns,
## sausage} => {root_vegetables} 0.001016777 0.2564103 0.003965430 2.3524206 10
## [19405] {rolls/buns,
## root_vegetables,
## sausage} => {bottled_water} 0.001016777 0.2040816 0.004982206 1.8464976 10
## [19406] {bottled_water,
## rolls/buns,
## root_vegetables} => {sausage} 0.001016777 0.2439024 0.004168785 2.5960828 10
## [19407] {bottled_water,
## root_vegetables,
## sausage} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [19408] {bottled_water,
## other_vegetables,
## sausage} => {root_vegetables} 0.001118454 0.2200000 0.005083884 2.0183769 11
## [19409] {bottled_water,
## sausage,
## soda} => {yogurt} 0.002033554 0.5000000 0.004067107 3.5841837 20
## [19410] {bottled_water,
## sausage,
## yogurt} => {soda} 0.002033554 0.5128205 0.003965430 2.9408687 20
## [19411] {sausage,
## soda,
## yogurt} => {bottled_water} 0.002033554 0.3636364 0.005592272 3.2901229 20
## [19412] {bottled_water,
## soda,
## yogurt} => {sausage} 0.002033554 0.2739726 0.007422471 2.9161478 20
## [19413] {bottled_water,
## sausage,
## soda} => {rolls/buns} 0.001423488 0.3500000 0.004067107 1.9028469 14
## [19414] {bottled_water,
## rolls/buns,
## sausage} => {soda} 0.001423488 0.3589744 0.003965430 2.0586081 14
## [19415] {bottled_water,
## rolls/buns,
## soda} => {sausage} 0.001423488 0.2089552 0.006812405 2.2241067 14
## [19416] {bottled_water,
## sausage,
## soda} => {other_vegetables} 0.001728521 0.4250000 0.004067107 2.1964661 17
## [19417] {bottled_water,
## other_vegetables,
## sausage} => {soda} 0.001728521 0.3400000 0.005083884 1.9497959 17
## [19418] {other_vegetables,
## sausage,
## soda} => {bottled_water} 0.001728521 0.2394366 0.007219115 2.1663838 17
## [19419] {bottled_water,
## other_vegetables,
## soda} => {sausage} 0.001728521 0.3035714 0.005693950 3.2311959 17
## [19420] {bottled_water,
## sausage,
## soda} => {whole_milk} 0.001220132 0.3000000 0.004067107 1.1740947 12
## [19421] {bottled_water,
## sausage,
## whole_milk} => {soda} 0.001220132 0.3243243 0.003762074 1.8599007 12
## [19422] {bottled_water,
## sausage,
## yogurt} => {rolls/buns} 0.001321810 0.3333333 0.003965430 1.8122351 13
## [19423] {bottled_water,
## rolls/buns,
## sausage} => {yogurt} 0.001321810 0.3333333 0.003965430 2.3894558 13
## [19424] {rolls/buns,
## sausage,
## yogurt} => {bottled_water} 0.001321810 0.2203390 0.005998983 1.9935914 13
## [19425] {bottled_water,
## sausage,
## yogurt} => {other_vegetables} 0.002236909 0.5641026 0.003965430 2.9153698 22
## [19426] {bottled_water,
## other_vegetables,
## sausage} => {yogurt} 0.002236909 0.4400000 0.005083884 3.1540816 22
## [19427] {other_vegetables,
## sausage,
## yogurt} => {bottled_water} 0.002236909 0.2750000 0.008134215 2.4881555 22
## [19428] {bottled_water,
## other_vegetables,
## yogurt} => {sausage} 0.002236909 0.2750000 0.008134215 2.9270833 22
## [19429] {bottled_water,
## sausage,
## yogurt} => {whole_milk} 0.001423488 0.3589744 0.003965430 1.4048997 14
## [19430] {bottled_water,
## sausage,
## whole_milk} => {yogurt} 0.001423488 0.3783784 0.003762074 2.7123552 14
## [19431] {bottled_water,
## rolls/buns,
## sausage} => {other_vegetables} 0.002236909 0.5641026 0.003965430 2.9153698 22
## [19432] {bottled_water,
## other_vegetables,
## sausage} => {rolls/buns} 0.002236909 0.4400000 0.005083884 2.3921504 22
## [19433] {other_vegetables,
## rolls/buns,
## sausage} => {bottled_water} 0.002236909 0.2528736 0.008845958 2.2879591 22
## [19434] {bottled_water,
## other_vegetables,
## rolls/buns} => {sausage} 0.002236909 0.3055556 0.007320793 3.2523148 22
## [19435] {bottled_water,
## rolls/buns,
## sausage} => {whole_milk} 0.001321810 0.3333333 0.003965430 1.3045497 13
## [19436] {bottled_water,
## sausage,
## whole_milk} => {rolls/buns} 0.001321810 0.3513514 0.003762074 1.9101938 13
## [19437] {bottled_water,
## other_vegetables,
## sausage} => {whole_milk} 0.001728521 0.3400000 0.005083884 1.3306407 17
## [19438] {bottled_water,
## sausage,
## whole_milk} => {other_vegetables} 0.001728521 0.4594595 0.003762074 2.3745580 17
## [19439] {root_vegetables,
## sausage,
## tropical_fruit} => {yogurt} 0.001626843 0.4571429 0.003558719 3.2769679 16
## [19440] {sausage,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001626843 0.3478261 0.004677173 3.1911097 16
## [19441] {root_vegetables,
## sausage,
## yogurt} => {tropical_fruit} 0.001626843 0.3137255 0.005185562 2.9898161 16
## [19442] {root_vegetables,
## tropical_fruit,
## yogurt} => {sausage} 0.001626843 0.2000000 0.008134215 2.1287879 16
## [19443] {root_vegetables,
## sausage,
## tropical_fruit} => {rolls/buns} 0.001016777 0.2857143 0.003558719 1.5533444 10
## [19444] {rolls/buns,
## sausage,
## tropical_fruit} => {root_vegetables} 0.001016777 0.2702703 0.003762074 2.4795785 10
## [19445] {rolls/buns,
## root_vegetables,
## sausage} => {tropical_fruit} 0.001016777 0.2040816 0.004982206 1.9449059 10
## [19446] {root_vegetables,
## sausage,
## tropical_fruit} => {other_vegetables} 0.001728521 0.4857143 0.003558719 2.5102470 17
## [19447] {other_vegetables,
## sausage,
## tropical_fruit} => {root_vegetables} 0.001728521 0.2881356 0.005998983 2.6434828 17
## [19448] {other_vegetables,
## root_vegetables,
## sausage} => {tropical_fruit} 0.001728521 0.2537313 0.006812405 2.4180695 17
## [19449] {root_vegetables,
## sausage,
## tropical_fruit} => {whole_milk} 0.002745297 0.7714286 0.003558719 3.0191007 27
## [19450] {sausage,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.002745297 0.3802817 0.007219115 3.4888717 27
## [19451] {root_vegetables,
## sausage,
## whole_milk} => {tropical_fruit} 0.002745297 0.3552632 0.007727504 3.3856717 27
## [19452] {root_vegetables,
## tropical_fruit,
## whole_milk} => {sausage} 0.002745297 0.2288136 0.011997966 2.4354777 27
## [19453] {sausage,
## soda,
## tropical_fruit} => {rolls/buns} 0.001118454 0.2820513 0.003965430 1.5334297 11
## [19454] {rolls/buns,
## sausage,
## tropical_fruit} => {soda} 0.001118454 0.2972973 0.003762074 1.7049090 11
## [19455] {rolls/buns,
## soda,
## tropical_fruit} => {sausage} 0.001118454 0.2075472 0.005388917 2.2091195 11
## [19456] {sausage,
## soda,
## tropical_fruit} => {other_vegetables} 0.001525165 0.3846154 0.003965430 1.9877521 15
## [19457] {other_vegetables,
## sausage,
## tropical_fruit} => {soda} 0.001525165 0.2542373 0.005998983 1.4579730 15
## [19458] {other_vegetables,
## sausage,
## soda} => {tropical_fruit} 0.001525165 0.2112676 0.007219115 2.0133885 15
## [19459] {other_vegetables,
## soda,
## tropical_fruit} => {sausage} 0.001525165 0.2112676 0.007219115 2.2487196 15
## [19460] {sausage,
## soda,
## tropical_fruit} => {whole_milk} 0.001830198 0.4615385 0.003965430 1.8062996 18
## [19461] {sausage,
## tropical_fruit,
## whole_milk} => {soda} 0.001830198 0.2535211 0.007219115 1.4538661 18
## [19462] {sausage,
## soda,
## whole_milk} => {tropical_fruit} 0.001830198 0.2727273 0.006710727 2.5991015 18
## [19463] {soda,
## tropical_fruit,
## whole_milk} => {sausage} 0.001830198 0.2337662 0.007829181 2.4881936 18
## [19464] {sausage,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001423488 0.3043478 0.004677173 1.6546495 14
## [19465] {rolls/buns,
## sausage,
## tropical_fruit} => {yogurt} 0.001423488 0.3783784 0.003762074 2.7123552 14
## [19466] {rolls/buns,
## sausage,
## yogurt} => {tropical_fruit} 0.001423488 0.2372881 0.005998983 2.2613651 14
## [19467] {sausage,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.002236909 0.4782609 0.004677173 2.4717266 22
## [19468] {other_vegetables,
## sausage,
## tropical_fruit} => {yogurt} 0.002236909 0.3728814 0.005998983 2.6729505 22
## [19469] {other_vegetables,
## sausage,
## yogurt} => {tropical_fruit} 0.002236909 0.2750000 0.008134215 2.6207607 22
## [19470] {sausage,
## tropical_fruit,
## yogurt} => {whole_milk} 0.003152008 0.6739130 0.004677173 2.6374591 31
## [19471] {sausage,
## tropical_fruit,
## whole_milk} => {yogurt} 0.003152008 0.4366197 0.007219115 3.1298505 31
## [19472] {sausage,
## whole_milk,
## yogurt} => {tropical_fruit} 0.003152008 0.3604651 0.008744281 3.4352465 31
## [19473] {tropical_fruit,
## whole_milk,
## yogurt} => {sausage} 0.003152008 0.2080537 0.015149975 2.2145109 31
## [19474] {rolls/buns,
## sausage,
## tropical_fruit} => {other_vegetables} 0.001626843 0.4324324 0.003762074 2.2348781 16
## [19475] {other_vegetables,
## sausage,
## tropical_fruit} => {rolls/buns} 0.001626843 0.2711864 0.005998983 1.4743608 16
## [19476] {other_vegetables,
## rolls/buns,
## tropical_fruit} => {sausage} 0.001626843 0.2077922 0.007829181 2.2117277 16
## [19477] {rolls/buns,
## sausage,
## tropical_fruit} => {whole_milk} 0.002236909 0.5945946 0.003762074 2.3270346 22
## [19478] {sausage,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.002236909 0.3098592 0.007219115 1.6846129 22
## [19479] {rolls/buns,
## sausage,
## whole_milk} => {tropical_fruit} 0.002236909 0.2391304 0.009354347 2.2789223 22
## [19480] {rolls/buns,
## tropical_fruit,
## whole_milk} => {sausage} 0.002236909 0.2037037 0.010981190 2.1682099 22
## [19481] {other_vegetables,
## sausage,
## tropical_fruit} => {whole_milk} 0.003050330 0.5084746 0.005998983 1.9899910 30
## [19482] {sausage,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.003050330 0.4225352 0.007219115 2.1837277 30
## [19483] {other_vegetables,
## sausage,
## whole_milk} => {tropical_fruit} 0.003050330 0.3000000 0.010167768 2.8590116 30
## [19484] {root_vegetables,
## sausage,
## soda} => {rolls/buns} 0.001118454 0.3055556 0.003660397 1.6612155 11
## [19485] {rolls/buns,
## root_vegetables,
## sausage} => {soda} 0.001118454 0.2244898 0.004982206 1.2873803 11
## [19486] {rolls/buns,
## root_vegetables,
## soda} => {sausage} 0.001118454 0.2291667 0.004880529 2.4392361 11
## [19487] {root_vegetables,
## sausage,
## soda} => {other_vegetables} 0.001830198 0.5000000 0.003660397 2.5840778 18
## [19488] {other_vegetables,
## root_vegetables,
## sausage} => {soda} 0.001830198 0.2686567 0.006812405 1.5406640 18
## [19489] {other_vegetables,
## sausage,
## soda} => {root_vegetables} 0.001830198 0.2535211 0.007219115 2.3259144 18
## [19490] {other_vegetables,
## root_vegetables,
## soda} => {sausage} 0.001830198 0.2222222 0.008235892 2.3653199 18
## [19491] {root_vegetables,
## sausage,
## soda} => {whole_milk} 0.001728521 0.4722222 0.003660397 1.8481120 17
## [19492] {root_vegetables,
## sausage,
## whole_milk} => {soda} 0.001728521 0.2236842 0.007727504 1.2827605 17
## [19493] {sausage,
## soda,
## whole_milk} => {root_vegetables} 0.001728521 0.2575758 0.006710727 2.3631134 17
## [19494] {root_vegetables,
## soda,
## whole_milk} => {sausage} 0.001728521 0.2125000 0.008134215 2.2618371 17
## [19495] {root_vegetables,
## sausage,
## yogurt} => {rolls/buns} 0.001830198 0.3529412 0.005185562 1.9188372 18
## [19496] {rolls/buns,
## root_vegetables,
## sausage} => {yogurt} 0.001830198 0.3673469 0.004982206 2.6332778 18
## [19497] {rolls/buns,
## sausage,
## yogurt} => {root_vegetables} 0.001830198 0.3050847 0.005998983 2.7989818 18
## [19498] {rolls/buns,
## root_vegetables,
## yogurt} => {sausage} 0.001830198 0.2535211 0.007219115 2.6984635 18
## [19499] {root_vegetables,
## sausage,
## yogurt} => {other_vegetables} 0.002541942 0.4901961 0.005185562 2.5334096 25
## [19500] {other_vegetables,
## root_vegetables,
## sausage} => {yogurt} 0.002541942 0.3731343 0.006812405 2.6747639 25
## [19501] {other_vegetables,
## sausage,
## yogurt} => {root_vegetables} 0.002541942 0.3125000 0.008134215 2.8670126 25
## [19502] {root_vegetables,
## sausage,
## yogurt} => {whole_milk} 0.003253686 0.6274510 0.005185562 2.4556229 32
## [19503] {root_vegetables,
## sausage,
## whole_milk} => {yogurt} 0.003253686 0.4210526 0.007727504 3.0182599 32
## [19504] {sausage,
## whole_milk,
## yogurt} => {root_vegetables} 0.003253686 0.3720930 0.008744281 3.4137452 32
## [19505] {root_vegetables,
## whole_milk,
## yogurt} => {sausage} 0.003253686 0.2237762 0.014539908 2.3818606 32
## [19506] {rolls/buns,
## root_vegetables,
## sausage} => {other_vegetables} 0.002338587 0.4693878 0.004982206 2.4258689 23
## [19507] {other_vegetables,
## root_vegetables,
## sausage} => {rolls/buns} 0.002338587 0.3432836 0.006812405 1.8663317 23
## [19508] {other_vegetables,
## rolls/buns,
## sausage} => {root_vegetables} 0.002338587 0.2643678 0.008845958 2.4254267 23
## [19509] {rolls/buns,
## root_vegetables,
## sausage} => {whole_milk} 0.002541942 0.5102041 0.004982206 1.9967597 25
## [19510] {root_vegetables,
## sausage,
## whole_milk} => {rolls/buns} 0.002541942 0.3289474 0.007727504 1.7883899 25
## [19511] {rolls/buns,
## sausage,
## whole_milk} => {root_vegetables} 0.002541942 0.2717391 0.009354347 2.4930544 25
## [19512] {rolls/buns,
## root_vegetables,
## whole_milk} => {sausage} 0.002541942 0.2000000 0.012709710 2.1287879 25
## [19513] {other_vegetables,
## root_vegetables,
## sausage} => {whole_milk} 0.003457041 0.5074627 0.006812405 1.9860308 34
## [19514] {root_vegetables,
## sausage,
## whole_milk} => {other_vegetables} 0.003457041 0.4473684 0.007727504 2.3120696 34
## [19515] {other_vegetables,
## sausage,
## whole_milk} => {root_vegetables} 0.003457041 0.3400000 0.010167768 3.1193097 34
## [19516] {sausage,
## soda,
## yogurt} => {rolls/buns} 0.001830198 0.3272727 0.005592272 1.7792854 18
## [19517] {rolls/buns,
## sausage,
## yogurt} => {soda} 0.001830198 0.3050847 0.005998983 1.7495676 18
## [19518] {rolls/buns,
## soda,
## yogurt} => {sausage} 0.001830198 0.2117647 0.008642603 2.2540107 18
## [19519] {sausage,
## soda,
## yogurt} => {other_vegetables} 0.002440264 0.4363636 0.005592272 2.2551951 24
## [19520] {other_vegetables,
## sausage,
## soda} => {yogurt} 0.002440264 0.3380282 0.007219115 2.4231101 24
## [19521] {other_vegetables,
## sausage,
## yogurt} => {soda} 0.002440264 0.3000000 0.008134215 1.7204082 24
## [19522] {other_vegetables,
## soda,
## yogurt} => {sausage} 0.002440264 0.2926829 0.008337570 3.1152993 24
## [19523] {sausage,
## soda,
## yogurt} => {whole_milk} 0.002236909 0.4000000 0.005592272 1.5654596 22
## [19524] {sausage,
## soda,
## whole_milk} => {yogurt} 0.002236909 0.3333333 0.006710727 2.3894558 22
## [19525] {sausage,
## whole_milk,
## yogurt} => {soda} 0.002236909 0.2558140 0.008744281 1.4670147 22
## [19526] {soda,
## whole_milk,
## yogurt} => {sausage} 0.002236909 0.2135922 0.010472801 2.2734628 22
## [19527] {rolls/buns,
## sausage,
## soda} => {other_vegetables} 0.002745297 0.2842105 0.009659380 1.4688442 27
## [19528] {other_vegetables,
## sausage,
## soda} => {rolls/buns} 0.002745297 0.3802817 0.007219115 2.0674795 27
## [19529] {other_vegetables,
## rolls/buns,
## sausage} => {soda} 0.002745297 0.3103448 0.008845958 1.7797326 27
## [19530] {other_vegetables,
## rolls/buns,
## soda} => {sausage} 0.002745297 0.2783505 0.009862735 2.9627460 27
## [19531] {rolls/buns,
## sausage,
## soda} => {whole_milk} 0.002236909 0.2315789 0.009659380 0.9063187 22
## [19532] {sausage,
## soda,
## whole_milk} => {rolls/buns} 0.002236909 0.3333333 0.006710727 1.8122351 22
## [19533] {rolls/buns,
## sausage,
## whole_milk} => {soda} 0.002236909 0.2391304 0.009354347 1.3713398 22
## [19534] {rolls/buns,
## soda,
## whole_milk} => {sausage} 0.002236909 0.2528736 0.008845958 2.6915709 22
## [19535] {other_vegetables,
## sausage,
## soda} => {whole_milk} 0.002643620 0.3661972 0.007219115 1.4331672 26
## [19536] {sausage,
## soda,
## whole_milk} => {other_vegetables} 0.002643620 0.3939394 0.006710727 2.0359401 26
## [19537] {other_vegetables,
## sausage,
## whole_milk} => {soda} 0.002643620 0.2600000 0.010167768 1.4910204 26
## [19538] {rolls/buns,
## sausage,
## yogurt} => {other_vegetables} 0.002236909 0.3728814 0.005998983 1.9271088 22
## [19539] {other_vegetables,
## sausage,
## yogurt} => {rolls/buns} 0.002236909 0.2750000 0.008134215 1.4950940 22
## [19540] {other_vegetables,
## rolls/buns,
## sausage} => {yogurt} 0.002236909 0.2528736 0.008845958 1.8126906 22
## [19541] {rolls/buns,
## sausage,
## yogurt} => {whole_milk} 0.002745297 0.4576271 0.005998983 1.7909919 27
## [19542] {sausage,
## whole_milk,
## yogurt} => {rolls/buns} 0.002745297 0.3139535 0.008744281 1.7068726 27
## [19543] {rolls/buns,
## sausage,
## whole_milk} => {yogurt} 0.002745297 0.2934783 0.009354347 2.1037600 27
## [19544] {other_vegetables,
## sausage,
## yogurt} => {whole_milk} 0.003762074 0.4625000 0.008134215 1.8100627 37
## [19545] {sausage,
## whole_milk,
## yogurt} => {other_vegetables} 0.003762074 0.4302326 0.008744281 2.2235088 37
## [19546] {other_vegetables,
## sausage,
## whole_milk} => {yogurt} 0.003762074 0.3700000 0.010167768 2.6522959 37
## [19547] {other_vegetables,
## rolls/buns,
## sausage} => {whole_milk} 0.003050330 0.3448276 0.008845958 1.3495341 30
## [19548] {rolls/buns,
## sausage,
## whole_milk} => {other_vegetables} 0.003050330 0.3260870 0.009354347 1.6852681 30
## [19549] {other_vegetables,
## sausage,
## whole_milk} => {rolls/buns} 0.003050330 0.3000000 0.010167768 1.6310116 30
## [19550] {bottled_water,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.002236909 0.4888889 0.004575496 3.5045351 22
## [19551] {bottled_water,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.002236909 0.3142857 0.007117438 2.8833955 22
## [19552] {bottled_water,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.002236909 0.5789474 0.003863752 5.5173909 22
## [19553] {root_vegetables,
## tropical_fruit,
## yogurt} => {bottled_water} 0.002236909 0.2750000 0.008134215 2.4881555 22
## [19554] {bottled_water,
## root_vegetables,
## tropical_fruit} => {rolls/buns} 0.001220132 0.2666667 0.004575496 1.4497881 12
## [19555] {bottled_water,
## rolls/buns,
## tropical_fruit} => {root_vegetables} 0.001220132 0.2264151 0.005388917 2.0772318 12
## [19556] {bottled_water,
## rolls/buns,
## root_vegetables} => {tropical_fruit} 0.001220132 0.2926829 0.004168785 2.7892796 12
## [19557] {rolls/buns,
## root_vegetables,
## tropical_fruit} => {bottled_water} 0.001220132 0.2068966 0.005897306 1.8719665 12
## [19558] {bottled_water,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.002643620 0.5777778 0.004575496 2.9860454 26
## [19559] {bottled_water,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.002643620 0.4262295 0.006202339 3.9104172 26
## [19560] {bottled_water,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.002643620 0.3768116 0.007015760 3.5910291 26
## [19561] {other_vegetables,
## root_vegetables,
## tropical_fruit} => {bottled_water} 0.002643620 0.2148760 0.012302999 1.9441636 26
## [19562] {bottled_water,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.002541942 0.5555556 0.004575496 2.1742495 25
## [19563] {bottled_water,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.002541942 0.3164557 0.008032537 2.9033039 25
## [19564] {bottled_water,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.002541942 0.3472222 0.007320793 3.3090412 25
## [19565] {root_vegetables,
## tropical_fruit,
## whole_milk} => {bottled_water} 0.002541942 0.2118644 0.011997966 1.9169148 25
## [19566] {bottled_water,
## soda,
## tropical_fruit} => {yogurt} 0.002440264 0.4705882 0.005185562 3.3733493 24
## [19567] {bottled_water,
## tropical_fruit,
## yogurt} => {soda} 0.002440264 0.3428571 0.007117438 1.9661808 24
## [19568] {bottled_water,
## soda,
## yogurt} => {tropical_fruit} 0.002440264 0.3287671 0.007422471 3.1331634 24
## [19569] {soda,
## tropical_fruit,
## yogurt} => {bottled_water} 0.002440264 0.3692308 0.006609049 3.3407402 24
## [19570] {bottled_water,
## soda,
## tropical_fruit} => {rolls/buns} 0.001321810 0.2549020 0.005185562 1.3858269 13
## [19571] {bottled_water,
## rolls/buns,
## tropical_fruit} => {soda} 0.001321810 0.2452830 0.005388917 1.4066230 13
## [19572] {rolls/buns,
## soda,
## tropical_fruit} => {bottled_water} 0.001321810 0.2452830 0.005388917 2.2192810 13
## [19573] {bottled_water,
## soda,
## tropical_fruit} => {other_vegetables} 0.001525165 0.2941176 0.005185562 1.5200457 15
## [19574] {bottled_water,
## other_vegetables,
## tropical_fruit} => {soda} 0.001525165 0.2459016 0.006202339 1.4101706 15
## [19575] {bottled_water,
## other_vegetables,
## soda} => {tropical_fruit} 0.001525165 0.2678571 0.005693950 2.5526890 15
## [19576] {other_vegetables,
## soda,
## tropical_fruit} => {bottled_water} 0.001525165 0.2112676 0.007219115 1.9115151 15
## [19577] {bottled_water,
## soda,
## tropical_fruit} => {whole_milk} 0.001525165 0.2941176 0.005185562 1.1510732 15
## [19578] {bottled_water,
## soda,
## whole_milk} => {tropical_fruit} 0.001525165 0.2027027 0.007524148 1.9317646 15
## [19579] {bottled_water,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.002440264 0.3428571 0.007117438 1.8640133 24
## [19580] {bottled_water,
## rolls/buns,
## tropical_fruit} => {yogurt} 0.002440264 0.4528302 0.005388917 3.2460531 24
## [19581] {bottled_water,
## rolls/buns,
## yogurt} => {tropical_fruit} 0.002440264 0.3428571 0.007117438 3.2674419 24
## [19582] {rolls/buns,
## tropical_fruit,
## yogurt} => {bottled_water} 0.002440264 0.2790698 0.008744281 2.5249781 24
## [19583] {bottled_water,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.003050330 0.4285714 0.007117438 2.2149238 30
## [19584] {bottled_water,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.003050330 0.4918033 0.006202339 3.5254266 30
## [19585] {bottled_water,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.003050330 0.3750000 0.008134215 3.5737645 30
## [19586] {other_vegetables,
## tropical_fruit,
## yogurt} => {bottled_water} 0.003050330 0.2479339 0.012302999 2.2432656 30
## [19587] {bottled_water,
## tropical_fruit,
## yogurt} => {whole_milk} 0.003660397 0.5142857 0.007117438 2.0127338 36
## [19588] {bottled_water,
## tropical_fruit,
## whole_milk} => {yogurt} 0.003660397 0.4556962 0.008032537 3.2665978 36
## [19589] {bottled_water,
## whole_milk,
## yogurt} => {tropical_fruit} 0.003660397 0.3789474 0.009659380 3.6113831 36
## [19590] {tropical_fruit,
## whole_milk,
## yogurt} => {bottled_water} 0.003660397 0.2416107 0.015149975 2.1860548 36
## [19591] {bottled_water,
## rolls/buns,
## tropical_fruit} => {other_vegetables} 0.001525165 0.2830189 0.005388917 1.4626855 15
## [19592] {bottled_water,
## other_vegetables,
## tropical_fruit} => {rolls/buns} 0.001525165 0.2459016 0.006202339 1.3368948 15
## [19593] {bottled_water,
## other_vegetables,
## rolls/buns} => {tropical_fruit} 0.001525165 0.2083333 0.007320793 1.9854247 15
## [19594] {bottled_water,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.002846975 0.5283019 0.005388917 2.0675882 28
## [19595] {bottled_water,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.002846975 0.3544304 0.008032537 1.9269335 28
## [19596] {bottled_water,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.002846975 0.3255814 0.008744281 3.1028033 28
## [19597] {rolls/buns,
## tropical_fruit,
## whole_milk} => {bottled_water} 0.002846975 0.2592593 0.010981190 2.3457358 28
## [19598] {bottled_water,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.003558719 0.5737705 0.006202339 2.2455363 35
## [19599] {bottled_water,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.003558719 0.4430380 0.008032537 2.2896892 35
## [19600] {bottled_water,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.003558719 0.3301887 0.010777834 3.1467109 35
## [19601] {other_vegetables,
## tropical_fruit,
## whole_milk} => {bottled_water} 0.003558719 0.2083333 0.017081851 1.8849663 35
## [19602] {bottled_water,
## root_vegetables,
## soda} => {other_vegetables} 0.001423488 0.3684211 0.003863752 1.9040573 14
## [19603] {bottled_water,
## other_vegetables,
## root_vegetables} => {soda} 0.001423488 0.2028986 0.007015760 1.1635611 14
## [19604] {bottled_water,
## other_vegetables,
## soda} => {root_vegetables} 0.001423488 0.2500000 0.005693950 2.2936101 14
## [19605] {bottled_water,
## root_vegetables,
## yogurt} => {rolls/buns} 0.001220132 0.3157895 0.003863752 1.7168543 12
## [19606] {bottled_water,
## rolls/buns,
## root_vegetables} => {yogurt} 0.001220132 0.2926829 0.004168785 2.0980587 12
## [19607] {bottled_water,
## root_vegetables,
## yogurt} => {other_vegetables} 0.002033554 0.5263158 0.003863752 2.7200819 20
## [19608] {bottled_water,
## other_vegetables,
## root_vegetables} => {yogurt} 0.002033554 0.2898551 0.007015760 2.0777876 20
## [19609] {bottled_water,
## other_vegetables,
## yogurt} => {root_vegetables} 0.002033554 0.2500000 0.008134215 2.2936101 20
## [19610] {bottled_water,
## root_vegetables,
## yogurt} => {whole_milk} 0.002338587 0.6052632 0.003863752 2.3687876 23
## [19611] {bottled_water,
## root_vegetables,
## whole_milk} => {yogurt} 0.002338587 0.3194444 0.007320793 2.2898951 23
## [19612] {bottled_water,
## whole_milk,
## yogurt} => {root_vegetables} 0.002338587 0.2421053 0.009659380 2.2211803 23
## [19613] {bottled_water,
## rolls/buns,
## root_vegetables} => {other_vegetables} 0.002236909 0.5365854 0.004168785 2.7731566 22
## [19614] {bottled_water,
## other_vegetables,
## root_vegetables} => {rolls/buns} 0.002236909 0.3188406 0.007015760 1.7334423 22
## [19615] {bottled_water,
## other_vegetables,
## rolls/buns} => {root_vegetables} 0.002236909 0.3055556 0.007320793 2.8033012 22
## [19616] {bottled_water,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.002338587 0.5609756 0.004168785 2.1954616 23
## [19617] {bottled_water,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.002338587 0.3194444 0.007320793 1.7367253 23
## [19618] {bottled_water,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.002338587 0.2674419 0.008744281 2.4536294 23
## [19619] {bottled_water,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.003965430 0.5652174 0.007015760 2.2120625 39
## [19620] {bottled_water,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.003965430 0.5416667 0.007320793 2.7994176 39
## [19621] {bottled_water,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.003965430 0.3679245 0.010777834 3.3755016 39
## [19622] {bottled_water,
## soda,
## yogurt} => {rolls/buns} 0.003050330 0.4109589 0.007422471 2.2342625 30
## [19623] {bottled_water,
## rolls/buns,
## soda} => {yogurt} 0.003050330 0.4477612 0.006812405 3.2097167 30
## [19624] {bottled_water,
## rolls/buns,
## yogurt} => {soda} 0.003050330 0.4285714 0.007117438 2.4577259 30
## [19625] {rolls/buns,
## soda,
## yogurt} => {bottled_water} 0.003050330 0.3529412 0.008642603 3.1933546 30
## [19626] {bottled_water,
## soda,
## yogurt} => {other_vegetables} 0.002135231 0.2876712 0.007422471 1.4867297 21
## [19627] {bottled_water,
## other_vegetables,
## soda} => {yogurt} 0.002135231 0.3750000 0.005693950 2.6881378 21
## [19628] {bottled_water,
## other_vegetables,
## yogurt} => {soda} 0.002135231 0.2625000 0.008134215 1.5053571 21
## [19629] {other_vegetables,
## soda,
## yogurt} => {bottled_water} 0.002135231 0.2560976 0.008337570 2.3171293 21
## [19630] {bottled_water,
## soda,
## yogurt} => {whole_milk} 0.002846975 0.3835616 0.007422471 1.5011257 28
## [19631] {bottled_water,
## soda,
## whole_milk} => {yogurt} 0.002846975 0.3783784 0.007524148 2.7123552 28
## [19632] {bottled_water,
## whole_milk,
## yogurt} => {soda} 0.002846975 0.2947368 0.009659380 1.6902256 28
## [19633] {soda,
## whole_milk,
## yogurt} => {bottled_water} 0.002846975 0.2718447 0.010472801 2.4596065 28
## [19634] {bottled_water,
## rolls/buns,
## soda} => {other_vegetables} 0.002033554 0.2985075 0.006812405 1.5427330 20
## [19635] {bottled_water,
## other_vegetables,
## soda} => {rolls/buns} 0.002033554 0.3571429 0.005693950 1.9416805 20
## [19636] {bottled_water,
## other_vegetables,
## rolls/buns} => {soda} 0.002033554 0.2777778 0.007320793 1.5929705 20
## [19637] {other_vegetables,
## rolls/buns,
## soda} => {bottled_water} 0.002033554 0.2061856 0.009862735 1.8655336 20
## [19638] {bottled_water,
## rolls/buns,
## soda} => {whole_milk} 0.001830198 0.2686567 0.006812405 1.0514281 18
## [19639] {bottled_water,
## soda,
## whole_milk} => {rolls/buns} 0.001830198 0.2432432 0.007524148 1.3224418 18
## [19640] {bottled_water,
## rolls/buns,
## whole_milk} => {soda} 0.001830198 0.2093023 0.008744281 1.2002848 18
## [19641] {rolls/buns,
## soda,
## whole_milk} => {bottled_water} 0.001830198 0.2068966 0.008845958 1.8719665 18
## [19642] {bottled_water,
## other_vegetables,
## soda} => {whole_milk} 0.002135231 0.3750000 0.005693950 1.4676184 21
## [19643] {bottled_water,
## soda,
## whole_milk} => {other_vegetables} 0.002135231 0.2837838 0.007524148 1.4666387 21
## [19644] {bottled_water,
## rolls/buns,
## yogurt} => {other_vegetables} 0.002541942 0.3571429 0.007117438 1.8457698 25
## [19645] {bottled_water,
## other_vegetables,
## yogurt} => {rolls/buns} 0.002541942 0.3125000 0.008134215 1.6989704 25
## [19646] {bottled_water,
## other_vegetables,
## rolls/buns} => {yogurt} 0.002541942 0.3472222 0.007320793 2.4890164 25
## [19647] {other_vegetables,
## rolls/buns,
## yogurt} => {bottled_water} 0.002541942 0.2212389 0.011489578 2.0017341 25
## [19648] {bottled_water,
## rolls/buns,
## yogurt} => {whole_milk} 0.002745297 0.3857143 0.007117438 1.5095503 27
## [19649] {bottled_water,
## whole_milk,
## yogurt} => {rolls/buns} 0.002745297 0.2842105 0.009659380 1.5451689 27
## [19650] {bottled_water,
## rolls/buns,
## whole_milk} => {yogurt} 0.002745297 0.3139535 0.008744281 2.2505339 27
## [19651] {bottled_water,
## other_vegetables,
## yogurt} => {whole_milk} 0.003965430 0.4875000 0.008134215 1.9079039 39
## [19652] {bottled_water,
## whole_milk,
## yogurt} => {other_vegetables} 0.003965430 0.4105263 0.009659380 2.1216639 39
## [19653] {bottled_water,
## other_vegetables,
## whole_milk} => {yogurt} 0.003965430 0.3679245 0.010777834 2.6374182 39
## [19654] {bottled_water,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.002643620 0.3611111 0.007320793 1.4132621 26
## [19655] {bottled_water,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.002643620 0.3023256 0.008744281 1.5624656 26
## [19656] {bottled_water,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.002643620 0.2452830 0.010777834 1.3335315 26
## [19657] {root_vegetables,
## soda,
## tropical_fruit} => {yogurt} 0.001220132 0.3243243 0.003762074 2.3248759 12
## [19658] {root_vegetables,
## soda,
## yogurt} => {tropical_fruit} 0.001220132 0.2553191 0.004778851 2.4332014 12
## [19659] {root_vegetables,
## soda,
## tropical_fruit} => {rolls/buns} 0.001220132 0.3243243 0.003762074 1.7632558 12
## [19660] {rolls/buns,
## root_vegetables,
## tropical_fruit} => {soda} 0.001220132 0.2068966 0.005897306 1.1864884 12
## [19661] {rolls/buns,
## soda,
## tropical_fruit} => {root_vegetables} 0.001220132 0.2264151 0.005388917 2.0772318 12
## [19662] {rolls/buns,
## root_vegetables,
## soda} => {tropical_fruit} 0.001220132 0.2500000 0.004880529 2.3825097 12
## [19663] {root_vegetables,
## soda,
## tropical_fruit} => {other_vegetables} 0.002338587 0.6216216 0.003762074 3.2126372 23
## [19664] {other_vegetables,
## soda,
## tropical_fruit} => {root_vegetables} 0.002338587 0.3239437 0.007219115 2.9720018 23
## [19665] {other_vegetables,
## root_vegetables,
## soda} => {tropical_fruit} 0.002338587 0.2839506 0.008235892 2.7060604 23
## [19666] {root_vegetables,
## soda,
## tropical_fruit} => {whole_milk} 0.001626843 0.4324324 0.003762074 1.6923888 16
## [19667] {soda,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001626843 0.2077922 0.007829181 1.9063772 16
## [19668] {root_vegetables,
## soda,
## whole_milk} => {tropical_fruit} 0.001626843 0.2000000 0.008134215 1.9060078 16
## [19669] {root_vegetables,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.002745297 0.3375000 0.008134215 1.8348881 27
## [19670] {rolls/buns,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.002745297 0.4655172 0.005897306 3.3369986 27
## [19671] {rolls/buns,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.002745297 0.3139535 0.008744281 2.8803475 27
## [19672] {rolls/buns,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.002745297 0.3802817 0.007219115 3.6240992 27
## [19673] {root_vegetables,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.004982206 0.6125000 0.008134215 3.1654953 49
## [19674] {other_vegetables,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.004982206 0.4049587 0.012302999 2.9028926 49
## [19675] {other_vegetables,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.004982206 0.4049587 0.012302999 3.7152692 49
## [19676] {other_vegetables,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.004982206 0.3858268 0.012913066 3.6769441 49
## [19677] {root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.005693950 0.7000000 0.008134215 2.7395543 56
## [19678] {root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.005693950 0.4745763 0.011997966 3.4019370 56
## [19679] {tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.005693950 0.3758389 0.015149975 3.4481118 56
## [19680] {root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.005693950 0.3916084 0.014539908 3.7320432 56
## [19681] {rolls/buns,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.003558719 0.6034483 0.005897306 3.1187146 35
## [19682] {other_vegetables,
## root_vegetables,
## tropical_fruit} => {rolls/buns} 0.003558719 0.2892562 0.012302999 1.5726007 35
## [19683] {other_vegetables,
## rolls/buns,
## tropical_fruit} => {root_vegetables} 0.003558719 0.4545455 0.007829181 4.1702001 35
## [19684] {other_vegetables,
## rolls/buns,
## root_vegetables} => {tropical_fruit} 0.003558719 0.2916667 0.012201322 2.7795946 35
## [19685] {rolls/buns,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.003762074 0.6379310 0.005897306 2.4966382 37
## [19686] {root_vegetables,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.003762074 0.3135593 0.011997966 1.7047296 37
## [19687] {rolls/buns,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.003762074 0.3425926 0.010981190 3.1430953 37
## [19688] {rolls/buns,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.003762074 0.2960000 0.012709710 2.8208915 37
## [19689] {other_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.007015760 0.5702479 0.012302999 2.2317503 69
## [19690] {root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.007015760 0.5847458 0.011997966 3.0220571 69
## [19691] {other_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.007015760 0.4107143 0.017081851 3.7680737 69
## [19692] {other_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.007015760 0.3026316 0.023182511 2.8840907 69
## [19693] {soda,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.002338587 0.3538462 0.006609049 1.9237573 23
## [19694] {rolls/buns,
## soda,
## tropical_fruit} => {yogurt} 0.002338587 0.4339623 0.005388917 3.1108009 23
## [19695] {rolls/buns,
## tropical_fruit,
## yogurt} => {soda} 0.002338587 0.2674419 0.008744281 1.5336972 23
## [19696] {rolls/buns,
## soda,
## yogurt} => {tropical_fruit} 0.002338587 0.2705882 0.008642603 2.5787164 23
## [19697] {soda,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.002033554 0.3076923 0.006609049 1.5902017 20
## [19698] {other_vegetables,
## soda,
## tropical_fruit} => {yogurt} 0.002033554 0.2816901 0.007219115 2.0192584 20
## [19699] {other_vegetables,
## soda,
## yogurt} => {tropical_fruit} 0.002033554 0.2439024 0.008337570 2.3243997 20
## [19700] {soda,
## tropical_fruit,
## yogurt} => {whole_milk} 0.003152008 0.4769231 0.006609049 1.8665095 31
## [19701] {soda,
## tropical_fruit,
## whole_milk} => {yogurt} 0.003152008 0.4025974 0.007829181 2.8859661 31
## [19702] {tropical_fruit,
## whole_milk,
## yogurt} => {soda} 0.003152008 0.2080537 0.015149975 1.1931242 31
## [19703] {soda,
## whole_milk,
## yogurt} => {tropical_fruit} 0.003152008 0.3009709 0.010472801 2.8682641 31
## [19704] {rolls/buns,
## soda,
## tropical_fruit} => {other_vegetables} 0.002236909 0.4150943 0.005388917 2.1452721 22
## [19705] {other_vegetables,
## soda,
## tropical_fruit} => {rolls/buns} 0.002236909 0.3098592 0.007219115 1.6846129 22
## [19706] {other_vegetables,
## rolls/buns,
## tropical_fruit} => {soda} 0.002236909 0.2857143 0.007829181 1.6384840 22
## [19707] {other_vegetables,
## rolls/buns,
## soda} => {tropical_fruit} 0.002236909 0.2268041 0.009862735 2.1614521 22
## [19708] {rolls/buns,
## soda,
## tropical_fruit} => {whole_milk} 0.002135231 0.3962264 0.005388917 1.5506911 21
## [19709] {soda,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.002135231 0.2727273 0.007829181 1.4827378 21
## [19710] {rolls/buns,
## soda,
## whole_milk} => {tropical_fruit} 0.002135231 0.2413793 0.008845958 2.3003542 21
## [19711] {other_vegetables,
## soda,
## tropical_fruit} => {whole_milk} 0.003050330 0.4225352 0.007219115 1.6536545 30
## [19712] {soda,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.003050330 0.3896104 0.007829181 2.0135671 30
## [19713] {other_vegetables,
## soda,
## whole_milk} => {tropical_fruit} 0.003050330 0.2189781 0.013929842 2.0868698 30
## [19714] {rolls/buns,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.003762074 0.4302326 0.008744281 2.2235088 37
## [19715] {other_vegetables,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.003762074 0.3057851 0.012302999 1.6624636 37
## [19716] {other_vegetables,
## rolls/buns,
## tropical_fruit} => {yogurt} 0.003762074 0.4805195 0.007829181 3.4445402 37
## [19717] {other_vegetables,
## rolls/buns,
## yogurt} => {tropical_fruit} 0.003762074 0.3274336 0.011489578 3.1204552 37
## [19718] {rolls/buns,
## tropical_fruit,
## yogurt} => {whole_milk} 0.004880529 0.5581395 0.008744281 2.1843622 48
## [19719] {tropical_fruit,
## whole_milk,
## yogurt} => {rolls/buns} 0.004880529 0.3221477 0.015149975 1.7514219 48
## [19720] {rolls/buns,
## tropical_fruit,
## whole_milk} => {yogurt} 0.004880529 0.4444444 0.010981190 3.1859410 48
## [19721] {rolls/buns,
## whole_milk,
## yogurt} => {tropical_fruit} 0.004880529 0.3137255 0.015556685 2.9898161 48
## [19722] {other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.007625826 0.6198347 0.012302999 2.4258155 75
## [19723] {tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.007625826 0.5033557 0.015149975 2.6014206 75
## [19724] {other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.007625826 0.4464286 0.017081851 3.2001640 75
## [19725] {other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.007625826 0.3424658 0.022267412 3.2637119 75
## [19726] {other_vegetables,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.004067107 0.5194805 0.007829181 2.0330644 40
## [19727] {rolls/buns,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.004067107 0.3703704 0.010981190 1.9141317 40
## [19728] {other_vegetables,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.004067107 0.2380952 0.017081851 1.2944537 40
## [19729] {other_vegetables,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.004067107 0.2272727 0.017895272 2.1659179 40
## [19730] {root_vegetables,
## soda,
## yogurt} => {rolls/buns} 0.001321810 0.2765957 0.004778851 1.5037696 13
## [19731] {rolls/buns,
## root_vegetables,
## soda} => {yogurt} 0.001321810 0.2708333 0.004880529 1.9414328 13
## [19732] {root_vegetables,
## soda,
## yogurt} => {other_vegetables} 0.002440264 0.5106383 0.004778851 2.6390582 24
## [19733] {other_vegetables,
## root_vegetables,
## soda} => {yogurt} 0.002440264 0.2962963 0.008235892 2.1239607 24
## [19734] {other_vegetables,
## soda,
## yogurt} => {root_vegetables} 0.002440264 0.2926829 0.008337570 2.6852020 24
## [19735] {root_vegetables,
## soda,
## yogurt} => {whole_milk} 0.002440264 0.5106383 0.004778851 1.9984591 24
## [19736] {root_vegetables,
## soda,
## whole_milk} => {yogurt} 0.002440264 0.3000000 0.008134215 2.1505102 24
## [19737] {soda,
## whole_milk,
## yogurt} => {root_vegetables} 0.002440264 0.2330097 0.010472801 2.1377337 24
## [19738] {rolls/buns,
## root_vegetables,
## soda} => {other_vegetables} 0.002745297 0.5625000 0.004880529 2.9070875 27
## [19739] {other_vegetables,
## root_vegetables,
## soda} => {rolls/buns} 0.002745297 0.3333333 0.008235892 1.8122351 27
## [19740] {other_vegetables,
## rolls/buns,
## root_vegetables} => {soda} 0.002745297 0.2250000 0.012201322 1.2903061 27
## [19741] {other_vegetables,
## rolls/buns,
## soda} => {root_vegetables} 0.002745297 0.2783505 0.009862735 2.5537102 27
## [19742] {rolls/buns,
## root_vegetables,
## soda} => {whole_milk} 0.002440264 0.5000000 0.004880529 1.9568245 24
## [19743] {root_vegetables,
## soda,
## whole_milk} => {rolls/buns} 0.002440264 0.3000000 0.008134215 1.6310116 24
## [19744] {rolls/buns,
## soda,
## whole_milk} => {root_vegetables} 0.002440264 0.2758621 0.008845958 2.5308801 24
## [19745] {other_vegetables,
## root_vegetables,
## soda} => {whole_milk} 0.004473818 0.5432099 0.008235892 2.1259328 44
## [19746] {root_vegetables,
## soda,
## whole_milk} => {other_vegetables} 0.004473818 0.5500000 0.008134215 2.8424855 44
## [19747] {other_vegetables,
## soda,
## whole_milk} => {root_vegetables} 0.004473818 0.3211679 0.013929842 2.9465356 44
## [19748] {rolls/buns,
## root_vegetables,
## yogurt} => {other_vegetables} 0.004168785 0.5774648 0.007219115 2.9844278 41
## [19749] {other_vegetables,
## root_vegetables,
## yogurt} => {rolls/buns} 0.004168785 0.3228346 0.012913066 1.7551568 41
## [19750] {other_vegetables,
## rolls/buns,
## root_vegetables} => {yogurt} 0.004168785 0.3416667 0.012201322 2.4491922 41
## [19751] {other_vegetables,
## rolls/buns,
## yogurt} => {root_vegetables} 0.004168785 0.3628319 0.011489578 3.3287792 41
## [19752] {rolls/buns,
## root_vegetables,
## yogurt} => {whole_milk} 0.004677173 0.6478873 0.007219115 2.5356036 46
## [19753] {root_vegetables,
## whole_milk,
## yogurt} => {rolls/buns} 0.004677173 0.3216783 0.014539908 1.7488703 46
## [19754] {rolls/buns,
## root_vegetables,
## whole_milk} => {yogurt} 0.004677173 0.3680000 0.012709710 2.6379592 46
## [19755] {rolls/buns,
## whole_milk,
## yogurt} => {root_vegetables} 0.004677173 0.3006536 0.015556685 2.7583285 46
## [19756] {other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.007829181 0.6062992 0.012913066 2.3728423 77
## [19757] {root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.007829181 0.5384615 0.014539908 2.7828530 77
## [19758] {other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.007829181 0.3377193 0.023182511 2.4208960 77
## [19759] {other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.007829181 0.3515982 0.022267412 3.2257165 77
## [19760] {other_vegetables,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.006202339 0.5083333 0.012201322 1.9894383 61
## [19761] {rolls/buns,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.006202339 0.4880000 0.012709710 2.5220599 61
## [19762] {other_vegetables,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.006202339 0.2675439 0.023182511 1.4545571 61
## [19763] {other_vegetables,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.006202339 0.3465909 0.017895272 3.1797776 61
## [19764] {rolls/buns,
## soda,
## yogurt} => {other_vegetables} 0.003355363 0.3882353 0.008642603 2.0064604 33
## [19765] {other_vegetables,
## soda,
## yogurt} => {rolls/buns} 0.003355363 0.4024390 0.008337570 2.1879424 33
## [19766] {other_vegetables,
## rolls/buns,
## soda} => {yogurt} 0.003355363 0.3402062 0.009862735 2.4387229 33
## [19767] {other_vegetables,
## rolls/buns,
## yogurt} => {soda} 0.003355363 0.2920354 0.011489578 1.6747336 33
## [19768] {rolls/buns,
## soda,
## yogurt} => {whole_milk} 0.002846975 0.3294118 0.008642603 1.2892020 28
## [19769] {soda,
## whole_milk,
## yogurt} => {rolls/buns} 0.002846975 0.2718447 0.010472801 1.4779393 28
## [19770] {rolls/buns,
## soda,
## whole_milk} => {yogurt} 0.002846975 0.3218391 0.008845958 2.3070608 28
## [19771] {other_vegetables,
## soda,
## yogurt} => {whole_milk} 0.004372140 0.5243902 0.008337570 2.0522794 43
## [19772] {soda,
## whole_milk,
## yogurt} => {other_vegetables} 0.004372140 0.4174757 0.010472801 2.1575795 43
## [19773] {other_vegetables,
## soda,
## whole_milk} => {yogurt} 0.004372140 0.3138686 0.013929842 2.2499255 43
## [19774] {other_vegetables,
## rolls/buns,
## soda} => {whole_milk} 0.004372140 0.4432990 0.009862735 1.7349166 43
## [19775] {rolls/buns,
## soda,
## whole_milk} => {other_vegetables} 0.004372140 0.4942529 0.008845958 2.5543757 43
## [19776] {other_vegetables,
## soda,
## whole_milk} => {rolls/buns} 0.004372140 0.3138686 0.013929842 1.7064112 43
## [19777] {other_vegetables,
## rolls/buns,
## whole_milk} => {soda} 0.004372140 0.2443182 0.017895272 1.4010900 43
## [19778] {other_vegetables,
## rolls/buns,
## yogurt} => {whole_milk} 0.005998983 0.5221239 0.011489578 2.0434097 59
## [19779] {rolls/buns,
## whole_milk,
## yogurt} => {other_vegetables} 0.005998983 0.3856209 0.015556685 1.9929489 59
## [19780] {other_vegetables,
## whole_milk,
## yogurt} => {rolls/buns} 0.005998983 0.2694064 0.022267412 1.4646832 59
## [19781] {other_vegetables,
## rolls/buns,
## whole_milk} => {yogurt} 0.005998983 0.3352273 0.017895272 2.4030322 59
## [19782] {other_vegetables,
## rice,
## root_vegetables,
## yogurt} => {whole_milk} 0.001321810 0.9285714 0.001423488 3.6341027 13
## [19783] {rice,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.9285714 0.001423488 4.7990016 13
## [19784] {other_vegetables,
## rice,
## root_vegetables,
## whole_milk} => {yogurt} 0.001321810 0.7222222 0.001830198 5.1771542 13
## [19785] {other_vegetables,
## rice,
## whole_milk,
## yogurt} => {root_vegetables} 0.001321810 0.8666667 0.001525165 7.9511816 13
## [19786] {citrus_fruit,
## herbs,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [19787] {citrus_fruit,
## herbs,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [19788] {citrus_fruit,
## herbs,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001016777 0.7142857 0.001423488 6.5531716 10
## [19789] {herbs,
## other_vegetables,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001016777 0.4166667 0.002440264 5.0342957 10
## [19790] {herbs,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [19791] {herbs,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [19792] {herbs,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001016777 0.7692308 0.001321810 7.0572618 10
## [19793] {herbs,
## other_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001016777 0.4166667 0.002440264 3.9708495 10
## [19794] {herbs,
## other_vegetables,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [19795] {herbs,
## rolls/buns,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [19796] {herbs,
## other_vegetables,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001016777 0.4166667 0.002440264 2.2652939 10
## [19797] {herbs,
## other_vegetables,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001016777 0.7692308 0.001321810 7.0572618 10
## [19798] {other_vegetables,
## soft_cheese,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [19799] {soft_cheese,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [19800] {other_vegetables,
## soft_cheese,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.7857143 0.001423488 5.6322886 11
## [19801] {other_vegetables,
## soft_cheese,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.6875000 0.001626843 6.5519016 11
## [19802] {grapes,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [19803] {grapes,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 1.0000000 0.001016777 5.1681555 10
## [19804] {grapes,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [19805] {grapes,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.5882353 0.001728521 5.6059052 10
## [19806] {frozen_meals,
## pip_fruit,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [19807] {frozen_meals,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.6666667 0.001525165 4.7789116 10
## [19808] {frozen_meals,
## pip_fruit,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.7142857 0.001423488 6.8071705 10
## [19809] {frozen_meals,
## tropical_fruit,
## whole_milk,
## yogurt} => {pip_fruit} 0.001016777 0.6250000 0.001626843 8.2619288 10
## [19810] {pip_fruit,
## tropical_fruit,
## whole_milk,
## yogurt} => {frozen_meals} 0.001016777 0.2702703 0.003762074 9.5272692 10
## [19811] {hard_cheese,
## other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [19812] {hard_cheese,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [19813] {hard_cheese,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001016777 0.5555556 0.001830198 5.0969113 10
## [19814] {hard_cheese,
## other_vegetables,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.4761905 0.002135231 6.6430260 10
## [19815] {hard_cheese,
## other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.001220132 0.9230769 0.001321810 3.6125991 12
## [19816] {hard_cheese,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [19817] {hard_cheese,
## other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.001220132 0.5714286 0.002135231 4.0962099 12
## [19818] {hard_cheese,
## other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.001220132 0.6000000 0.002033554 5.5046642 12
## [19819] {butter_milk,
## other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [19820] {butter_milk,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [19821] {butter_milk,
## other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [19822] {butter_milk,
## other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.001016777 0.4545455 0.002236909 4.1702001 10
## [19823] {ham,
## pip_fruit,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001016777 1.0000000 0.001016777 5.1681555 10
## [19824] {ham,
## other_vegetables,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [19825] {ham,
## other_vegetables,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001016777 0.8333333 0.001220132 7.9416990 10
## [19826] {ham,
## other_vegetables,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001016777 0.5882353 0.001728521 7.7759330 10
## [19827] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## yogurt} => {ham} 0.001016777 0.2857143 0.003558719 10.9765625 10
## [19828] {ham,
## other_vegetables,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [19829] {ham,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001118454 1.0000000 0.001118454 5.1681555 11
## [19830] {ham,
## other_vegetables,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001118454 0.7333333 0.001525165 6.9886951 11
## [19831] {ham,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001118454 0.5789474 0.001931876 7.6531551 11
## [19832] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {ham} 0.001118454 0.2340426 0.004778851 8.9914395 11
## [19833] {ham,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [19834] {ham,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.7500000 0.001626843 3.8761167 12
## [19835] {ham,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001220132 0.6315789 0.001931876 4.5273899 12
## [19836] {ham,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001220132 0.6000000 0.002033554 5.7180233 12
## [19837] {butter,
## sliced_cheese,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [19838] {butter,
## sliced_cheese,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.9090909 0.001118454 6.5166976 10
## [19839] {butter,
## sliced_cheese,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.7142857 0.001423488 6.8071705 10
## [19840] {sliced_cheese,
## tropical_fruit,
## whole_milk,
## yogurt} => {butter} 0.001016777 0.5555556 0.001830198 10.0254842 10
## [19841] {butter,
## tropical_fruit,
## whole_milk,
## yogurt} => {sliced_cheese} 0.001016777 0.3030303 0.003355363 12.3664026 10
## [19842] {other_vegetables,
## root_vegetables,
## sliced_cheese,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [19843] {root_vegetables,
## sliced_cheese,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [19844] {other_vegetables,
## sliced_cheese,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001016777 0.6666667 0.001525165 6.1162935 10
## [19845] {other_vegetables,
## root_vegetables,
## sliced_cheese,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.4166667 0.002440264 5.8126478 10
## [19846] {root_vegetables,
## sliced_cheese,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [19847] {root_vegetables,
## sliced_cheese,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.7142857 0.001423488 5.1202624 10
## [19848] {sliced_cheese,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001016777 0.5555556 0.001830198 5.0969113 10
## [19849] {root_vegetables,
## sliced_cheese,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.6666667 0.001525165 6.3533592 10
## [19850] {other_vegetables,
## root_vegetables,
## sliced_cheese,
## tropical_fruit} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [19851] {root_vegetables,
## sliced_cheese,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [19852] {other_vegetables,
## sliced_cheese,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001016777 0.6250000 0.001626843 5.7340252 10
## [19853] {other_vegetables,
## root_vegetables,
## sliced_cheese,
## whole_milk} => {tropical_fruit} 0.001016777 0.4166667 0.002440264 3.9708495 10
## [19854] {other_vegetables,
## sliced_cheese,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [19855] {sliced_cheese,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [19856] {other_vegetables,
## sliced_cheese,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.6875000 0.001626843 4.9282526 11
## [19857] {other_vegetables,
## sliced_cheese,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.5789474 0.001931876 5.5173909 11
## [19858] {other_vegetables,
## root_vegetables,
## sliced_cheese,
## yogurt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [19859] {root_vegetables,
## sliced_cheese,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [19860] {other_vegetables,
## root_vegetables,
## sliced_cheese,
## whole_milk} => {yogurt} 0.001118454 0.4583333 0.002440264 3.2855017 11
## [19861] {other_vegetables,
## sliced_cheese,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.5789474 0.001931876 5.3115181 11
## [19862] {citrus_fruit,
## oil,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [19863] {citrus_fruit,
## oil,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [19864] {citrus_fruit,
## oil,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001016777 0.6250000 0.001626843 5.7340252 10
## [19865] {oil,
## other_vegetables,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001016777 0.3846154 0.002643620 4.6470421 10
## [19866] {oil,
## root_vegetables,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001016777 0.9090909 0.001118454 4.6983232 10
## [19867] {oil,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001016777 0.5882353 0.001728521 4.2166867 10
## [19868] {oil,
## other_vegetables,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001016777 0.6666667 0.001525165 6.1162935 10
## [19869] {oil,
## other_vegetables,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001016777 0.7142857 0.001423488 6.8071705 10
## [19870] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## yogurt} => {oil} 0.001016777 0.2040816 0.004982206 7.2722567 10
## [19871] {oil,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 1.0000000 0.001118454 3.9136490 11
## [19872] {oil,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.7333333 0.001525165 5.2568027 11
## [19873] {oil,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.7857143 0.001423488 7.2084888 11
## [19874] {oil,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.7333333 0.001525165 6.9886951 11
## [19875] {oil,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [19876] {oil,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001321810 0.8666667 0.001525165 4.4790681 13
## [19877] {oil,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001321810 0.8666667 0.001525165 7.9511816 13
## [19878] {oil,
## other_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001321810 0.5000000 0.002643620 4.7650194 13
## [19879] {oil,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [19880] {oil,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.7857143 0.001423488 4.0606936 11
## [19881] {oil,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.7333333 0.001525165 5.2568027 11
## [19882] {oil,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.5000000 0.002236909 4.7650194 11
## [19883] {oil,
## other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.001423488 1.0000000 0.001423488 3.9136490 14
## [19884] {oil,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001423488 0.9333333 0.001525165 4.8236118 14
## [19885] {oil,
## other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.001423488 0.5384615 0.002643620 3.8598901 14
## [19886] {oil,
## other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.001423488 0.6363636 0.002236909 5.8382802 14
## [19887] {butter,
## onions,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001321810 0.8666667 0.001525165 3.3918292 13
## [19888] {butter,
## onions,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001321810 0.7647059 0.001728521 3.9521189 13
## [19889] {butter,
## onions,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001321810 0.7222222 0.001830198 6.6259847 13
## [19890] {onions,
## other_vegetables,
## root_vegetables,
## whole_milk} => {butter} 0.001321810 0.4062500 0.003253686 7.3311353 13
## [19891] {butter,
## other_vegetables,
## root_vegetables,
## whole_milk} => {onions} 0.001321810 0.3170732 0.004168785 10.2243103 13
## [19892] {onions,
## other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [19893] {onions,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001118454 0.7857143 0.001423488 4.0606936 11
## [19894] {onions,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001118454 0.5238095 0.002135231 4.8056592 11
## [19895] {onions,
## other_vegetables,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.3437500 0.003253686 4.7954344 11
## [19896] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {onions} 0.001118454 0.2156863 0.005185562 6.9549984 11
## [19897] {onions,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [19898] {onions,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [19899] {onions,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001016777 0.5263158 0.001931876 4.8286528 10
## [19900] {onions,
## other_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001016777 0.3125000 0.003253686 2.9781371 10
## [19901] {onions,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [19902] {onions,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [19903] {onions,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.5789474 0.001931876 4.1501074 11
## [19904] {onions,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.4583333 0.002440264 4.3679344 11
## [19905] {onions,
## other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [19906] {onions,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [19907] {onions,
## other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.001016777 0.3125000 0.003253686 2.2401148 10
## [19908] {onions,
## other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.001016777 0.4166667 0.002440264 3.8226835 10
## [19909] {onions,
## other_vegetables,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [19910] {onions,
## rolls/buns,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [19911] {onions,
## other_vegetables,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001016777 0.3125000 0.003253686 1.6989704 10
## [19912] {onions,
## other_vegetables,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001016777 0.7142857 0.001423488 6.5531716 10
## [19913] {other_vegetables,
## root_vegetables,
## sugar,
## yogurt} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [19914] {root_vegetables,
## sugar,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [19915] {other_vegetables,
## root_vegetables,
## sugar,
## whole_milk} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [19916] {other_vegetables,
## sugar,
## whole_milk,
## yogurt} => {root_vegetables} 0.001016777 0.5882353 0.001728521 5.3967296 10
## [19917] {other_vegetables,
## root_vegetables,
## waffles,
## yogurt} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [19918] {root_vegetables,
## waffles,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [19919] {other_vegetables,
## root_vegetables,
## waffles,
## whole_milk} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [19920] {other_vegetables,
## waffles,
## whole_milk,
## yogurt} => {root_vegetables} 0.001016777 0.6250000 0.001626843 5.7340252 10
## [19921] {long_life_bakery_product,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [19922] {long_life_bakery_product,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [19923] {long_life_bakery_product,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001220132 0.7058824 0.001728521 5.0600240 12
## [19924] {long_life_bakery_product,
## other_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001220132 0.4615385 0.002643620 6.4386252 12
## [19925] {other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {long_life_bakery_product} 0.001220132 0.2181818 0.005592272 5.8310277 12
## [19926] {cream_cheese_,
## curd,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [19927] {cream_cheese_,
## curd,
## other_vegetables,
## whipped/sour_cream} => {yogurt} 0.001016777 0.9090909 0.001118454 6.5166976 10
## [19928] {cream_cheese_,
## curd,
## other_vegetables,
## yogurt} => {whipped/sour_cream} 0.001016777 0.5882353 0.001728521 8.2060909 10
## [19929] {cream_cheese_,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {curd} 0.001016777 0.5882353 0.001728521 11.0406376 10
## [19930] {curd,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {cream_cheese_} 0.001016777 0.5882353 0.001728521 14.8340875 10
## [19931] {cream_cheese_,
## curd,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [19932] {cream_cheese_,
## curd,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.8461538 0.001321810 6.0655416 11
## [19933] {cream_cheese_,
## curd,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.6470588 0.001728521 9.0267000 11
## [19934] {cream_cheese_,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {curd} 0.001118454 0.4782609 0.002338587 8.9765184 11
## [19935] {curd,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {cream_cheese_} 0.001118454 0.4074074 0.002745297 10.2739791 11
## [19936] {cream_cheese_,
## curd,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [19937] {cream_cheese_,
## curd,
## other_vegetables,
## root_vegetables} => {yogurt} 0.001016777 0.5882353 0.001728521 4.2166867 10
## [19938] {cream_cheese_,
## curd,
## other_vegetables,
## yogurt} => {root_vegetables} 0.001016777 0.5882353 0.001728521 5.3967296 10
## [19939] {cream_cheese_,
## other_vegetables,
## root_vegetables,
## yogurt} => {curd} 0.001016777 0.4761905 0.002135231 8.9376590 10
## [19940] {curd,
## other_vegetables,
## root_vegetables,
## yogurt} => {cream_cheese_} 0.001016777 0.4166667 0.002440264 10.5074786 10
## [19941] {cream_cheese_,
## curd,
## other_vegetables,
## yogurt} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [19942] {cream_cheese_,
## curd,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [19943] {cream_cheese_,
## curd,
## other_vegetables,
## whole_milk} => {yogurt} 0.001220132 0.7058824 0.001728521 5.0600240 12
## [19944] {cream_cheese_,
## other_vegetables,
## whole_milk,
## yogurt} => {curd} 0.001220132 0.3529412 0.003457041 6.6243826 12
## [19945] {curd,
## other_vegetables,
## whole_milk,
## yogurt} => {cream_cheese_} 0.001220132 0.3333333 0.003660397 8.4059829 12
## [19946] {citrus_fruit,
## cream_cheese_,
## domestic_eggs,
## other_vegetables} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [19947] {citrus_fruit,
## cream_cheese_,
## domestic_eggs,
## whole_milk} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [19948] {cream_cheese_,
## domestic_eggs,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001118454 0.6111111 0.001830198 7.3836336 11
## [19949] {citrus_fruit,
## cream_cheese_,
## other_vegetables,
## whole_milk} => {domestic_eggs} 0.001118454 0.5789474 0.001931876 9.1249157 11
## [19950] {citrus_fruit,
## domestic_eggs,
## other_vegetables,
## whole_milk} => {cream_cheese_} 0.001118454 0.3928571 0.002846975 9.9070513 11
## [19951] {citrus_fruit,
## cream_cheese_,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [19952] {citrus_fruit,
## cream_cheese_,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001118454 0.9166667 0.001220132 4.7374759 11
## [19953] {cream_cheese_,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.001118454 0.4782609 0.002338587 5.7784959 11
## [19954] {citrus_fruit,
## cream_cheese_,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.5789474 0.001931876 8.0765211 11
## [19955] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {cream_cheese_} 0.001118454 0.3055556 0.003660397 7.7054843 11
## [19956] {cream_cheese_,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [19957] {cream_cheese_,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.7857143 0.001423488 5.6322886 11
## [19958] {cream_cheese_,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.4782609 0.002338587 4.3877758 11
## [19959] {cream_cheese_,
## root_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.4782609 0.002338587 6.6719087 11
## [19960] {root_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {cream_cheese_} 0.001118454 0.3055556 0.003660397 7.7054843 11
## [19961] {cream_cheese_,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [19962] {cream_cheese_,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [19963] {cream_cheese_,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001220132 0.5217391 0.002338587 3.7400177 12
## [19964] {cream_cheese_,
## other_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001220132 0.3529412 0.003457041 4.9236546 12
## [19965] {other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {cream_cheese_} 0.001220132 0.2181818 0.005592272 5.5020979 12
## [19966] {cream_cheese_,
## other_vegetables,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [19967] {cream_cheese_,
## pip_fruit,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [19968] {cream_cheese_,
## other_vegetables,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001016777 0.5882353 0.001728521 5.3967296 10
## [19969] {cream_cheese_,
## other_vegetables,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001016777 0.4166667 0.002440264 5.5079525 10
## [19970] {cream_cheese_,
## other_vegetables,
## pip_fruit,
## yogurt} => {whole_milk} 0.001118454 0.9166667 0.001220132 3.5875116 11
## [19971] {cream_cheese_,
## pip_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [19972] {cream_cheese_,
## other_vegetables,
## pip_fruit,
## whole_milk} => {yogurt} 0.001118454 0.6470588 0.001728521 4.6383553 11
## [19973] {cream_cheese_,
## other_vegetables,
## whole_milk,
## yogurt} => {pip_fruit} 0.001118454 0.3235294 0.003457041 4.2767631 11
## [19974] {other_vegetables,
## pip_fruit,
## whole_milk,
## yogurt} => {cream_cheese_} 0.001118454 0.2200000 0.005083884 5.5479487 11
## [19975] {cream_cheese_,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [19976] {cream_cheese_,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.8000000 0.001525165 4.1345244 12
## [19977] {cream_cheese_,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001220132 0.6666667 0.001830198 4.7789116 12
## [19978] {cream_cheese_,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001220132 0.3529412 0.003457041 3.3635431 12
## [19979] {cream_cheese_,
## other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [19980] {cream_cheese_,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.5652174 0.002338587 2.9211314 13
## [19981] {cream_cheese_,
## other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.001321810 0.5416667 0.002440264 3.8828656 13
## [19982] {cream_cheese_,
## other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.001321810 0.3823529 0.003457041 3.5078742 13
## [19983] {chicken,
## domestic_eggs,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001220132 0.8000000 0.001525165 3.1309192 12
## [19984] {chicken,
## domestic_eggs,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [19985] {chicken,
## domestic_eggs,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001220132 0.5000000 0.002440264 4.5872201 12
## [19986] {chicken,
## other_vegetables,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001220132 0.4137931 0.002948653 6.5218833 12
## [19987] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## whole_milk} => {chicken} 0.001220132 0.2666667 0.004575496 6.2148499 12
## [19988] {chicken,
## domestic_eggs,
## other_vegetables,
## rolls/buns} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [19989] {chicken,
## domestic_eggs,
## rolls/buns,
## whole_milk} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [19990] {chicken,
## domestic_eggs,
## other_vegetables,
## whole_milk} => {rolls/buns} 0.001016777 0.4166667 0.002440264 2.2652939 10
## [19991] {chicken,
## other_vegetables,
## rolls/buns,
## whole_milk} => {domestic_eggs} 0.001016777 0.3571429 0.002846975 5.6290064 10
## [19992] {domestic_eggs,
## other_vegetables,
## rolls/buns,
## whole_milk} => {chicken} 0.001016777 0.3703704 0.002745297 8.6317360 10
## [19993] {chicken,
## other_vegetables,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [19994] {chicken,
## rolls/buns,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [19995] {chicken,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001118454 0.4782609 0.002338587 2.6001634 11
## [19996] {chicken,
## other_vegetables,
## rolls/buns,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.3928571 0.002846975 5.4804965 11
## [19997] {other_vegetables,
## rolls/buns,
## whipped/sour_cream,
## whole_milk} => {chicken} 0.001118454 0.2972973 0.003762074 6.9287178 11
## [19998] {chicken,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [19999] {chicken,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [20000] {chicken,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001016777 0.6250000 0.001626843 5.7340252 10
## [20001] {chicken,
## other_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001016777 0.3448276 0.002948653 3.2862203 10
## [20002] {chicken,
## other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [20003] {chicken,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [20004] {chicken,
## other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.001220132 0.4137931 0.002948653 2.9662210 12
## [20005] {chicken,
## other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.001220132 0.4800000 0.002541942 4.4037313 12
## [20006] {chicken,
## other_vegetables,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [20007] {chicken,
## rolls/buns,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [20008] {chicken,
## other_vegetables,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001016777 0.3448276 0.002948653 1.8747260 10
## [20009] {chicken,
## other_vegetables,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001016777 0.3571429 0.002846975 3.2765858 10
## [20010] {butter,
## tropical_fruit,
## white_bread,
## yogurt} => {other_vegetables} 0.001016777 0.9090909 0.001118454 4.6983232 10
## [20011] {butter,
## other_vegetables,
## tropical_fruit,
## white_bread} => {yogurt} 0.001016777 0.9090909 0.001118454 6.5166976 10
## [20012] {butter,
## other_vegetables,
## white_bread,
## yogurt} => {tropical_fruit} 0.001016777 0.7142857 0.001423488 6.8071705 10
## [20013] {other_vegetables,
## tropical_fruit,
## white_bread,
## yogurt} => {butter} 0.001016777 0.6666667 0.001525165 12.0305810 10
## [20014] {butter,
## other_vegetables,
## tropical_fruit,
## yogurt} => {white_bread} 0.001016777 0.3333333 0.003050330 7.9186795 10
## [20015] {butter,
## other_vegetables,
## root_vegetables,
## white_bread} => {whole_milk} 0.001016777 1.0000000 0.001016777 3.9136490 10
## [20016] {butter,
## root_vegetables,
## white_bread,
## whole_milk} => {other_vegetables} 0.001016777 0.9090909 0.001118454 4.6983232 10
## [20017] {butter,
## other_vegetables,
## white_bread,
## whole_milk} => {root_vegetables} 0.001016777 0.5882353 0.001728521 5.3967296 10
## [20018] {other_vegetables,
## root_vegetables,
## white_bread,
## whole_milk} => {butter} 0.001016777 0.4347826 0.002338587 7.8460311 10
## [20019] {butter,
## other_vegetables,
## root_vegetables,
## whole_milk} => {white_bread} 0.001016777 0.2439024 0.004168785 5.7941558 10
## [20020] {butter,
## other_vegetables,
## white_bread,
## yogurt} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [20021] {butter,
## white_bread,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [20022] {butter,
## other_vegetables,
## white_bread,
## whole_milk} => {yogurt} 0.001016777 0.5882353 0.001728521 4.2166867 10
## [20023] {other_vegetables,
## white_bread,
## whole_milk,
## yogurt} => {butter} 0.001016777 0.4761905 0.002135231 8.5932722 10
## [20024] {butter,
## other_vegetables,
## whole_milk,
## yogurt} => {white_bread} 0.001016777 0.2325581 0.004372140 5.5246602 10
## [20025] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## white_bread} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [20026] {root_vegetables,
## whipped/sour_cream,
## white_bread,
## whole_milk} => {other_vegetables} 0.001118454 0.8461538 0.001321810 4.3730547 11
## [20027] {other_vegetables,
## whipped/sour_cream,
## white_bread,
## whole_milk} => {root_vegetables} 0.001118454 0.6470588 0.001728521 5.9364025 11
## [20028] {other_vegetables,
## root_vegetables,
## white_bread,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.4782609 0.002338587 6.6719087 11
## [20029] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {white_bread} 0.001118454 0.2156863 0.005185562 5.1238515 11
## [20030] {other_vegetables,
## whipped/sour_cream,
## white_bread,
## yogurt} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [20031] {whipped/sour_cream,
## white_bread,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [20032] {other_vegetables,
## whipped/sour_cream,
## white_bread,
## whole_milk} => {yogurt} 0.001016777 0.5882353 0.001728521 4.2166867 10
## [20033] {other_vegetables,
## white_bread,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001016777 0.4761905 0.002135231 6.6430260 10
## [20034] {pip_fruit,
## root_vegetables,
## white_bread,
## yogurt} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [20035] {pip_fruit,
## root_vegetables,
## white_bread,
## whole_milk} => {yogurt} 0.001016777 0.7692308 0.001321810 5.5141287 10
## [20036] {pip_fruit,
## white_bread,
## whole_milk,
## yogurt} => {root_vegetables} 0.001016777 0.6666667 0.001525165 6.1162935 10
## [20037] {root_vegetables,
## white_bread,
## whole_milk,
## yogurt} => {pip_fruit} 0.001016777 0.5555556 0.001830198 7.3439367 10
## [20038] {pip_fruit,
## root_vegetables,
## whole_milk,
## yogurt} => {white_bread} 0.001016777 0.2857143 0.003558719 6.7874396 10
## [20039] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## white_bread} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [20040] {root_vegetables,
## tropical_fruit,
## white_bread,
## whole_milk} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [20041] {other_vegetables,
## tropical_fruit,
## white_bread,
## whole_milk} => {root_vegetables} 0.001016777 0.5000000 0.002033554 4.5872201 10
## [20042] {other_vegetables,
## root_vegetables,
## white_bread,
## whole_milk} => {tropical_fruit} 0.001016777 0.4347826 0.002338587 4.1434951 10
## [20043] {other_vegetables,
## tropical_fruit,
## white_bread,
## yogurt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [20044] {tropical_fruit,
## white_bread,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [20045] {other_vegetables,
## tropical_fruit,
## white_bread,
## whole_milk} => {yogurt} 0.001118454 0.5500000 0.002033554 3.9426020 11
## [20046] {other_vegetables,
## white_bread,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.5238095 0.002135231 4.9919251 11
## [20047] {other_vegetables,
## root_vegetables,
## white_bread,
## yogurt} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [20048] {root_vegetables,
## white_bread,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.7222222 0.001830198 3.7325568 13
## [20049] {other_vegetables,
## root_vegetables,
## white_bread,
## whole_milk} => {yogurt} 0.001321810 0.5652174 0.002338587 4.0516859 13
## [20050] {other_vegetables,
## white_bread,
## whole_milk,
## yogurt} => {root_vegetables} 0.001321810 0.6190476 0.002135231 5.6794154 13
## [20051] {chocolate,
## other_vegetables,
## rolls/buns,
## soda} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [20052] {chocolate,
## rolls/buns,
## soda,
## whole_milk} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [20053] {chocolate,
## other_vegetables,
## soda,
## whole_milk} => {rolls/buns} 0.001016777 0.5263158 0.001931876 2.8614239 10
## [20054] {chocolate,
## other_vegetables,
## rolls/buns,
## whole_milk} => {soda} 0.001016777 0.5882353 0.001728521 3.3733493 10
## [20055] {other_vegetables,
## rolls/buns,
## soda,
## whole_milk} => {chocolate} 0.001016777 0.2325581 0.004372140 4.6869043 10
## [20056] {citrus_fruit,
## frozen_vegetables,
## fruit/vegetable_juice,
## other_vegetables} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [20057] {citrus_fruit,
## frozen_vegetables,
## fruit/vegetable_juice,
## whole_milk} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [20058] {frozen_vegetables,
## fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001016777 0.4545455 0.002236909 5.4919589 10
## [20059] {citrus_fruit,
## frozen_vegetables,
## other_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.5000000 0.002033554 6.9163150 10
## [20060] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {frozen_vegetables} 0.001016777 0.4000000 0.002541942 8.3171247 10
## [20061] {frozen_vegetables,
## fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [20062] {frozen_vegetables,
## fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [20063] {frozen_vegetables,
## fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001220132 0.5454545 0.002236909 5.0042402 12
## [20064] {frozen_vegetables,
## other_vegetables,
## root_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001220132 0.3157895 0.003863752 4.3681990 12
## [20065] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## whole_milk} => {frozen_vegetables} 0.001220132 0.3076923 0.003965430 6.3977883 12
## [20066] {frozen_vegetables,
## fruit/vegetable_juice,
## other_vegetables,
## yogurt} => {whole_milk} 0.001423488 0.7777778 0.001830198 3.0439492 14
## [20067] {frozen_vegetables,
## fruit/vegetable_juice,
## whole_milk,
## yogurt} => {other_vegetables} 0.001423488 0.6666667 0.002135231 3.4454370 14
## [20068] {frozen_vegetables,
## fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {yogurt} 0.001423488 0.6363636 0.002236909 4.5616883 14
## [20069] {frozen_vegetables,
## other_vegetables,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001423488 0.4000000 0.003558719 5.5330520 14
## [20070] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk,
## yogurt} => {frozen_vegetables} 0.001423488 0.2800000 0.005083884 5.8219873 14
## [20071] {frozen_vegetables,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [20072] {frozen_vegetables,
## other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [20073] {frozen_vegetables,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001016777 0.4545455 0.002236909 4.1702001 10
## [20074] {frozen_vegetables,
## other_vegetables,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001016777 0.5263158 0.001931876 7.3422919 10
## [20075] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {frozen_vegetables} 0.001016777 0.2941176 0.003457041 6.1155329 10
## [20076] {frozen_vegetables,
## other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [20077] {frozen_vegetables,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001321810 0.7647059 0.001728521 3.9521189 13
## [20078] {frozen_vegetables,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001321810 0.5416667 0.002440264 4.9694885 13
## [20079] {frozen_vegetables,
## other_vegetables,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001321810 0.3421053 0.003863752 4.7724897 13
## [20080] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {frozen_vegetables} 0.001321810 0.2549020 0.005185562 5.3001285 13
## [20081] {frozen_vegetables,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001525165 0.6818182 0.002236909 2.6683971 15
## [20082] {frozen_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001525165 0.8823529 0.001728521 4.5601372 15
## [20083] {frozen_vegetables,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001525165 0.6250000 0.002440264 4.4802296 15
## [20084] {frozen_vegetables,
## other_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001525165 0.4285714 0.003558719 5.9787234 15
## [20085] {other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {frozen_vegetables} 0.001525165 0.2727273 0.005592272 5.6707669 15
## [20086] {citrus_fruit,
## frozen_vegetables,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001423488 0.7000000 0.002033554 2.7395543 14
## [20087] {citrus_fruit,
## frozen_vegetables,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001423488 0.7777778 0.001830198 4.0196765 14
## [20088] {citrus_fruit,
## frozen_vegetables,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001423488 0.7000000 0.002033554 6.4221082 14
## [20089] {frozen_vegetables,
## other_vegetables,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001423488 0.3684211 0.003863752 4.4513772 14
## [20090] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whole_milk} => {frozen_vegetables} 0.001423488 0.2456140 0.005795628 5.1070064 14
## [20091] {citrus_fruit,
## frozen_vegetables,
## other_vegetables,
## yogurt} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [20092] {citrus_fruit,
## frozen_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [20093] {citrus_fruit,
## frozen_vegetables,
## other_vegetables,
## whole_milk} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [20094] {frozen_vegetables,
## other_vegetables,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001016777 0.2857143 0.003558719 3.4520885 10
## [20095] {citrus_fruit,
## other_vegetables,
## whole_milk,
## yogurt} => {frozen_vegetables} 0.001016777 0.2127660 0.004778851 4.4240025 10
## [20096] {bottled_water,
## frozen_vegetables,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [20097] {bottled_water,
## frozen_vegetables,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [20098] {bottled_water,
## frozen_vegetables,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001016777 0.6666667 0.001525165 6.1162935 10
## [20099] {frozen_vegetables,
## other_vegetables,
## root_vegetables,
## whole_milk} => {bottled_water} 0.001016777 0.2631579 0.003863752 2.3810100 10
## [20100] {bottled_water,
## other_vegetables,
## root_vegetables,
## whole_milk} => {frozen_vegetables} 0.001016777 0.2564103 0.003965430 5.3314902 10
## [20101] {frozen_vegetables,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [20102] {frozen_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001321810 0.5652174 0.002338587 2.9211314 13
## [20103] {frozen_vegetables,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001321810 0.5416667 0.002440264 4.9694885 13
## [20104] {frozen_vegetables,
## other_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001321810 0.3421053 0.003863752 3.2602764 13
## [20105] {frozen_vegetables,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [20106] {frozen_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [20107] {frozen_vegetables,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001220132 0.5000000 0.002440264 3.5841837 12
## [20108] {frozen_vegetables,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001220132 0.3428571 0.003558719 3.2674419 12
## [20109] {frozen_vegetables,
## other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.001525165 0.7894737 0.001931876 3.0897229 15
## [20110] {frozen_vegetables,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001525165 0.8823529 0.001728521 4.5601372 15
## [20111] {frozen_vegetables,
## other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.001525165 0.3947368 0.003863752 2.8296187 15
## [20112] {frozen_vegetables,
## other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.001525165 0.4285714 0.003558719 3.9319030 15
## [20113] {beef,
## butter,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [20114] {beef,
## butter,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001118454 0.5500000 0.002033554 2.9901879 11
## [20115] {beef,
## butter,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001118454 0.6470588 0.001728521 5.9364025 11
## [20116] {beef,
## rolls/buns,
## root_vegetables,
## whole_milk} => {butter} 0.001118454 0.3928571 0.002846975 7.0894495 11
## [20117] {butter,
## rolls/buns,
## root_vegetables,
## whole_milk} => {beef} 0.001118454 0.4782609 0.002338587 9.1156892 11
## [20118] {beef,
## butter,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [20119] {beef,
## butter,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [20120] {beef,
## butter,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001016777 0.5555556 0.001830198 5.0969113 10
## [20121] {beef,
## other_vegetables,
## root_vegetables,
## whole_milk} => {butter} 0.001016777 0.2564103 0.003965430 4.6271466 10
## [20122] {butter,
## other_vegetables,
## root_vegetables,
## whole_milk} => {beef} 0.001016777 0.2439024 0.004168785 4.6487994 10
## [20123] {beef,
## domestic_eggs,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [20124] {beef,
## domestic_eggs,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001220132 0.7500000 0.001626843 3.8761167 12
## [20125] {beef,
## domestic_eggs,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001220132 0.4800000 0.002541942 4.4037313 12
## [20126] {beef,
## other_vegetables,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001220132 0.3076923 0.003965430 4.8496055 12
## [20127] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## whole_milk} => {beef} 0.001220132 0.2666667 0.004575496 5.0826873 12
## [20128] {beef,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [20129] {beef,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001118454 0.8461538 0.001321810 4.3730547 11
## [20130] {beef,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001118454 0.5238095 0.002135231 4.9919251 11
## [20131] {beef,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.3793103 0.002948653 5.2915138 11
## [20132] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {beef} 0.001118454 0.2500000 0.004473818 4.7650194 11
## [20133] {beef,
## other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [20134] {beef,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [20135] {beef,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001016777 0.4761905 0.002135231 4.3687811 10
## [20136] {beef,
## other_vegetables,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2564103 0.003965430 3.5770140 10
## [20137] {beef,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [20138] {beef,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [20139] {beef,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [20140] {beef,
## other_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3333333 0.003050330 4.6501182 10
## [20141] {beef,
## citrus_fruit,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [20142] {beef,
## citrus_fruit,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001016777 0.8333333 0.001220132 7.6453669 10
## [20143] {beef,
## citrus_fruit,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001016777 0.4761905 0.002135231 4.5381137 10
## [20144] {beef,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001016777 0.3703704 0.002745297 4.4749295 10
## [20145] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {beef} 0.001016777 0.2272727 0.004473818 4.3318358 10
## [20146] {beef,
## citrus_fruit,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001423488 0.6666667 0.002135231 2.6090994 14
## [20147] {beef,
## citrus_fruit,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001423488 0.6363636 0.002236909 3.2888263 14
## [20148] {beef,
## citrus_fruit,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001423488 0.6666667 0.002135231 6.1162935 14
## [20149] {beef,
## other_vegetables,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001423488 0.3589744 0.003965430 4.3372393 14
## [20150] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whole_milk} => {beef} 0.001423488 0.2456140 0.005795628 4.6814225 14
## [20151] {beef,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [20152] {beef,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [20153] {beef,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001016777 0.5263158 0.001931876 4.8286528 10
## [20154] {beef,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [20155] {beef,
## rolls/buns,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001321810 0.7647059 0.001728521 3.9521189 13
## [20156] {beef,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {rolls/buns} 0.001321810 0.4814815 0.002745297 2.6176730 13
## [20157] {beef,
## other_vegetables,
## rolls/buns,
## tropical_fruit} => {root_vegetables} 0.001321810 0.7647059 0.001728521 7.0157485 13
## [20158] {beef,
## other_vegetables,
## rolls/buns,
## root_vegetables} => {tropical_fruit} 0.001321810 0.4642857 0.002846975 4.4246609 13
## [20159] {other_vegetables,
## rolls/buns,
## root_vegetables,
## tropical_fruit} => {beef} 0.001321810 0.3714286 0.003558719 7.0794574 13
## [20160] {beef,
## rolls/buns,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001423488 0.8235294 0.001728521 3.2230051 14
## [20161] {beef,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001423488 0.5600000 0.002541942 3.0445550 14
## [20162] {beef,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001423488 0.6666667 0.002135231 6.1162935 14
## [20163] {beef,
## rolls/buns,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001423488 0.5000000 0.002846975 4.7650194 14
## [20164] {rolls/buns,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {beef} 0.001423488 0.3783784 0.003762074 7.2119212 14
## [20165] {beef,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001931876 0.7037037 0.002745297 2.7540493 19
## [20166] {beef,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001931876 0.7600000 0.002541942 3.9277982 19
## [20167] {beef,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001931876 0.6551724 0.002948653 6.0108402 19
## [20168] {beef,
## other_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001931876 0.4871795 0.003965430 4.6428394 19
## [20169] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {beef} 0.001931876 0.2753623 0.007015760 5.2484271 19
## [20170] {beef,
## rolls/buns,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001321810 0.9285714 0.001423488 3.6341027 13
## [20171] {beef,
## tropical_fruit,
## whole_milk,
## yogurt} => {rolls/buns} 0.001321810 0.6842105 0.001931876 3.7198510 13
## [20172] {beef,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001321810 0.6190476 0.002135231 4.4375607 13
## [20173] {beef,
## rolls/buns,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001321810 0.5909091 0.002236909 5.6313865 13
## [20174] {rolls/buns,
## tropical_fruit,
## whole_milk,
## yogurt} => {beef} 0.001321810 0.2708333 0.004880529 5.1621043 13
## [20175] {beef,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [20176] {beef,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.6842105 0.001931876 3.5361064 13
## [20177] {beef,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001321810 0.4482759 0.002948653 3.2134061 13
## [20178] {beef,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001321810 0.4333333 0.003050330 4.1296835 13
## [20179] {beef,
## other_vegetables,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001525165 0.8823529 0.001728521 3.4532197 15
## [20180] {beef,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001525165 0.7142857 0.002135231 3.6915397 15
## [20181] {beef,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001525165 0.5172414 0.002948653 2.8120890 15
## [20182] {beef,
## other_vegetables,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001525165 0.4545455 0.003355363 4.3318358 15
## [20183] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {beef} 0.001525165 0.3750000 0.004067107 7.1475291 15
## [20184] {beef,
## other_vegetables,
## root_vegetables,
## soda} => {whole_milk} 0.001016777 0.5000000 0.002033554 1.9568245 10
## [20185] {beef,
## root_vegetables,
## soda,
## whole_milk} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [20186] {beef,
## other_vegetables,
## root_vegetables,
## whole_milk} => {soda} 0.001016777 0.2564103 0.003965430 1.4704343 10
## [20187] {beef,
## other_vegetables,
## soda,
## whole_milk} => {root_vegetables} 0.001016777 0.5000000 0.002033554 4.5872201 10
## [20188] {other_vegetables,
## root_vegetables,
## soda,
## whole_milk} => {beef} 0.001016777 0.2272727 0.004473818 4.3318358 10
## [20189] {beef,
## rolls/buns,
## root_vegetables,
## yogurt} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [20190] {beef,
## other_vegetables,
## root_vegetables,
## yogurt} => {rolls/buns} 0.001016777 0.4347826 0.002338587 2.3637849 10
## [20191] {beef,
## other_vegetables,
## rolls/buns,
## root_vegetables} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [20192] {beef,
## other_vegetables,
## rolls/buns,
## yogurt} => {root_vegetables} 0.001016777 0.6250000 0.001626843 5.7340252 10
## [20193] {other_vegetables,
## rolls/buns,
## root_vegetables,
## yogurt} => {beef} 0.001016777 0.2439024 0.004168785 4.6487994 10
## [20194] {beef,
## rolls/buns,
## root_vegetables,
## yogurt} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [20195] {beef,
## root_vegetables,
## whole_milk,
## yogurt} => {rolls/buns} 0.001220132 0.4800000 0.002541942 2.6096186 12
## [20196] {beef,
## rolls/buns,
## root_vegetables,
## whole_milk} => {yogurt} 0.001220132 0.4285714 0.002846975 3.0721574 12
## [20197] {beef,
## rolls/buns,
## whole_milk,
## yogurt} => {root_vegetables} 0.001220132 0.5454545 0.002236909 5.0042402 12
## [20198] {rolls/buns,
## root_vegetables,
## whole_milk,
## yogurt} => {beef} 0.001220132 0.2608696 0.004677173 4.9721941 12
## [20199] {beef,
## other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [20200] {beef,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.5200000 0.002541942 2.6874409 13
## [20201] {beef,
## other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.001321810 0.3333333 0.003965430 2.3894558 13
## [20202] {beef,
## other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.001321810 0.4333333 0.003050330 3.9755908 13
## [20203] {beef,
## other_vegetables,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001728521 0.6071429 0.002846975 2.3761441 17
## [20204] {beef,
## rolls/buns,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001728521 0.6071429 0.002846975 3.1378087 17
## [20205] {beef,
## other_vegetables,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001728521 0.4358974 0.003965430 2.3698459 17
## [20206] {beef,
## other_vegetables,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001728521 0.5151515 0.003355363 4.7262268 17
## [20207] {other_vegetables,
## rolls/buns,
## root_vegetables,
## whole_milk} => {beef} 0.001728521 0.2786885 0.006202339 5.3118249 17
## [20208] {beef,
## other_vegetables,
## rolls/buns,
## yogurt} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [20209] {beef,
## rolls/buns,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [20210] {beef,
## other_vegetables,
## whole_milk,
## yogurt} => {rolls/buns} 0.001118454 0.3666667 0.003050330 1.9934586 11
## [20211] {beef,
## other_vegetables,
## rolls/buns,
## whole_milk} => {yogurt} 0.001118454 0.3333333 0.003355363 2.3894558 11
## [20212] {butter,
## curd,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [20213] {butter,
## curd,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [20214] {butter,
## curd,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.4545455 0.002236909 6.3410703 10
## [20215] {curd,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001016777 0.4000000 0.002541942 7.2183486 10
## [20216] {butter,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {curd} 0.001016777 0.2564103 0.003965430 4.8125856 10
## [20217] {butter,
## curd,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [20218] {butter,
## curd,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001016777 0.8333333 0.001220132 5.9736395 10
## [20219] {butter,
## curd,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001016777 0.6666667 0.001525165 6.3533592 10
## [20220] {curd,
## other_vegetables,
## tropical_fruit,
## yogurt} => {butter} 0.001016777 0.4000000 0.002541942 7.2183486 10
## [20221] {butter,
## other_vegetables,
## tropical_fruit,
## yogurt} => {curd} 0.001016777 0.3333333 0.003050330 6.2563613 10
## [20222] {butter,
## curd,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001220132 0.8000000 0.001525165 3.1309192 12
## [20223] {butter,
## curd,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001220132 0.8571429 0.001423488 6.1443149 12
## [20224] {butter,
## curd,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001220132 0.5217391 0.002338587 4.9721941 12
## [20225] {curd,
## tropical_fruit,
## whole_milk,
## yogurt} => {butter} 0.001220132 0.3076923 0.003965430 5.5525759 12
## [20226] {butter,
## tropical_fruit,
## whole_milk,
## yogurt} => {curd} 0.001220132 0.3636364 0.003355363 6.8251214 12
## [20227] {butter,
## curd,
## other_vegetables,
## yogurt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [20228] {butter,
## curd,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [20229] {butter,
## curd,
## other_vegetables,
## whole_milk} => {yogurt} 0.001118454 0.5000000 0.002236909 3.5841837 11
## [20230] {curd,
## other_vegetables,
## whole_milk,
## yogurt} => {butter} 0.001118454 0.3055556 0.003660397 5.5140163 11
## [20231] {butter,
## other_vegetables,
## whole_milk,
## yogurt} => {curd} 0.001118454 0.2558140 0.004372140 4.8013936 11
## [20232] {curd,
## domestic_eggs,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.9166667 0.001220132 3.5875116 11
## [20233] {curd,
## domestic_eggs,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.6470588 0.001728521 4.6383553 11
## [20234] {curd,
## domestic_eggs,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.5500000 0.002033554 5.2415213 11
## [20235] {curd,
## tropical_fruit,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001118454 0.2820513 0.003965430 4.4454717 11
## [20236] {domestic_eggs,
## tropical_fruit,
## whole_milk,
## yogurt} => {curd} 0.001118454 0.3793103 0.002948653 7.1193077 11
## [20237] {curd,
## domestic_eggs,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [20238] {curd,
## domestic_eggs,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [20239] {curd,
## domestic_eggs,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001220132 0.4285714 0.002846975 3.9319030 12
## [20240] {curd,
## other_vegetables,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001220132 0.3870968 0.003152008 6.1011166 12
## [20241] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## whole_milk} => {curd} 0.001220132 0.2666667 0.004575496 5.0050891 12
## [20242] {curd,
## other_vegetables,
## pip_fruit,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [20243] {curd,
## pip_fruit,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [20244] {curd,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {pip_fruit} 0.001016777 0.4000000 0.002541942 5.2876344 10
## [20245] {curd,
## other_vegetables,
## pip_fruit,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.4545455 0.002236909 6.3410703 10
## [20246] {other_vegetables,
## pip_fruit,
## whipped/sour_cream,
## whole_milk} => {curd} 0.001016777 0.2777778 0.003660397 5.2136344 10
## [20247] {curd,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [20248] {curd,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001016777 0.5882353 0.001728521 4.2166867 10
## [20249] {curd,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001016777 0.5882353 0.001728521 5.6059052 10
## [20250] {curd,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001016777 0.4000000 0.002541942 5.5801418 10
## [20251] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {curd} 0.001016777 0.2857143 0.003558719 5.3625954 10
## [20252] {curd,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [20253] {curd,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001321810 0.6500000 0.002033554 4.6594388 13
## [20254] {curd,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001321810 0.4814815 0.002745297 4.5885372 13
## [20255] {curd,
## tropical_fruit,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001321810 0.3333333 0.003965430 4.6501182 13
## [20256] {tropical_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {curd} 0.001321810 0.3023256 0.004372140 5.6743742 13
## [20257] {curd,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [20258] {curd,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [20259] {curd,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001118454 0.4400000 0.002541942 4.1932171 11
## [20260] {curd,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.3548387 0.003152008 4.9501258 11
## [20261] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {curd} 0.001118454 0.2500000 0.004473818 4.6922710 11
## [20262] {curd,
## rolls/buns,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [20263] {curd,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {rolls/buns} 0.001016777 0.3703704 0.002745297 2.0135946 10
## [20264] {curd,
## rolls/buns,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001016777 0.5882353 0.001728521 4.2166867 10
## [20265] {curd,
## rolls/buns,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001016777 0.4000000 0.002541942 5.5801418 10
## [20266] {rolls/buns,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {curd} 0.001016777 0.3333333 0.003050330 6.2563613 10
## [20267] {curd,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [20268] {curd,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.4074074 0.002745297 2.1055449 11
## [20269] {curd,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.4400000 0.002541942 3.1540816 11
## [20270] {curd,
## other_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3055556 0.003660397 4.2626084 11
## [20271] {other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {curd} 0.001118454 0.2000000 0.005592272 3.7538168 11
## [20272] {curd,
## pip_fruit,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [20273] {curd,
## other_vegetables,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [20274] {curd,
## other_vegetables,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001016777 0.5882353 0.001728521 5.6059052 10
## [20275] {curd,
## other_vegetables,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001016777 0.4000000 0.002541942 5.2876344 10
## [20276] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## yogurt} => {curd} 0.001016777 0.2857143 0.003558719 5.3625954 10
## [20277] {curd,
## pip_fruit,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [20278] {curd,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.6470588 0.001728521 4.6383553 11
## [20279] {curd,
## pip_fruit,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.4400000 0.002541942 4.1932171 11
## [20280] {curd,
## tropical_fruit,
## whole_milk,
## yogurt} => {pip_fruit} 0.001118454 0.2820513 0.003965430 3.7284602 11
## [20281] {pip_fruit,
## tropical_fruit,
## whole_milk,
## yogurt} => {curd} 0.001118454 0.2972973 0.003762074 5.5799979 11
## [20282] {curd,
## other_vegetables,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [20283] {curd,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [20284] {curd,
## other_vegetables,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001016777 0.4545455 0.002236909 4.3318358 10
## [20285] {curd,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001016777 0.3225806 0.003152008 4.2642213 10
## [20286] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {curd} 0.001016777 0.2127660 0.004778851 3.9934221 10
## [20287] {curd,
## other_vegetables,
## pip_fruit,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [20288] {curd,
## pip_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.4000000 0.002541942 2.0672622 10
## [20289] {curd,
## other_vegetables,
## pip_fruit,
## whole_milk} => {yogurt} 0.001016777 0.4545455 0.002236909 3.2583488 10
## [20290] {curd,
## other_vegetables,
## whole_milk,
## yogurt} => {pip_fruit} 0.001016777 0.2777778 0.003660397 3.6719683 10
## [20291] {other_vegetables,
## pip_fruit,
## whole_milk,
## yogurt} => {curd} 0.001016777 0.2000000 0.005083884 3.7538168 10
## [20292] {curd,
## other_vegetables,
## pastry,
## yogurt} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [20293] {curd,
## pastry,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [20294] {curd,
## other_vegetables,
## pastry,
## whole_milk} => {yogurt} 0.001220132 0.7058824 0.001728521 5.0600240 12
## [20295] {curd,
## other_vegetables,
## whole_milk,
## yogurt} => {pastry} 0.001220132 0.3333333 0.003660397 3.7466667 12
## [20296] {other_vegetables,
## pastry,
## whole_milk,
## yogurt} => {curd} 0.001220132 0.3000000 0.004067107 5.6307252 12
## [20297] {citrus_fruit,
## curd,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [20298] {citrus_fruit,
## curd,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [20299] {citrus_fruit,
## curd,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.4761905 0.002135231 4.5381137 10
## [20300] {curd,
## tropical_fruit,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001016777 0.2564103 0.003965430 3.0980281 10
## [20301] {citrus_fruit,
## tropical_fruit,
## whole_milk,
## yogurt} => {curd} 0.001016777 0.2631579 0.003863752 4.9392326 10
## [20302] {citrus_fruit,
## curd,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [20303] {citrus_fruit,
## curd,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [20304] {citrus_fruit,
## curd,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001016777 0.5263158 0.001931876 5.0158099 10
## [20305] {curd,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001016777 0.3225806 0.003152008 3.8975192 10
## [20306] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {curd} 0.001016777 0.2040816 0.004982206 3.8304253 10
## [20307] {citrus_fruit,
## curd,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [20308] {citrus_fruit,
## curd,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001118454 0.8461538 0.001321810 4.3730547 11
## [20309] {citrus_fruit,
## curd,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001118454 0.5789474 0.001931876 5.3115181 11
## [20310] {curd,
## other_vegetables,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001118454 0.3548387 0.003152008 4.2872711 11
## [20311] {citrus_fruit,
## curd,
## other_vegetables,
## yogurt} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [20312] {citrus_fruit,
## curd,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [20313] {citrus_fruit,
## curd,
## other_vegetables,
## whole_milk} => {yogurt} 0.001220132 0.6315789 0.001931876 4.5273899 12
## [20314] {curd,
## other_vegetables,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001220132 0.3333333 0.003660397 4.0274365 12
## [20315] {citrus_fruit,
## other_vegetables,
## whole_milk,
## yogurt} => {curd} 0.001220132 0.2553191 0.004778851 4.7921065 12
## [20316] {curd,
## other_vegetables,
## sausage,
## yogurt} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [20317] {curd,
## sausage,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [20318] {curd,
## other_vegetables,
## sausage,
## whole_milk} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [20319] {curd,
## other_vegetables,
## whole_milk,
## yogurt} => {sausage} 0.001016777 0.2777778 0.003660397 2.9566498 10
## [20320] {other_vegetables,
## sausage,
## whole_milk,
## yogurt} => {curd} 0.001016777 0.2702703 0.003762074 5.0727254 10
## [20321] {curd,
## root_vegetables,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [20322] {curd,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [20323] {curd,
## other_vegetables,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001016777 0.4000000 0.002541942 3.6697761 10
## [20324] {curd,
## other_vegetables,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001016777 0.4166667 0.002440264 3.9708495 10
## [20325] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## yogurt} => {curd} 0.001016777 0.2040816 0.004982206 3.8304253 10
## [20326] {curd,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [20327] {curd,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001321810 0.6500000 0.002033554 4.6594388 13
## [20328] {curd,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001321810 0.3333333 0.003965430 3.0581468 13
## [20329] {curd,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001321810 0.4482759 0.002948653 4.2720863 13
## [20330] {root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {curd} 0.001321810 0.2321429 0.005693950 4.3571088 13
## [20331] {curd,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [20332] {curd,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [20333] {curd,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001220132 0.3870968 0.003152008 3.5513962 12
## [20334] {curd,
## other_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001220132 0.3870968 0.003152008 3.6890473 12
## [20335] {curd,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001728521 0.6800000 0.002541942 2.6612813 17
## [20336] {curd,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001728521 0.4358974 0.003965430 2.2527857 17
## [20337] {curd,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001728521 0.5483871 0.003152008 3.9310402 17
## [20338] {curd,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001728521 0.4722222 0.003660397 4.5002961 17
## [20339] {other_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {curd} 0.001728521 0.2266667 0.007625826 4.2543257 17
## [20340] {curd,
## other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.001525165 0.6250000 0.002440264 2.4460306 15
## [20341] {curd,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001525165 0.5172414 0.002948653 2.6731839 15
## [20342] {curd,
## other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.001525165 0.4838710 0.003152008 3.4685648 15
## [20343] {curd,
## other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.001525165 0.4166667 0.003660397 3.8226835 15
## [20344] {butter,
## napkins,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [20345] {butter,
## napkins,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [20346] {butter,
## napkins,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.5555556 0.001830198 7.7501970 10
## [20347] {napkins,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001016777 0.5000000 0.002033554 9.0229358 10
## [20348] {butter,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {napkins} 0.001016777 0.2564103 0.003965430 4.8966891 10
## [20349] {butter,
## other_vegetables,
## pork,
## whipped/sour_cream} => {whole_milk} 0.001016777 1.0000000 0.001016777 3.9136490 10
## [20350] {butter,
## pork,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [20351] {butter,
## other_vegetables,
## pork,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.4545455 0.002236909 6.3410703 10
## [20352] {other_vegetables,
## pork,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001016777 0.4166667 0.002440264 7.5191131 10
## [20353] {butter,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {pork} 0.001016777 0.2564103 0.003965430 4.4476100 10
## [20354] {butter,
## other_vegetables,
## pork,
## root_vegetables} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [20355] {butter,
## pork,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [20356] {butter,
## other_vegetables,
## pork,
## whole_milk} => {root_vegetables} 0.001016777 0.4545455 0.002236909 4.1702001 10
## [20357] {other_vegetables,
## pork,
## root_vegetables,
## whole_milk} => {butter} 0.001016777 0.2702703 0.003762074 4.8772626 10
## [20358] {butter,
## other_vegetables,
## root_vegetables,
## whole_milk} => {pork} 0.001016777 0.2439024 0.004168785 4.2306534 10
## [20359] {domestic_eggs,
## other_vegetables,
## pork,
## root_vegetables} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [20360] {domestic_eggs,
## pork,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [20361] {domestic_eggs,
## other_vegetables,
## pork,
## whole_milk} => {root_vegetables} 0.001016777 0.5000000 0.002033554 4.5872201 10
## [20362] {other_vegetables,
## pork,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001016777 0.2702703 0.003762074 4.2597886 10
## [20363] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## whole_milk} => {pork} 0.001016777 0.2222222 0.004575496 3.8545953 10
## [20364] {citrus_fruit,
## other_vegetables,
## pork,
## root_vegetables} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [20365] {citrus_fruit,
## pork,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [20366] {citrus_fruit,
## other_vegetables,
## pork,
## whole_milk} => {root_vegetables} 0.001016777 0.5882353 0.001728521 5.3967296 10
## [20367] {other_vegetables,
## pork,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001016777 0.2702703 0.003762074 3.2654891 10
## [20368] {other_vegetables,
## pork,
## root_vegetables,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [20369] {pork,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [20370] {other_vegetables,
## pork,
## root_vegetables,
## whole_milk} => {yogurt} 0.001118454 0.2972973 0.003762074 2.1311362 11
## [20371] {other_vegetables,
## pork,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.4782609 0.002338587 4.3877758 11
## [20372] {other_vegetables,
## pork,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [20373] {pork,
## rolls/buns,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [20374] {other_vegetables,
## pork,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001118454 0.2972973 0.003762074 1.6163178 11
## [20375] {other_vegetables,
## pork,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001118454 0.3437500 0.003253686 3.1537139 11
## [20376] {frankfurter,
## other_vegetables,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [20377] {frankfurter,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [20378] {frankfurter,
## other_vegetables,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001016777 0.4347826 0.002338587 4.1434951 10
## [20379] {frankfurter,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001016777 0.4000000 0.002541942 5.2876344 10
## [20380] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {frankfurter} 0.001016777 0.2127660 0.004778851 3.6078503 10
## [20381] {frankfurter,
## other_vegetables,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [20382] {frankfurter,
## pip_fruit,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [20383] {frankfurter,
## other_vegetables,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [20384] {frankfurter,
## other_vegetables,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001016777 0.4545455 0.002236909 6.0086755 10
## [20385] {frankfurter,
## other_vegetables,
## pip_fruit,
## yogurt} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [20386] {frankfurter,
## pip_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [20387] {frankfurter,
## other_vegetables,
## pip_fruit,
## whole_milk} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [20388] {frankfurter,
## other_vegetables,
## whole_milk,
## yogurt} => {pip_fruit} 0.001118454 0.3928571 0.002846975 5.1932124 11
## [20389] {other_vegetables,
## pip_fruit,
## whole_milk,
## yogurt} => {frankfurter} 0.001118454 0.2200000 0.005083884 3.7305172 11
## [20390] {frankfurter,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001220132 0.9230769 0.001321810 3.6125991 12
## [20391] {frankfurter,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001220132 0.6000000 0.002033554 4.3010204 12
## [20392] {frankfurter,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001220132 0.5714286 0.002135231 5.2425373 12
## [20393] {frankfurter,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001220132 0.5217391 0.002338587 4.9721941 12
## [20394] {root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {frankfurter} 0.001220132 0.2142857 0.005693950 3.6336207 12
## [20395] {frankfurter,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [20396] {frankfurter,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.5000000 0.002033554 2.5840778 10
## [20397] {frankfurter,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001016777 0.4000000 0.002541942 3.6697761 10
## [20398] {frankfurter,
## other_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001016777 0.4545455 0.002236909 4.3318358 10
## [20399] {frankfurter,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001423488 0.8235294 0.001728521 3.2230051 14
## [20400] {frankfurter,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001423488 0.6666667 0.002135231 3.4454370 14
## [20401] {frankfurter,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001423488 0.5600000 0.002541942 4.0142857 14
## [20402] {frankfurter,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001423488 0.5000000 0.002846975 4.7650194 14
## [20403] {frankfurter,
## rolls/buns,
## root_vegetables,
## yogurt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [20404] {frankfurter,
## root_vegetables,
## whole_milk,
## yogurt} => {rolls/buns} 0.001118454 0.4782609 0.002338587 2.6001634 11
## [20405] {frankfurter,
## rolls/buns,
## root_vegetables,
## whole_milk} => {yogurt} 0.001118454 0.7333333 0.001525165 5.2568027 11
## [20406] {frankfurter,
## rolls/buns,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.4782609 0.002338587 4.3877758 11
## [20407] {rolls/buns,
## root_vegetables,
## whole_milk,
## yogurt} => {frankfurter} 0.001118454 0.2391304 0.004677173 4.0549100 11
## [20408] {frankfurter,
## other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [20409] {frankfurter,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [20410] {frankfurter,
## other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.001220132 0.5454545 0.002236909 3.9100186 12
## [20411] {frankfurter,
## other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.001220132 0.4285714 0.002846975 3.9319030 12
## [20412] {frankfurter,
## other_vegetables,
## rolls/buns,
## yogurt} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [20413] {frankfurter,
## rolls/buns,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [20414] {frankfurter,
## other_vegetables,
## whole_milk,
## yogurt} => {rolls/buns} 0.001016777 0.3571429 0.002846975 1.9416805 10
## [20415] {frankfurter,
## other_vegetables,
## rolls/buns,
## whole_milk} => {yogurt} 0.001016777 0.4166667 0.002440264 2.9868197 10
## [20416] {bottled_beer,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [20417] {bottled_beer,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [20418] {bottled_beer,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.6470588 0.001728521 4.6383553 11
## [20419] {bottled_beer,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.4230769 0.002643620 4.0319395 11
## [20420] {brown_bread,
## pip_fruit,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [20421] {brown_bread,
## other_vegetables,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [20422] {brown_bread,
## other_vegetables,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001016777 0.6250000 0.001626843 5.9562742 10
## [20423] {brown_bread,
## other_vegetables,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001016777 0.5882353 0.001728521 7.7759330 10
## [20424] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## yogurt} => {brown_bread} 0.001016777 0.2857143 0.003558719 4.4043887 10
## [20425] {brown_bread,
## pip_fruit,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [20426] {brown_bread,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.6470588 0.001728521 4.6383553 11
## [20427] {brown_bread,
## pip_fruit,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.6875000 0.001626843 6.5519016 11
## [20428] {brown_bread,
## tropical_fruit,
## whole_milk,
## yogurt} => {pip_fruit} 0.001118454 0.5238095 0.002135231 6.9242832 11
## [20429] {pip_fruit,
## tropical_fruit,
## whole_milk,
## yogurt} => {brown_bread} 0.001118454 0.2972973 0.003762074 4.5829450 11
## [20430] {brown_bread,
## other_vegetables,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [20431] {brown_bread,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001321810 0.7647059 0.001728521 3.9521189 13
## [20432] {brown_bread,
## other_vegetables,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001321810 0.6190476 0.002135231 5.8995478 13
## [20433] {brown_bread,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001321810 0.5000000 0.002643620 6.6095430 13
## [20434] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {brown_bread} 0.001321810 0.2765957 0.004778851 4.2638231 13
## [20435] {brown_bread,
## other_vegetables,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001220132 0.9230769 0.001321810 3.6125991 12
## [20436] {brown_bread,
## pip_fruit,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001220132 0.8571429 0.001423488 4.4298476 12
## [20437] {brown_bread,
## other_vegetables,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001220132 0.5714286 0.002135231 5.2425373 12
## [20438] {brown_bread,
## other_vegetables,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001220132 0.3870968 0.003152008 5.1170656 12
## [20439] {other_vegetables,
## pip_fruit,
## root_vegetables,
## whole_milk} => {brown_bread} 0.001220132 0.2222222 0.005490595 3.4256357 12
## [20440] {brown_bread,
## other_vegetables,
## pip_fruit,
## yogurt} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [20441] {brown_bread,
## pip_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [20442] {brown_bread,
## other_vegetables,
## pip_fruit,
## whole_milk} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [20443] {brown_bread,
## other_vegetables,
## whole_milk,
## yogurt} => {pip_fruit} 0.001016777 0.3571429 0.002846975 4.7211022 10
## [20444] {other_vegetables,
## pip_fruit,
## whole_milk,
## yogurt} => {brown_bread} 0.001016777 0.2000000 0.005083884 3.0830721 10
## [20445] {brown_bread,
## citrus_fruit,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [20446] {brown_bread,
## citrus_fruit,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001220132 0.7500000 0.001626843 3.8761167 12
## [20447] {brown_bread,
## citrus_fruit,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001220132 0.6315789 0.001931876 5.7943833 12
## [20448] {brown_bread,
## other_vegetables,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001220132 0.3870968 0.003152008 4.6770231 12
## [20449] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whole_milk} => {brown_bread} 0.001220132 0.2105263 0.005795628 3.2453391 12
## [20450] {brown_bread,
## other_vegetables,
## sausage,
## yogurt} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [20451] {brown_bread,
## sausage,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [20452] {brown_bread,
## other_vegetables,
## sausage,
## whole_milk} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [20453] {brown_bread,
## other_vegetables,
## whole_milk,
## yogurt} => {sausage} 0.001016777 0.3571429 0.002846975 3.8014069 10
## [20454] {other_vegetables,
## sausage,
## whole_milk,
## yogurt} => {brown_bread} 0.001016777 0.2702703 0.003762074 4.1663136 10
## [20455] {brown_bread,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [20456] {brown_bread,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [20457] {brown_bread,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001220132 0.4615385 0.002643620 4.2343571 12
## [20458] {brown_bread,
## other_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001220132 0.3870968 0.003152008 3.6890473 12
## [20459] {brown_bread,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [20460] {brown_bread,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [20461] {brown_bread,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001220132 0.4615385 0.002643620 3.3084772 12
## [20462] {brown_bread,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001220132 0.4285714 0.002846975 4.0843023 12
## [20463] {brown_bread,
## other_vegetables,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [20464] {brown_bread,
## rolls/buns,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [20465] {brown_bread,
## other_vegetables,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001016777 0.3225806 0.003152008 1.7537759 10
## [20466] {brown_bread,
## other_vegetables,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [20467] {brown_bread,
## other_vegetables,
## soda,
## yogurt} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [20468] {brown_bread,
## soda,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [20469] {brown_bread,
## other_vegetables,
## soda,
## whole_milk} => {yogurt} 0.001118454 0.4400000 0.002541942 3.1540816 11
## [20470] {brown_bread,
## other_vegetables,
## whole_milk,
## yogurt} => {soda} 0.001118454 0.3928571 0.002846975 2.2529155 11
## [20471] {other_vegetables,
## soda,
## whole_milk,
## yogurt} => {brown_bread} 0.001118454 0.2558140 0.004372140 3.9434643 11
## [20472] {butter,
## margarine,
## other_vegetables,
## yogurt} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [20473] {butter,
## margarine,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [20474] {butter,
## margarine,
## other_vegetables,
## whole_milk} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [20475] {margarine,
## other_vegetables,
## whole_milk,
## yogurt} => {butter} 0.001016777 0.3225806 0.003152008 5.8212489 10
## [20476] {butter,
## other_vegetables,
## whole_milk,
## yogurt} => {margarine} 0.001016777 0.2325581 0.004372140 3.9708495 10
## [20477] {domestic_eggs,
## margarine,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [20478] {domestic_eggs,
## margarine,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [20479] {domestic_eggs,
## margarine,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001118454 0.4583333 0.002440264 4.2049518 11
## [20480] {margarine,
## other_vegetables,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001118454 0.3437500 0.003253686 5.4179187 11
## [20481] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## whole_milk} => {margarine} 0.001118454 0.2444444 0.004575496 4.1738040 11
## [20482] {margarine,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [20483] {margarine,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001016777 0.7692308 0.001321810 5.5141287 10
## [20484] {margarine,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001016777 0.5882353 0.001728521 5.6059052 10
## [20485] {margarine,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001016777 0.4545455 0.002236909 6.3410703 10
## [20486] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {margarine} 0.001016777 0.2857143 0.003558719 4.8784722 10
## [20487] {margarine,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [20488] {margarine,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001016777 0.7142857 0.001423488 5.1202624 10
## [20489] {margarine,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.5263158 0.001931876 5.0158099 10
## [20490] {margarine,
## tropical_fruit,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001016777 0.5263158 0.001931876 7.3422919 10
## [20491] {tropical_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {margarine} 0.001016777 0.2325581 0.004372140 3.9708495 10
## [20492] {margarine,
## other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [20493] {margarine,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [20494] {margarine,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001118454 0.5238095 0.002135231 4.8056592 11
## [20495] {margarine,
## other_vegetables,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.3437500 0.003253686 4.7954344 11
## [20496] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {margarine} 0.001118454 0.2156863 0.005185562 3.6827682 11
## [20497] {margarine,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [20498] {margarine,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.5789474 0.001931876 2.9920901 11
## [20499] {margarine,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.5238095 0.002135231 3.7548591 11
## [20500] {margarine,
## other_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3548387 0.003152008 4.9501258 11
## [20501] {other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {margarine} 0.001118454 0.2000000 0.005592272 3.4149306 11
## [20502] {margarine,
## root_vegetables,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [20503] {margarine,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001016777 0.7692308 0.001321810 5.5141287 10
## [20504] {margarine,
## other_vegetables,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001016777 0.4545455 0.002236909 4.1702001 10
## [20505] {margarine,
## other_vegetables,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001016777 0.5263158 0.001931876 5.0158099 10
## [20506] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## yogurt} => {margarine} 0.001016777 0.2040816 0.004982206 3.4846230 10
## [20507] {margarine,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [20508] {margarine,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.8333333 0.001220132 5.9736395 10
## [20509] {margarine,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001016777 0.5263158 0.001931876 4.8286528 10
## [20510] {margarine,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.4761905 0.002135231 4.5381137 10
## [20511] {margarine,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.4545455 0.002236909 1.7789314 10
## [20512] {margarine,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [20513] {margarine,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [20514] {margarine,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.3225806 0.003152008 3.0742061 10
## [20515] {margarine,
## rolls/buns,
## root_vegetables,
## yogurt} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [20516] {margarine,
## root_vegetables,
## whole_milk,
## yogurt} => {rolls/buns} 0.001118454 0.5238095 0.002135231 2.8477980 11
## [20517] {margarine,
## rolls/buns,
## root_vegetables,
## whole_milk} => {yogurt} 0.001118454 0.5500000 0.002033554 3.9426020 11
## [20518] {margarine,
## rolls/buns,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.4230769 0.002643620 3.8814940 11
## [20519] {rolls/buns,
## root_vegetables,
## whole_milk,
## yogurt} => {margarine} 0.001118454 0.2391304 0.004677173 4.0830691 11
## [20520] {margarine,
## other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [20521] {margarine,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [20522] {margarine,
## other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.001321810 0.4062500 0.003253686 2.9121492 13
## [20523] {margarine,
## other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.001321810 0.4193548 0.003152008 3.8473459 13
## [20524] {margarine,
## other_vegetables,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [20525] {margarine,
## rolls/buns,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001118454 0.5500000 0.002033554 2.8424855 11
## [20526] {margarine,
## other_vegetables,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001118454 0.3437500 0.003253686 1.8688675 11
## [20527] {margarine,
## other_vegetables,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001118454 0.3548387 0.003152008 3.2554466 11
## [20528] {margarine,
## other_vegetables,
## rolls/buns,
## yogurt} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [20529] {margarine,
## rolls/buns,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.4230769 0.002643620 2.1865273 11
## [20530] {margarine,
## other_vegetables,
## whole_milk,
## yogurt} => {rolls/buns} 0.001118454 0.3548387 0.003152008 1.9291535 11
## [20531] {margarine,
## other_vegetables,
## rolls/buns,
## whole_milk} => {yogurt} 0.001118454 0.3548387 0.003152008 2.5436142 11
## [20532] {butter,
## domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001220132 1.0000000 0.001220132 3.9136490 12
## [20533] {butter,
## domestic_eggs,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001220132 0.7500000 0.001626843 3.8761167 12
## [20534] {butter,
## domestic_eggs,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.4000000 0.003050330 5.5801418 12
## [20535] {butter,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001220132 0.3076923 0.003965430 4.8496055 12
## [20536] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001220132 0.3428571 0.003558719 6.1871560 12
## [20537] {butter,
## domestic_eggs,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001118454 0.8461538 0.001321810 4.3730547 11
## [20538] {butter,
## domestic_eggs,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001118454 0.6470588 0.001728521 4.6383553 11
## [20539] {butter,
## domestic_eggs,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001118454 0.6470588 0.001728521 6.1664957 11
## [20540] {butter,
## other_vegetables,
## tropical_fruit,
## yogurt} => {domestic_eggs} 0.001118454 0.3666667 0.003050330 5.7791132 11
## [20541] {domestic_eggs,
## other_vegetables,
## tropical_fruit,
## yogurt} => {butter} 0.001118454 0.5238095 0.002135231 9.4525994 11
## [20542] {butter,
## domestic_eggs,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001220132 0.9230769 0.001321810 3.6125991 12
## [20543] {butter,
## domestic_eggs,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001220132 0.6666667 0.001830198 4.7789116 12
## [20544] {butter,
## domestic_eggs,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001220132 0.5454545 0.002236909 5.1982030 12
## [20545] {butter,
## tropical_fruit,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001220132 0.3636364 0.003355363 5.7313520 12
## [20546] {domestic_eggs,
## tropical_fruit,
## whole_milk,
## yogurt} => {butter} 0.001220132 0.4137931 0.002948653 7.4672572 12
## [20547] {butter,
## domestic_eggs,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [20548] {butter,
## domestic_eggs,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001321810 0.7222222 0.001830198 3.7325568 13
## [20549] {butter,
## domestic_eggs,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001321810 0.4333333 0.003050330 4.1296835 13
## [20550] {butter,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.001321810 0.3939394 0.003355363 6.2089646 13
## [20551] {domestic_eggs,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {butter} 0.001321810 0.4333333 0.003050330 7.8198777 13
## [20552] {butter,
## domestic_eggs,
## root_vegetables,
## yogurt} => {whole_milk} 0.001118454 0.9166667 0.001220132 3.5875116 11
## [20553] {butter,
## domestic_eggs,
## root_vegetables,
## whole_milk} => {yogurt} 0.001118454 0.4583333 0.002440264 3.2855017 11
## [20554] {butter,
## domestic_eggs,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.5000000 0.002236909 4.5872201 11
## [20555] {butter,
## root_vegetables,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001118454 0.3666667 0.003050330 5.7791132 11
## [20556] {domestic_eggs,
## root_vegetables,
## whole_milk,
## yogurt} => {butter} 0.001118454 0.4400000 0.002541942 7.9401835 11
## [20557] {butter,
## domestic_eggs,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001423488 0.7368421 0.001931876 2.8837414 14
## [20558] {butter,
## domestic_eggs,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001423488 0.5833333 0.002440264 3.0147574 14
## [20559] {butter,
## domestic_eggs,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001423488 0.4666667 0.003050330 4.2814055 14
## [20560] {butter,
## other_vegetables,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001423488 0.3414634 0.004168785 5.3818793 14
## [20561] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## whole_milk} => {butter} 0.001423488 0.3111111 0.004575496 5.6142712 14
## [20562] {butter,
## domestic_eggs,
## other_vegetables,
## yogurt} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [20563] {butter,
## domestic_eggs,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [20564] {butter,
## domestic_eggs,
## other_vegetables,
## whole_milk} => {yogurt} 0.001321810 0.4333333 0.003050330 3.1062925 13
## [20565] {butter,
## other_vegetables,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001321810 0.3023256 0.004372140 4.7650194 13
## [20566] {domestic_eggs,
## other_vegetables,
## whole_milk,
## yogurt} => {butter} 0.001321810 0.3939394 0.003355363 7.1089797 13
## [20567] {butter,
## fruit/vegetable_juice,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001016777 1.0000000 0.001016777 5.1681555 10
## [20568] {butter,
## fruit/vegetable_juice,
## other_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001016777 0.7142857 0.001423488 6.8071705 10
## [20569] {butter,
## fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001016777 0.6666667 0.001525165 9.3002364 10
## [20570] {butter,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {fruit/vegetable_juice} 0.001016777 0.4347826 0.002338587 6.0141870 10
## [20571] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {butter} 0.001016777 0.5263158 0.001931876 9.4978271 10
## [20572] {butter,
## fruit/vegetable_juice,
## other_vegetables,
## yogurt} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [20573] {butter,
## fruit/vegetable_juice,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [20574] {butter,
## fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [20575] {butter,
## other_vegetables,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.2325581 0.004372140 3.2168907 10
## [20576] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk,
## yogurt} => {butter} 0.001016777 0.2000000 0.005083884 3.6091743 10
## [20577] {butter,
## other_vegetables,
## pip_fruit,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.8666667 0.001525165 3.3918292 13
## [20578] {butter,
## pip_fruit,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001321810 0.7222222 0.001830198 3.7325568 13
## [20579] {butter,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {pip_fruit} 0.001321810 0.3333333 0.003965430 4.4063620 13
## [20580] {butter,
## other_vegetables,
## pip_fruit,
## whole_milk} => {whipped/sour_cream} 0.001321810 0.4814815 0.002745297 6.7168374 13
## [20581] {other_vegetables,
## pip_fruit,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001321810 0.3611111 0.003660397 6.5165647 13
## [20582] {butter,
## other_vegetables,
## sausage,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [20583] {butter,
## sausage,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [20584] {butter,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {sausage} 0.001118454 0.2820513 0.003965430 3.0021368 11
## [20585] {butter,
## other_vegetables,
## sausage,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.4782609 0.002338587 6.6719087 11
## [20586] {other_vegetables,
## sausage,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001118454 0.3793103 0.002948653 6.8449858 11
## [20587] {butter,
## root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001118454 0.8461538 0.001321810 4.3730547 11
## [20588] {butter,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {root_vegetables} 0.001118454 0.4782609 0.002338587 4.3877758 11
## [20589] {butter,
## other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001118454 0.5238095 0.002135231 4.9919251 11
## [20590] {butter,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001118454 0.4782609 0.002338587 6.6719087 11
## [20591] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {butter} 0.001118454 0.3333333 0.003355363 6.0152905 11
## [20592] {butter,
## root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [20593] {butter,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001016777 0.4761905 0.002135231 4.3687811 10
## [20594] {butter,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001016777 0.3846154 0.002643620 3.6653995 10
## [20595] {butter,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.4166667 0.002440264 5.8126478 10
## [20596] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001016777 0.3703704 0.002745297 6.6836561 10
## [20597] {butter,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001220132 0.8000000 0.001525165 4.1345244 12
## [20598] {butter,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001220132 0.5217391 0.002338587 3.7400177 12
## [20599] {butter,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001220132 0.5714286 0.002135231 5.4457364 12
## [20600] {butter,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001220132 0.4000000 0.003050330 5.5801418 12
## [20601] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {butter} 0.001220132 0.3428571 0.003558719 6.1871560 12
## [20602] {butter,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001220132 0.8000000 0.001525165 3.1309192 12
## [20603] {butter,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001220132 0.5714286 0.002135231 4.0962099 12
## [20604] {butter,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001220132 0.4615385 0.002643620 4.3984794 12
## [20605] {butter,
## tropical_fruit,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001220132 0.3636364 0.003355363 5.0728562 12
## [20606] {tropical_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {butter} 0.001220132 0.2790698 0.004372140 5.0360572 12
## [20607] {butter,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001626843 0.6956522 0.002338587 2.7225385 16
## [20608] {butter,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001626843 0.7619048 0.002135231 3.9376423 16
## [20609] {butter,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001626843 0.4102564 0.003965430 3.9097595 16
## [20610] {butter,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001626843 0.4848485 0.003355363 6.7638083 16
## [20611] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001626843 0.3636364 0.004473818 6.5621351 16
## [20612] {butter,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [20613] {butter,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.4230769 0.002643620 3.0327708 11
## [20614] {butter,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.4230769 0.002643620 3.8814940 11
## [20615] {butter,
## root_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3666667 0.003050330 5.1151300 11
## [20616] {root_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {butter} 0.001118454 0.3055556 0.003660397 5.5140163 11
## [20617] {butter,
## rolls/buns,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [20618] {butter,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001016777 0.3846154 0.002643620 2.0910405 10
## [20619] {butter,
## rolls/buns,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001016777 0.6250000 0.001626843 5.7340252 10
## [20620] {butter,
## rolls/buns,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.4347826 0.002338587 6.0653716 10
## [20621] {rolls/buns,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001016777 0.3571429 0.002846975 6.4449541 10
## [20622] {butter,
## other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001626843 0.7619048 0.002135231 2.9818278 16
## [20623] {butter,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001626843 0.6153846 0.002643620 3.1804034 16
## [20624] {butter,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001626843 0.4102564 0.003965430 3.7638729 16
## [20625] {butter,
## other_vegetables,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001626843 0.3902439 0.004168785 5.4440408 16
## [20626] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001626843 0.3137255 0.005185562 5.6614499 16
## [20627] {butter,
## other_vegetables,
## soda,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [20628] {butter,
## soda,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001016777 0.9090909 0.001118454 4.6983232 10
## [20629] {butter,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {soda} 0.001016777 0.2564103 0.003965430 1.4704343 10
## [20630] {butter,
## other_vegetables,
## soda,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.6250000 0.001626843 8.7189716 10
## [20631] {other_vegetables,
## soda,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001016777 0.3571429 0.002846975 6.4449541 10
## [20632] {butter,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [20633] {butter,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001525165 0.5769231 0.002643620 2.9816282 15
## [20634] {butter,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001525165 0.3846154 0.003965430 2.7570644 15
## [20635] {butter,
## other_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001525165 0.3488372 0.004372140 4.8664028 15
## [20636] {other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {butter} 0.001525165 0.2727273 0.005592272 4.9216013 15
## [20637] {butter,
## other_vegetables,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.8000000 0.001525165 3.1309192 12
## [20638] {butter,
## rolls/buns,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001220132 0.7500000 0.001626843 3.8761167 12
## [20639] {butter,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001220132 0.3076923 0.003965430 1.6728324 12
## [20640] {butter,
## other_vegetables,
## rolls/buns,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.4285714 0.002846975 5.9787234 12
## [20641] {other_vegetables,
## rolls/buns,
## whipped/sour_cream,
## whole_milk} => {butter} 0.001220132 0.3243243 0.003762074 5.8527151 12
## [20642] {butter,
## other_vegetables,
## pip_fruit,
## yogurt} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [20643] {butter,
## pip_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [20644] {butter,
## other_vegetables,
## pip_fruit,
## whole_milk} => {yogurt} 0.001016777 0.3703704 0.002745297 2.6549509 10
## [20645] {butter,
## other_vegetables,
## whole_milk,
## yogurt} => {pip_fruit} 0.001016777 0.2325581 0.004372140 3.0742061 10
## [20646] {other_vegetables,
## pip_fruit,
## whole_milk,
## yogurt} => {butter} 0.001016777 0.2000000 0.005083884 3.6091743 10
## [20647] {bottled_water,
## butter,
## citrus_fruit,
## other_vegetables} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [20648] {bottled_water,
## butter,
## citrus_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [20649] {butter,
## citrus_fruit,
## other_vegetables,
## whole_milk} => {bottled_water} 0.001016777 0.3448276 0.002948653 3.1199442 10
## [20650] {bottled_water,
## butter,
## other_vegetables,
## whole_milk} => {citrus_fruit} 0.001016777 0.3846154 0.002643620 4.6470421 10
## [20651] {bottled_water,
## citrus_fruit,
## other_vegetables,
## whole_milk} => {butter} 0.001016777 0.3448276 0.002948653 6.2227143 10
## [20652] {butter,
## citrus_fruit,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [20653] {butter,
## citrus_fruit,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [20654] {butter,
## citrus_fruit,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001016777 0.3448276 0.002948653 3.2862203 10
## [20655] {butter,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001016777 0.3030303 0.003355363 3.6613059 10
## [20656] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {butter} 0.001016777 0.2040816 0.004982206 3.6828309 10
## [20657] {butter,
## citrus_fruit,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [20658] {butter,
## citrus_fruit,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [20659] {butter,
## citrus_fruit,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001220132 0.4137931 0.002948653 3.7963201 12
## [20660] {butter,
## other_vegetables,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001220132 0.2926829 0.004168785 3.5362857 12
## [20661] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whole_milk} => {butter} 0.001220132 0.2105263 0.005795628 3.7991309 12
## [20662] {bottled_water,
## butter,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001423488 0.7777778 0.001830198 3.0439492 14
## [20663] {bottled_water,
## butter,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001423488 0.5833333 0.002440264 3.0147574 14
## [20664] {bottled_water,
## butter,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001423488 0.5384615 0.002643620 4.9400832 14
## [20665] {butter,
## other_vegetables,
## root_vegetables,
## whole_milk} => {bottled_water} 0.001423488 0.3414634 0.004168785 3.0895057 14
## [20666] {bottled_water,
## other_vegetables,
## root_vegetables,
## whole_milk} => {butter} 0.001423488 0.3589744 0.003965430 6.4780052 14
## [20667] {butter,
## root_vegetables,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001321810 0.6842105 0.001931876 3.5361064 13
## [20668] {butter,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001321810 0.5652174 0.002338587 4.0516859 13
## [20669] {butter,
## other_vegetables,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001321810 0.4333333 0.003050330 3.9755908 13
## [20670] {butter,
## other_vegetables,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001321810 0.6190476 0.002135231 5.8995478 13
## [20671] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## yogurt} => {butter} 0.001321810 0.2653061 0.004982206 4.7876802 13
## [20672] {butter,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001728521 0.8947368 0.001931876 3.5016860 17
## [20673] {butter,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001728521 0.7083333 0.002440264 5.0775935 17
## [20674] {butter,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001728521 0.5151515 0.003355363 4.7262268 17
## [20675] {butter,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001728521 0.5666667 0.003050330 5.4003553 17
## [20676] {root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {butter} 0.001728521 0.3035714 0.005693950 5.4782110 17
## [20677] {butter,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001525165 0.6521739 0.002338587 2.5523798 15
## [20678] {butter,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001525165 0.6250000 0.002440264 3.2300972 15
## [20679] {butter,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001525165 0.4545455 0.003355363 4.1702001 15
## [20680] {butter,
## other_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001525165 0.3658537 0.004168785 3.4865995 15
## [20681] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {butter} 0.001525165 0.2173913 0.007015760 3.9230156 15
## [20682] {butter,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.002338587 0.7666667 0.003050330 3.0004643 23
## [20683] {butter,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.002338587 0.6969697 0.003355363 3.6020478 23
## [20684] {butter,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.002338587 0.6969697 0.003355363 4.9961348 23
## [20685] {butter,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.002338587 0.5348837 0.004372140 5.0974626 23
## [20686] {other_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {butter} 0.002338587 0.3066667 0.007625826 5.5340673 23
## [20687] {butter,
## other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.001626843 0.7619048 0.002135231 2.9818278 16
## [20688] {butter,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001626843 0.5333333 0.003050330 2.7563496 16
## [20689] {butter,
## other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.001626843 0.3902439 0.004168785 2.7974116 16
## [20690] {butter,
## other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.001626843 0.3720930 0.004372140 3.4137452 16
## [20691] {other_vegetables,
## root_vegetables,
## whole_milk,
## yogurt} => {butter} 0.001626843 0.2077922 0.007829181 3.7497915 16
## [20692] {butter,
## other_vegetables,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001525165 0.6250000 0.002440264 2.4460306 15
## [20693] {butter,
## rolls/buns,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001525165 0.6521739 0.002338587 3.3705362 15
## [20694] {butter,
## other_vegetables,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001525165 0.3658537 0.004168785 1.9890385 15
## [20695] {butter,
## other_vegetables,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001525165 0.5357143 0.002846975 4.9148787 15
## [20696] {other_vegetables,
## rolls/buns,
## root_vegetables,
## whole_milk} => {butter} 0.001525165 0.2459016 0.006202339 4.4375094 15
## [20697] {citrus_fruit,
## newspapers,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [20698] {citrus_fruit,
## newspapers,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [20699] {citrus_fruit,
## newspapers,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001016777 0.5000000 0.002033554 4.5872201 10
## [20700] {newspapers,
## other_vegetables,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001016777 0.3333333 0.003050330 4.0274365 10
## [20701] {bottled_water,
## newspapers,
## soda,
## yogurt} => {rolls/buns} 0.001016777 0.6250000 0.001626843 3.3979409 10
## [20702] {bottled_water,
## newspapers,
## rolls/buns,
## soda} => {yogurt} 0.001016777 0.6666667 0.001525165 4.7789116 10
## [20703] {bottled_water,
## newspapers,
## rolls/buns,
## yogurt} => {soda} 0.001016777 0.7692308 0.001321810 4.4113030 10
## [20704] {newspapers,
## rolls/buns,
## soda,
## yogurt} => {bottled_water} 0.001016777 0.5555556 0.001830198 5.0265767 10
## [20705] {bottled_water,
## rolls/buns,
## soda,
## yogurt} => {newspapers} 0.001016777 0.3333333 0.003050330 4.1762208 10
## [20706] {newspapers,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [20707] {newspapers,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [20708] {newspapers,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001118454 0.4583333 0.002440264 4.2049518 11
## [20709] {newspapers,
## other_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001118454 0.3666667 0.003050330 3.4943475 11
## [20710] {newspapers,
## other_vegetables,
## soda,
## tropical_fruit} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [20711] {newspapers,
## soda,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001118454 0.8461538 0.001321810 4.3730547 11
## [20712] {newspapers,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {soda} 0.001118454 0.4583333 0.002440264 2.6284014 11
## [20713] {newspapers,
## other_vegetables,
## soda,
## whole_milk} => {tropical_fruit} 0.001118454 0.4400000 0.002541942 4.1932171 11
## [20714] {other_vegetables,
## soda,
## tropical_fruit,
## whole_milk} => {newspapers} 0.001118454 0.3666667 0.003050330 4.5938429 11
## [20715] {newspapers,
## rolls/buns,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [20716] {newspapers,
## other_vegetables,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001016777 0.4761905 0.002135231 2.5889073 10
## [20717] {newspapers,
## other_vegetables,
## rolls/buns,
## tropical_fruit} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [20718] {newspapers,
## other_vegetables,
## rolls/buns,
## yogurt} => {tropical_fruit} 0.001016777 0.5263158 0.001931876 5.0158099 10
## [20719] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## yogurt} => {newspapers} 0.001016777 0.2702703 0.003762074 3.3861250 10
## [20720] {newspapers,
## rolls/buns,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [20721] {newspapers,
## tropical_fruit,
## whole_milk,
## yogurt} => {rolls/buns} 0.001118454 0.5000000 0.002236909 2.7183527 11
## [20722] {newspapers,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.6470588 0.001728521 4.6383553 11
## [20723] {newspapers,
## rolls/buns,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.4230769 0.002643620 4.0319395 11
## [20724] {rolls/buns,
## tropical_fruit,
## whole_milk,
## yogurt} => {newspapers} 0.001118454 0.2291667 0.004880529 2.8711518 11
## [20725] {newspapers,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001321810 0.6190476 0.002135231 2.4227351 13
## [20726] {newspapers,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [20727] {newspapers,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001321810 0.5416667 0.002440264 3.8828656 13
## [20728] {newspapers,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001321810 0.4642857 0.002846975 4.4246609 13
## [20729] {newspapers,
## other_vegetables,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [20730] {newspapers,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [20731] {newspapers,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001016777 0.4166667 0.002440264 2.2652939 10
## [20732] {newspapers,
## other_vegetables,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001016777 0.3571429 0.002846975 3.4035853 10
## [20733] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {newspapers} 0.001016777 0.2500000 0.004067107 3.1321656 10
## [20734] {newspapers,
## other_vegetables,
## rolls/buns,
## soda} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [20735] {newspapers,
## rolls/buns,
## soda,
## whole_milk} => {other_vegetables} 0.001016777 1.0000000 0.001016777 5.1681555 10
## [20736] {newspapers,
## other_vegetables,
## soda,
## whole_milk} => {rolls/buns} 0.001016777 0.4000000 0.002541942 2.1746821 10
## [20737] {newspapers,
## other_vegetables,
## rolls/buns,
## whole_milk} => {soda} 0.001016777 0.3571429 0.002846975 2.0481050 10
## [20738] {other_vegetables,
## rolls/buns,
## soda,
## whole_milk} => {newspapers} 0.001016777 0.2325581 0.004372140 2.9136424 10
## [20739] {newspapers,
## other_vegetables,
## rolls/buns,
## yogurt} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [20740] {newspapers,
## rolls/buns,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.4615385 0.002643620 2.3853026 12
## [20741] {newspapers,
## other_vegetables,
## whole_milk,
## yogurt} => {rolls/buns} 0.001220132 0.4285714 0.002846975 2.3300166 12
## [20742] {newspapers,
## other_vegetables,
## rolls/buns,
## whole_milk} => {yogurt} 0.001220132 0.4285714 0.002846975 3.0721574 12
## [20743] {other_vegetables,
## rolls/buns,
## whole_milk,
## yogurt} => {newspapers} 0.001220132 0.2033898 0.005998983 2.5482025 12
## [20744] {domestic_eggs,
## fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [20745] {domestic_eggs,
## fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [20746] {domestic_eggs,
## fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001118454 0.5238095 0.002135231 4.8056592 11
## [20747] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.2444444 0.004575496 3.3813096 11
## [20748] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001118454 0.2820513 0.003965430 4.4454717 11
## [20749] {domestic_eggs,
## other_vegetables,
## pip_fruit,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.9230769 0.001321810 3.6125991 12
## [20750] {domestic_eggs,
## pip_fruit,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001220132 0.8000000 0.001525165 4.1345244 12
## [20751] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {pip_fruit} 0.001220132 0.3428571 0.003558719 4.5322581 12
## [20752] {domestic_eggs,
## other_vegetables,
## pip_fruit,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.4615385 0.002643620 6.4386252 12
## [20753] {other_vegetables,
## pip_fruit,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001220132 0.3333333 0.003660397 5.2537393 12
## [20754] {citrus_fruit,
## domestic_eggs,
## other_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [20755] {citrus_fruit,
## domestic_eggs,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001220132 0.9230769 0.001321810 4.7706051 12
## [20756] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.001220132 0.3428571 0.003558719 4.1425061 12
## [20757] {citrus_fruit,
## domestic_eggs,
## other_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.4285714 0.002846975 5.9787234 12
## [20758] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001220132 0.3333333 0.003660397 5.2537393 12
## [20759] {domestic_eggs,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.9166667 0.001220132 3.5875116 11
## [20760] {domestic_eggs,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.6111111 0.001830198 4.3806689 11
## [20761] {domestic_eggs,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.5000000 0.002236909 4.7650194 11
## [20762] {domestic_eggs,
## tropical_fruit,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3793103 0.002948653 5.2915138 11
## [20763] {tropical_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001118454 0.2558140 0.004372140 4.0319395 11
## [20764] {domestic_eggs,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.9166667 0.001220132 3.5875116 11
## [20765] {domestic_eggs,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [20766] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001118454 0.3142857 0.003558719 2.9951550 11
## [20767] {domestic_eggs,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.3666667 0.003050330 5.1151300 11
## [20768] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001118454 0.2500000 0.004473818 3.9403045 11
## [20769] {domestic_eggs,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [20770] {domestic_eggs,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.5500000 0.002033554 3.9426020 11
## [20771] {domestic_eggs,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.5000000 0.002236909 4.5872201 11
## [20772] {domestic_eggs,
## root_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.4400000 0.002541942 6.1381560 11
## [20773] {root_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001118454 0.3055556 0.003660397 4.8159277 11
## [20774] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [20775] {domestic_eggs,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001321810 0.6500000 0.002033554 3.3593011 13
## [20776] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001321810 0.3714286 0.003558719 3.4076493 13
## [20777] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001321810 0.2888889 0.004575496 4.0301024 13
## [20778] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {domestic_eggs} 0.001321810 0.2549020 0.005185562 4.0175654 13
## [20779] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [20780] {domestic_eggs,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [20781] {domestic_eggs,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001321810 0.3714286 0.003558719 2.6625364 13
## [20782] {domestic_eggs,
## other_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001321810 0.3939394 0.003355363 5.4955942 13
## [20783] {other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001321810 0.2363636 0.005592272 3.7253788 13
## [20784] {domestic_eggs,
## other_vegetables,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [20785] {domestic_eggs,
## pip_fruit,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001220132 0.6666667 0.001830198 3.4454370 12
## [20786] {domestic_eggs,
## other_vegetables,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001220132 0.4615385 0.002643620 4.2343571 12
## [20787] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001220132 0.2666667 0.004575496 3.5250896 12
## [20788] {other_vegetables,
## pip_fruit,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001220132 0.2222222 0.005490595 3.5024929 12
## [20789] {domestic_eggs,
## other_vegetables,
## pastry,
## yogurt} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [20790] {domestic_eggs,
## pastry,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [20791] {domestic_eggs,
## other_vegetables,
## pastry,
## whole_milk} => {yogurt} 0.001016777 0.4545455 0.002236909 3.2583488 10
## [20792] {domestic_eggs,
## other_vegetables,
## whole_milk,
## yogurt} => {pastry} 0.001016777 0.3030303 0.003355363 3.4060606 10
## [20793] {other_vegetables,
## pastry,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001016777 0.2500000 0.004067107 3.9403045 10
## [20794] {citrus_fruit,
## domestic_eggs,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [20795] {citrus_fruit,
## domestic_eggs,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [20796] {citrus_fruit,
## domestic_eggs,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001016777 0.3571429 0.002846975 3.4035853 10
## [20797] {domestic_eggs,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001016777 0.3333333 0.003050330 4.0274365 10
## [20798] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.001016777 0.2040816 0.004982206 3.2165751 10
## [20799] {citrus_fruit,
## domestic_eggs,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [20800] {citrus_fruit,
## domestic_eggs,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001220132 0.8571429 0.001423488 4.4298476 12
## [20801] {citrus_fruit,
## domestic_eggs,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001220132 0.4285714 0.002846975 3.9319030 12
## [20802] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001220132 0.2666667 0.004575496 3.2219492 12
## [20803] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whole_milk} => {domestic_eggs} 0.001220132 0.2105263 0.005795628 3.3181511 12
## [20804] {citrus_fruit,
## domestic_eggs,
## other_vegetables,
## yogurt} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [20805] {citrus_fruit,
## domestic_eggs,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [20806] {citrus_fruit,
## domestic_eggs,
## other_vegetables,
## whole_milk} => {yogurt} 0.001016777 0.3571429 0.002846975 2.5601312 10
## [20807] {domestic_eggs,
## other_vegetables,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001016777 0.3030303 0.003355363 3.6613059 10
## [20808] {citrus_fruit,
## other_vegetables,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001016777 0.2127660 0.004778851 3.3534506 10
## [20809] {domestic_eggs,
## root_vegetables,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [20810] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001118454 0.5789474 0.001931876 4.1501074 11
## [20811] {domestic_eggs,
## other_vegetables,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001118454 0.5238095 0.002135231 4.8056592 11
## [20812] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001118454 0.5789474 0.001931876 5.5173909 11
## [20813] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## yogurt} => {domestic_eggs} 0.001118454 0.2244898 0.004982206 3.5382326 11
## [20814] {domestic_eggs,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001525165 0.8333333 0.001830198 3.2613742 15
## [20815] {domestic_eggs,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001525165 0.5555556 0.002745297 3.9824263 15
## [20816] {domestic_eggs,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001525165 0.5172414 0.002948653 4.7454002 15
## [20817] {domestic_eggs,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001525165 0.6000000 0.002541942 5.7180233 15
## [20818] {root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001525165 0.2678571 0.005693950 4.2217548 15
## [20819] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001525165 0.7894737 0.001931876 3.0897229 15
## [20820] {domestic_eggs,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001525165 0.5555556 0.002745297 2.8711975 15
## [20821] {domestic_eggs,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001525165 0.5000000 0.003050330 4.5872201 15
## [20822] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001525165 0.3333333 0.004575496 3.1766796 15
## [20823] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {domestic_eggs} 0.001525165 0.2173913 0.007015760 3.4263517 15
## [20824] {domestic_eggs,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001626843 0.7619048 0.002135231 2.9818278 16
## [20825] {domestic_eggs,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001626843 0.5517241 0.002948653 2.8513962 16
## [20826] {domestic_eggs,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001626843 0.5333333 0.003050330 3.8231293 16
## [20827] {domestic_eggs,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001626843 0.4848485 0.003355363 4.6206249 16
## [20828] {other_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001626843 0.2133333 0.007625826 3.3623932 16
## [20829] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## soda} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [20830] {domestic_eggs,
## root_vegetables,
## soda,
## whole_milk} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [20831] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## whole_milk} => {soda} 0.001016777 0.2222222 0.004575496 1.2743764 10
## [20832] {domestic_eggs,
## other_vegetables,
## soda,
## whole_milk} => {root_vegetables} 0.001016777 0.4000000 0.002541942 3.6697761 10
## [20833] {other_vegetables,
## root_vegetables,
## soda,
## whole_milk} => {domestic_eggs} 0.001016777 0.2272727 0.004473818 3.5820950 10
## [20834] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.001423488 0.7368421 0.001931876 2.8837414 14
## [20835] {domestic_eggs,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001423488 0.5600000 0.002541942 2.8941671 14
## [20836] {domestic_eggs,
## other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.001423488 0.3111111 0.004575496 2.2301587 14
## [20837] {domestic_eggs,
## other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.001423488 0.4242424 0.003355363 3.8921868 14
## [20838] {fruit/vegetable_juice,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001118454 0.9166667 0.001220132 4.7374759 11
## [20839] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001118454 0.5789474 0.001931876 4.1501074 11
## [20840] {fruit/vegetable_juice,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001118454 0.4782609 0.002338587 4.5578446 11
## [20841] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3928571 0.002846975 5.4804965 11
## [20842] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.3142857 0.003558719 4.3473980 11
## [20843] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.5263158 0.001931876 2.0598153 10
## [20844] {fruit/vegetable_juice,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001016777 0.9090909 0.001118454 4.6983232 10
## [20845] {fruit/vegetable_juice,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001016777 0.4545455 0.002236909 4.3318358 10
## [20846] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.3125000 0.003253686 4.3594858 10
## [20847] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.2272727 0.004473818 3.1437796 10
## [20848] {fruit/vegetable_juice,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [20849] {fruit/vegetable_juice,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [20850] {fruit/vegetable_juice,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {root_vegetables} 0.001016777 0.5263158 0.001931876 4.8286528 10
## [20851] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001016777 0.4000000 0.002541942 5.5801418 10
## [20852] {root_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.2777778 0.003660397 3.8423972 10
## [20853] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [20854] {fruit/vegetable_juice,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [20855] {fruit/vegetable_juice,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001118454 0.5000000 0.002236909 4.5872201 11
## [20856] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.2820513 0.003965430 3.9347154 11
## [20857] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.2156863 0.005185562 2.9835085 11
## [20858] {fruit/vegetable_juice,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001423488 0.6086957 0.002338587 2.3822211 14
## [20859] {fruit/vegetable_juice,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001423488 0.7368421 0.001931876 3.8081146 14
## [20860] {fruit/vegetable_juice,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001423488 0.6363636 0.002236909 4.5616883 14
## [20861] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001423488 0.2800000 0.005083884 3.9060993 14
## [20862] {other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001423488 0.2545455 0.005592272 3.5210331 14
## [20863] {fruit/vegetable_juice,
## pip_fruit,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [20864] {fruit/vegetable_juice,
## other_vegetables,
## pip_fruit,
## tropical_fruit} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [20865] {fruit/vegetable_juice,
## other_vegetables,
## pip_fruit,
## yogurt} => {tropical_fruit} 0.001016777 0.4545455 0.002236909 4.3318358 10
## [20866] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001016777 0.3571429 0.002846975 4.7211022 10
## [20867] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.2857143 0.003558719 3.9521800 10
## [20868] {fruit/vegetable_juice,
## other_vegetables,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [20869] {fruit/vegetable_juice,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [20870] {fruit/vegetable_juice,
## other_vegetables,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001016777 0.4166667 0.002440264 3.9708495 10
## [20871] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001016777 0.3125000 0.003253686 4.1309644 10
## [20872] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.2127660 0.004778851 2.9431128 10
## [20873] {fruit/vegetable_juice,
## pip_fruit,
## root_vegetables,
## yogurt} => {whole_milk} 0.001118454 0.9166667 0.001220132 3.5875116 11
## [20874] {fruit/vegetable_juice,
## pip_fruit,
## root_vegetables,
## whole_milk} => {yogurt} 0.001118454 0.5789474 0.001931876 4.1501074 11
## [20875] {fruit/vegetable_juice,
## pip_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.4782609 0.002338587 4.3877758 11
## [20876] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk,
## yogurt} => {pip_fruit} 0.001118454 0.4400000 0.002541942 5.8163978 11
## [20877] {pip_fruit,
## root_vegetables,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.3142857 0.003558719 4.3473980 11
## [20878] {fruit/vegetable_juice,
## other_vegetables,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001321810 0.8666667 0.001525165 3.3918292 13
## [20879] {fruit/vegetable_juice,
## pip_fruit,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001321810 0.6842105 0.001931876 3.5361064 13
## [20880] {fruit/vegetable_juice,
## other_vegetables,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001321810 0.5416667 0.002440264 4.9694885 13
## [20881] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001321810 0.3333333 0.003965430 4.4063620 13
## [20882] {other_vegetables,
## pip_fruit,
## root_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001321810 0.2407407 0.005490595 3.3300776 13
## [20883] {fruit/vegetable_juice,
## other_vegetables,
## pip_fruit,
## yogurt} => {whole_milk} 0.001525165 0.6818182 0.002236909 2.6683971 15
## [20884] {fruit/vegetable_juice,
## pip_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001525165 0.6521739 0.002338587 3.3705362 15
## [20885] {fruit/vegetable_juice,
## other_vegetables,
## pip_fruit,
## whole_milk} => {yogurt} 0.001525165 0.6250000 0.002440264 4.4802296 15
## [20886] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk,
## yogurt} => {pip_fruit} 0.001525165 0.3000000 0.005083884 3.9657258 15
## [20887] {other_vegetables,
## pip_fruit,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001525165 0.3000000 0.005083884 4.1497890 15
## [20888] {fruit/vegetable_juice,
## other_vegetables,
## pastry,
## yogurt} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [20889] {fruit/vegetable_juice,
## pastry,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.5263158 0.001931876 2.7200819 10
## [20890] {fruit/vegetable_juice,
## other_vegetables,
## pastry,
## whole_milk} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [20891] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk,
## yogurt} => {pastry} 0.001016777 0.2000000 0.005083884 2.2480000 10
## [20892] {other_vegetables,
## pastry,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001016777 0.2500000 0.004067107 3.4581575 10
## [20893] {citrus_fruit,
## fruit/vegetable_juice,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001220132 0.7500000 0.001626843 3.8761167 12
## [20894] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit} => {root_vegetables} 0.001220132 0.5217391 0.002338587 4.7866645 12
## [20895] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {tropical_fruit} 0.001220132 0.5217391 0.002338587 4.9721941 12
## [20896] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001220132 0.4800000 0.002541942 5.7995086 12
## [20897] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {fruit/vegetable_juice} 0.001220132 0.2727273 0.004473818 3.7725355 12
## [20898] {citrus_fruit,
## fruit/vegetable_juice,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [20899] {citrus_fruit,
## fruit/vegetable_juice,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001016777 0.6250000 0.001626843 5.7340252 10
## [20900] {citrus_fruit,
## fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001016777 0.5882353 0.001728521 5.6059052 10
## [20901] {fruit/vegetable_juice,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001016777 0.5555556 0.001830198 6.7123942 10
## [20902] {citrus_fruit,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {fruit/vegetable_juice} 0.001016777 0.2857143 0.003558719 3.9521800 10
## [20903] {citrus_fruit,
## fruit/vegetable_juice,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001118454 0.7857143 0.001423488 4.0606936 11
## [20904] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [20905] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables,
## yogurt} => {tropical_fruit} 0.001118454 0.6111111 0.001830198 5.8239126 11
## [20906] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit,
## yogurt} => {citrus_fruit} 0.001118454 0.3928571 0.002846975 4.7466216 11
## [20907] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.3548387 0.003152008 4.9083526 11
## [20908] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [20909] {citrus_fruit,
## fruit/vegetable_juice,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001321810 0.8125000 0.001626843 4.1991264 13
## [20910] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001321810 0.5200000 0.002541942 4.9556202 13
## [20911] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001321810 0.4062500 0.003253686 4.9084383 13
## [20912] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {fruit/vegetable_juice} 0.001321810 0.2653061 0.004982206 3.6698815 13
## [20913] {citrus_fruit,
## fruit/vegetable_juice,
## root_vegetables,
## soda} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [20914] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {soda} 0.001016777 0.4347826 0.002338587 2.4933452 10
## [20915] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables,
## soda} => {root_vegetables} 0.001016777 0.9090909 0.001118454 8.3404003 10
## [20916] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## soda} => {citrus_fruit} 0.001016777 0.5263158 0.001931876 6.3591103 10
## [20917] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## soda} => {fruit/vegetable_juice} 0.001016777 0.4761905 0.002135231 6.5869667 10
## [20918] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001321810 0.5652174 0.002338587 2.2120625 13
## [20919] {citrus_fruit,
## fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001321810 0.7647059 0.001728521 3.9521189 13
## [20920] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001321810 0.5200000 0.002541942 4.7707090 13
## [20921] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001321810 0.3333333 0.003965430 4.0274365 13
## [20922] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001321810 0.2280702 0.005795628 3.1548104 13
## [20923] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables,
## yogurt} => {whole_milk} 0.001423488 0.7777778 0.001830198 3.0439492 14
## [20924] {citrus_fruit,
## fruit/vegetable_juice,
## whole_milk,
## yogurt} => {other_vegetables} 0.001423488 0.8235294 0.001728521 4.2561281 14
## [20925] {citrus_fruit,
## fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {yogurt} 0.001423488 0.5600000 0.002541942 4.0142857 14
## [20926] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001423488 0.2800000 0.005083884 3.3830467 14
## [20927] {citrus_fruit,
## other_vegetables,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001423488 0.2978723 0.004778851 4.1203579 14
## [20928] {bottled_water,
## fruit/vegetable_juice,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [20929] {bottled_water,
## fruit/vegetable_juice,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [20930] {bottled_water,
## fruit/vegetable_juice,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001118454 0.5000000 0.002236909 4.5872201 11
## [20931] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## whole_milk} => {bottled_water} 0.001118454 0.2820513 0.003965430 2.5519543 11
## [20932] {bottled_water,
## other_vegetables,
## root_vegetables,
## whole_milk} => {fruit/vegetable_juice} 0.001118454 0.2820513 0.003965430 3.9015111 11
## [20933] {fruit/vegetable_juice,
## root_vegetables,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001118454 0.8461538 0.001321810 4.3730547 11
## [20934] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001118454 0.4400000 0.002541942 3.1540816 11
## [20935] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001118454 0.3928571 0.002846975 3.6042444 11
## [20936] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001118454 0.4583333 0.002440264 4.3679344 11
## [20937] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## yogurt} => {fruit/vegetable_juice} 0.001118454 0.2244898 0.004982206 3.1052843 11
## [20938] {fruit/vegetable_juice,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [20939] {fruit/vegetable_juice,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.5555556 0.001830198 3.9824263 10
## [20940] {fruit/vegetable_juice,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [20941] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [20942] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001423488 0.5600000 0.002541942 2.1916435 14
## [20943] {fruit/vegetable_juice,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001423488 0.7777778 0.001830198 4.0196765 14
## [20944] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001423488 0.4375000 0.003253686 4.0138176 14
## [20945] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001423488 0.3589744 0.003965430 3.4210396 14
## [20946] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {fruit/vegetable_juice} 0.001423488 0.2028986 0.007015760 2.8066206 14
## [20947] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001830198 0.6428571 0.002846975 2.5159172 18
## [20948] {fruit/vegetable_juice,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001830198 0.6666667 0.002745297 3.4454370 18
## [20949] {fruit/vegetable_juice,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001830198 0.5625000 0.003253686 4.0322066 18
## [20950] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001830198 0.3600000 0.005083884 3.4308140 18
## [20951] {other_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001830198 0.2400000 0.007625826 3.3198312 18
## [20952] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## soda} => {whole_milk} 0.001321810 0.6842105 0.001931876 2.6777599 13
## [20953] {fruit/vegetable_juice,
## root_vegetables,
## soda,
## whole_milk} => {other_vegetables} 0.001321810 0.6842105 0.001931876 3.5361064 13
## [20954] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## whole_milk} => {soda} 0.001321810 0.3333333 0.003965430 1.9115646 13
## [20955] {fruit/vegetable_juice,
## other_vegetables,
## soda,
## whole_milk} => {root_vegetables} 0.001321810 0.4814815 0.002745297 4.4173231 13
## [20956] {other_vegetables,
## root_vegetables,
## soda,
## whole_milk} => {fruit/vegetable_juice} 0.001321810 0.2954545 0.004473818 4.0869134 13
## [20957] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.002033554 0.8333333 0.002440264 3.2613742 20
## [20958] {fruit/vegetable_juice,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.002033554 0.8000000 0.002541942 4.1345244 20
## [20959] {fruit/vegetable_juice,
## other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.002033554 0.5128205 0.003965430 3.6760858 20
## [20960] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.002033554 0.4000000 0.005083884 3.6697761 20
## [20961] {other_vegetables,
## root_vegetables,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.002033554 0.2597403 0.007829181 3.5928909 20
## [20962] {fruit/vegetable_juice,
## other_vegetables,
## soda,
## yogurt} => {whole_milk} 0.001321810 0.7647059 0.001728521 2.9927904 13
## [20963] {fruit/vegetable_juice,
## soda,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.5652174 0.002338587 2.9211314 13
## [20964] {fruit/vegetable_juice,
## other_vegetables,
## soda,
## whole_milk} => {yogurt} 0.001321810 0.4814815 0.002745297 3.4514361 13
## [20965] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk,
## yogurt} => {soda} 0.001321810 0.2600000 0.005083884 1.4910204 13
## [20966] {other_vegetables,
## soda,
## whole_milk,
## yogurt} => {fruit/vegetable_juice} 0.001321810 0.3023256 0.004372140 4.1819579 13
## [20967] {fruit/vegetable_juice,
## other_vegetables,
## rolls/buns,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [20968] {fruit/vegetable_juice,
## rolls/buns,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [20969] {fruit/vegetable_juice,
## other_vegetables,
## whole_milk,
## yogurt} => {rolls/buns} 0.001118454 0.2200000 0.005083884 1.1960752 11
## [20970] {fruit/vegetable_juice,
## other_vegetables,
## rolls/buns,
## whole_milk} => {yogurt} 0.001118454 0.5238095 0.002135231 3.7548591 11
## [20971] {pip_fruit,
## root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [20972] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## whipped/sour_cream} => {root_vegetables} 0.001016777 0.3703704 0.002745297 3.3979409 10
## [20973] {other_vegetables,
## pip_fruit,
## root_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001016777 0.5000000 0.002033554 4.7650194 10
## [20974] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {pip_fruit} 0.001016777 0.3030303 0.003355363 4.0057836 10
## [20975] {other_vegetables,
## pip_fruit,
## root_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001016777 0.3030303 0.003355363 4.2273802 10
## [20976] {pip_fruit,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001321810 0.7647059 0.001728521 3.9521189 13
## [20977] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001321810 0.4814815 0.002745297 3.4514361 13
## [20978] {other_vegetables,
## pip_fruit,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001321810 0.5909091 0.002236909 5.6313865 13
## [20979] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {pip_fruit} 0.001321810 0.3714286 0.003558719 4.9099462 13
## [20980] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001321810 0.3714286 0.003558719 5.1815603 13
## [20981] {pip_fruit,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [20982] {pip_fruit,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.5500000 0.002033554 3.9426020 11
## [20983] {pip_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.4583333 0.002440264 4.3679344 11
## [20984] {tropical_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {pip_fruit} 0.001118454 0.2558140 0.004372140 3.3816267 11
## [20985] {pip_fruit,
## tropical_fruit,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.2972973 0.003762074 4.1474027 11
## [20986] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001626843 0.5925926 0.002745297 2.3191994 16
## [20987] {pip_fruit,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001626843 0.8000000 0.002033554 4.1345244 16
## [20988] {other_vegetables,
## pip_fruit,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001626843 0.4444444 0.003660397 4.2355728 16
## [20989] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {pip_fruit} 0.001626843 0.3636364 0.004473818 4.8069404 16
## [20990] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001626843 0.3404255 0.004778851 4.7490569 16
## [20991] {pip_fruit,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [20992] {pip_fruit,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.4782609 0.002338587 3.4283496 11
## [20993] {pip_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.4583333 0.002440264 4.2049518 11
## [20994] {root_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {pip_fruit} 0.001118454 0.3055556 0.003660397 4.0391652 11
## [20995] {pip_fruit,
## root_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3142857 0.003558719 4.3843972 11
## [20996] {other_vegetables,
## pip_fruit,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001728521 0.8500000 0.002033554 3.3266017 17
## [20997] {pip_fruit,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001728521 0.7391304 0.002338587 3.8199411 17
## [20998] {other_vegetables,
## pip_fruit,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001728521 0.4722222 0.003660397 4.3323746 17
## [20999] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {pip_fruit} 0.001728521 0.3333333 0.005185562 4.4063620 17
## [21000] {other_vegetables,
## pip_fruit,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001728521 0.3148148 0.005490595 4.3917783 17
## [21001] {other_vegetables,
## pip_fruit,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001525165 0.6818182 0.002236909 2.6683971 15
## [21002] {pip_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001525165 0.6250000 0.002440264 3.2300972 15
## [21003] {other_vegetables,
## pip_fruit,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001525165 0.4166667 0.003660397 2.9868197 15
## [21004] {other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {pip_fruit} 0.001525165 0.2727273 0.005592272 3.6052053 15
## [21005] {other_vegetables,
## pip_fruit,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001525165 0.3000000 0.005083884 4.1851064 15
## [21006] {citrus_fruit,
## pastry,
## rolls/buns,
## whipped/sour_cream} => {whole_milk} 0.001016777 1.0000000 0.001016777 3.9136490 10
## [21007] {citrus_fruit,
## pastry,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001016777 0.6666667 0.001525165 3.6244702 10
## [21008] {pastry,
## rolls/buns,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.001016777 0.6666667 0.001525165 8.0548731 10
## [21009] {citrus_fruit,
## rolls/buns,
## whipped/sour_cream,
## whole_milk} => {pastry} 0.001016777 0.5000000 0.002033554 5.6200000 10
## [21010] {citrus_fruit,
## pastry,
## rolls/buns,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.5000000 0.002033554 6.9751773 10
## [21011] {other_vegetables,
## pastry,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.6111111 0.001830198 2.3916744 11
## [21012] {pastry,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [21013] {other_vegetables,
## pastry,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.4583333 0.002440264 3.2855017 11
## [21014] {other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {pastry} 0.001118454 0.2000000 0.005592272 2.2480000 11
## [21015] {other_vegetables,
## pastry,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.2750000 0.004067107 3.8363475 11
## [21016] {citrus_fruit,
## other_vegetables,
## sausage,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.8000000 0.001525165 3.1309192 12
## [21017] {citrus_fruit,
## sausage,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001220132 0.8000000 0.001525165 4.1345244 12
## [21018] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {sausage} 0.001220132 0.3333333 0.003660397 3.5479798 12
## [21019] {other_vegetables,
## sausage,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.001220132 0.4137931 0.002948653 4.9995764 12
## [21020] {citrus_fruit,
## other_vegetables,
## sausage,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.5217391 0.002338587 7.2784459 12
## [21021] {citrus_fruit,
## root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001220132 1.0000000 0.001220132 5.1681555 12
## [21022] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {root_vegetables} 0.001220132 0.5714286 0.002135231 5.2425373 12
## [21023] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001220132 0.5217391 0.002338587 4.9721941 12
## [21024] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {citrus_fruit} 0.001220132 0.3636364 0.003355363 4.3935671 12
## [21025] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001220132 0.2727273 0.004473818 3.8046422 12
## [21026] {citrus_fruit,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [21027] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [21028] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001016777 0.4347826 0.002338587 4.1434951 10
## [21029] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {citrus_fruit} 0.001016777 0.2857143 0.003558719 3.4520885 10
## [21030] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3225806 0.003152008 4.5001144 10
## [21031] {citrus_fruit,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001220132 0.8000000 0.001525165 3.1309192 12
## [21032] {citrus_fruit,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001220132 0.5217391 0.002338587 3.7400177 12
## [21033] {citrus_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001220132 0.4444444 0.002745297 4.2355728 12
## [21034] {tropical_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001220132 0.2790698 0.004372140 3.3718073 12
## [21035] {citrus_fruit,
## tropical_fruit,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001220132 0.3157895 0.003863752 4.4053751 12
## [21036] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001626843 0.7619048 0.002135231 2.9818278 16
## [21037] {citrus_fruit,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001626843 0.6956522 0.002338587 3.5952386 16
## [21038] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001626843 0.4444444 0.003660397 4.2355728 16
## [21039] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.001626843 0.3636364 0.004473818 4.3935671 16
## [21040] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001626843 0.3265306 0.004982206 4.5552178 16
## [21041] {citrus_fruit,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001220132 0.7058824 0.001728521 3.6481098 12
## [21042] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001220132 0.5217391 0.002338587 3.7400177 12
## [21043] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001220132 0.5217391 0.002338587 4.7866645 12
## [21044] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {citrus_fruit} 0.001220132 0.3529412 0.003457041 4.2643446 12
## [21045] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001220132 0.4285714 0.002846975 5.9787234 12
## [21046] {citrus_fruit,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [21047] {citrus_fruit,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.5500000 0.002033554 3.9426020 11
## [21048] {citrus_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.4074074 0.002745297 3.7377349 11
## [21049] {root_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001118454 0.3055556 0.003660397 3.6918168 11
## [21050] {citrus_fruit,
## root_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3548387 0.003152008 4.9501258 11
## [21051] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001525165 0.6521739 0.002338587 2.5523798 15
## [21052] {citrus_fruit,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001525165 0.7500000 0.002033554 3.8761167 15
## [21053] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001525165 0.4166667 0.003660397 3.8226835 15
## [21054] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {citrus_fruit} 0.001525165 0.2941176 0.005185562 3.5536205 15
## [21055] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001525165 0.2631579 0.005795628 3.6711459 15
## [21056] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001728521 0.7391304 0.002338587 2.8926971 17
## [21057] {citrus_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001728521 0.6296296 0.002745297 3.2540239 17
## [21058] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001728521 0.4722222 0.003660397 3.3850624 17
## [21059] {other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001728521 0.3090909 0.005592272 3.7345321 17
## [21060] {citrus_fruit,
## other_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001728521 0.3617021 0.004778851 5.0458729 17
## [21061] {other_vegetables,
## sausage,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [21062] {sausage,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [21063] {other_vegetables,
## sausage,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001220132 0.4137931 0.002948653 2.9662210 12
## [21064] {other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {sausage} 0.001220132 0.2181818 0.005592272 2.3223140 12
## [21065] {other_vegetables,
## sausage,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001220132 0.3243243 0.003762074 4.5244393 12
## [21066] {bottled_water,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001016777 0.6250000 0.001626843 3.2300972 10
## [21067] {bottled_water,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001016777 0.6666667 0.001525165 4.7789116 10
## [21068] {bottled_water,
## other_vegetables,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001016777 0.5555556 0.001830198 5.2944660 10
## [21069] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {bottled_water} 0.001016777 0.2857143 0.003558719 2.5850966 10
## [21070] {bottled_water,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001016777 0.3333333 0.003050330 4.6501182 10
## [21071] {bottled_water,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.6875000 0.001626843 2.6906337 11
## [21072] {bottled_water,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.7333333 0.001525165 5.2568027 11
## [21073] {bottled_water,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.6875000 0.001626843 6.5519016 11
## [21074] {tropical_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {bottled_water} 0.001118454 0.2558140 0.004372140 2.3145632 11
## [21075] {bottled_water,
## tropical_fruit,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3055556 0.003660397 4.2626084 11
## [21076] {bottled_water,
## other_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [21077] {bottled_water,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001016777 0.6666667 0.001525165 3.4454370 10
## [21078] {bottled_water,
## other_vegetables,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001016777 0.5263158 0.001931876 5.0158099 10
## [21079] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {bottled_water} 0.001016777 0.2272727 0.004473818 2.0563268 10
## [21080] {bottled_water,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001016777 0.2857143 0.003558719 3.9858156 10
## [21081] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {rolls/buns} 0.001118454 0.4782609 0.002338587 2.6001634 11
## [21082] {rolls/buns,
## root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001118454 0.7333333 0.001525165 5.2568027 11
## [21083] {rolls/buns,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001118454 0.5238095 0.002135231 4.8056592 11
## [21084] {rolls/buns,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001118454 0.6111111 0.001830198 5.8239126 11
## [21085] {rolls/buns,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001118454 0.4074074 0.002745297 5.6834778 11
## [21086] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001728521 0.7391304 0.002338587 3.8199411 17
## [21087] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001728521 0.5151515 0.003355363 3.6927953 17
## [21088] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001728521 0.4857143 0.003558719 4.4561567 17
## [21089] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001728521 0.5000000 0.003457041 4.7650194 17
## [21090] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001728521 0.3469388 0.004982206 4.8399189 17
## [21091] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001626843 0.6956522 0.002338587 2.7225385 16
## [21092] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001626843 0.5925926 0.002745297 4.2479214 16
## [21093] {tropical_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {root_vegetables} 0.001626843 0.3720930 0.004372140 3.4137452 16
## [21094] {root_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001626843 0.4444444 0.003660397 4.2355728 16
## [21095] {root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001626843 0.2857143 0.005693950 3.9858156 16
## [21096] {rolls/buns,
## root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {other_vegetables} 0.001220132 0.8000000 0.001525165 4.1345244 12
## [21097] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {rolls/buns} 0.001220132 0.3636364 0.003355363 1.9769838 12
## [21098] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## whipped/sour_cream} => {root_vegetables} 0.001220132 0.6315789 0.001931876 5.7943833 12
## [21099] {other_vegetables,
## rolls/buns,
## root_vegetables,
## whipped/sour_cream} => {tropical_fruit} 0.001220132 0.4800000 0.002541942 4.5744186 12
## [21100] {other_vegetables,
## rolls/buns,
## root_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.001220132 0.3428571 0.003558719 4.7829787 12
## [21101] {rolls/buns,
## root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [21102] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001118454 0.4074074 0.002745297 2.2149540 11
## [21103] {rolls/buns,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001118454 0.5238095 0.002135231 4.8056592 11
## [21104] {rolls/buns,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001118454 0.3928571 0.002846975 3.7439438 11
## [21105] {rolls/buns,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001118454 0.2972973 0.003762074 4.1474027 11
## [21106] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001931876 0.5757576 0.003355363 2.2533131 19
## [21107] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001931876 0.7037037 0.002745297 3.6368502 19
## [21108] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001931876 0.4318182 0.004473818 3.9616901 19
## [21109] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001931876 0.3725490 0.005185562 3.5504066 19
## [21110] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001931876 0.2753623 0.007015760 3.8414020 19
## [21111] {rolls/buns,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001321810 0.6190476 0.002135231 3.1993344 13
## [21112] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {rolls/buns} 0.001321810 0.3714286 0.003558719 2.0193477 13
## [21113] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## whipped/sour_cream} => {yogurt} 0.001321810 0.6842105 0.001931876 4.9046724 13
## [21114] {other_vegetables,
## rolls/buns,
## whipped/sour_cream,
## yogurt} => {tropical_fruit} 0.001321810 0.5416667 0.002440264 5.1621043 13
## [21115] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## yogurt} => {whipped/sour_cream} 0.001321810 0.3513514 0.003762074 4.9014759 13
## [21116] {rolls/buns,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [21117] {tropical_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {rolls/buns} 0.001525165 0.3488372 0.004372140 1.8965251 15
## [21118] {rolls/buns,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001525165 0.7142857 0.002135231 5.1202624 15
## [21119] {rolls/buns,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001525165 0.5000000 0.003050330 4.7650194 15
## [21120] {rolls/buns,
## tropical_fruit,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001525165 0.3125000 0.004880529 4.3594858 15
## [21121] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.002440264 0.6857143 0.003558719 2.6836450 24
## [21122] {tropical_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.002440264 0.5581395 0.004372140 2.8845519 24
## [21123] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.002440264 0.5454545 0.004473818 3.9100186 24
## [21124] {other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {tropical_fruit} 0.002440264 0.4363636 0.005592272 4.1585624 24
## [21125] {other_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.002440264 0.3200000 0.007625826 4.4641135 24
## [21126] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## whipped/sour_cream} => {whole_milk} 0.001220132 0.6315789 0.001931876 2.4717783 12
## [21127] {rolls/buns,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001220132 0.5714286 0.002135231 2.9532317 12
## [21128] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001220132 0.2727273 0.004473818 1.4827378 12
## [21129] {other_vegetables,
## rolls/buns,
## whipped/sour_cream,
## whole_milk} => {tropical_fruit} 0.001220132 0.3243243 0.003762074 3.0908234 12
## [21130] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {whipped/sour_cream} 0.001220132 0.3000000 0.004067107 4.1851064 12
## [21131] {rolls/buns,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {other_vegetables} 0.001118454 0.6111111 0.001830198 3.1583173 11
## [21132] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {rolls/buns} 0.001118454 0.3235294 0.003457041 1.7589341 11
## [21133] {other_vegetables,
## rolls/buns,
## root_vegetables,
## whipped/sour_cream} => {yogurt} 0.001118454 0.4400000 0.002541942 3.1540816 11
## [21134] {other_vegetables,
## rolls/buns,
## whipped/sour_cream,
## yogurt} => {root_vegetables} 0.001118454 0.4583333 0.002440264 4.2049518 11
## [21135] {other_vegetables,
## rolls/buns,
## root_vegetables,
## yogurt} => {whipped/sour_cream} 0.001118454 0.2682927 0.004168785 3.7427781 11
## [21136] {rolls/buns,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [21137] {root_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {rolls/buns} 0.001220132 0.3333333 0.003660397 1.8122351 12
## [21138] {rolls/buns,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001220132 0.4285714 0.002846975 3.0721574 12
## [21139] {rolls/buns,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {root_vegetables} 0.001220132 0.4000000 0.003050330 3.6697761 12
## [21140] {rolls/buns,
## root_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001220132 0.2608696 0.004677173 3.6392229 12
## [21141] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.002338587 0.6764706 0.003457041 2.6474685 23
## [21142] {root_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.002338587 0.6388889 0.003660397 3.3018772 23
## [21143] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.002338587 0.4509804 0.005185562 3.2327931 23
## [21144] {other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {root_vegetables} 0.002338587 0.4181818 0.005592272 3.8365841 23
## [21145] {other_vegetables,
## root_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.002338587 0.2987013 0.007829181 4.1669890 23
## [21146] {other_vegetables,
## rolls/buns,
## root_vegetables,
## whipped/sour_cream} => {whole_milk} 0.001626843 0.6400000 0.002541942 2.5047354 16
## [21147] {rolls/buns,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {other_vegetables} 0.001626843 0.5714286 0.002846975 2.9532317 16
## [21148] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {rolls/buns} 0.001626843 0.3137255 0.005185562 1.7056331 16
## [21149] {other_vegetables,
## rolls/buns,
## whipped/sour_cream,
## whole_milk} => {root_vegetables} 0.001626843 0.4324324 0.003762074 3.9673255 16
## [21150] {other_vegetables,
## rolls/buns,
## root_vegetables,
## whole_milk} => {whipped/sour_cream} 0.001626843 0.2622951 0.006202339 3.6591094 16
## [21151] {other_vegetables,
## soda,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001220132 0.6000000 0.002033554 2.3481894 12
## [21152] {soda,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.6315789 0.001931876 3.2640982 12
## [21153] {other_vegetables,
## soda,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001220132 0.4285714 0.002846975 3.0721574 12
## [21154] {other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {soda} 0.001220132 0.2181818 0.005592272 1.2512059 12
## [21155] {other_vegetables,
## soda,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001220132 0.2790698 0.004372140 3.8931222 12
## [21156] {other_vegetables,
## rolls/buns,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001321810 0.5416667 0.002440264 2.1198932 13
## [21157] {rolls/buns,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.4333333 0.003050330 2.2395341 13
## [21158] {other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {rolls/buns} 0.001321810 0.2363636 0.005592272 1.2850394 13
## [21159] {other_vegetables,
## rolls/buns,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001321810 0.3513514 0.003762074 2.5186156 13
## [21160] {other_vegetables,
## rolls/buns,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001321810 0.2203390 0.005998983 3.0738069 13
## [21161] {other_vegetables,
## pastry,
## pip_fruit,
## yogurt} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [21162] {pastry,
## pip_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.4761905 0.002135231 2.4610264 10
## [21163] {other_vegetables,
## pastry,
## pip_fruit,
## whole_milk} => {yogurt} 0.001016777 0.4000000 0.002541942 2.8673469 10
## [21164] {other_vegetables,
## pip_fruit,
## whole_milk,
## yogurt} => {pastry} 0.001016777 0.2000000 0.005083884 2.2480000 10
## [21165] {other_vegetables,
## pastry,
## whole_milk,
## yogurt} => {pip_fruit} 0.001016777 0.2500000 0.004067107 3.3047715 10
## [21166] {citrus_fruit,
## pip_fruit,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001321810 0.7647059 0.001728521 3.9521189 13
## [21167] {citrus_fruit,
## other_vegetables,
## pip_fruit,
## tropical_fruit} => {root_vegetables} 0.001321810 0.4642857 0.002846975 4.2595616 13
## [21168] {citrus_fruit,
## other_vegetables,
## pip_fruit,
## root_vegetables} => {tropical_fruit} 0.001321810 0.5000000 0.002643620 4.7650194 13
## [21169] {other_vegetables,
## pip_fruit,
## root_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001321810 0.3939394 0.003355363 4.7596977 13
## [21170] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {pip_fruit} 0.001321810 0.2954545 0.004473818 3.9056391 13
## [21171] {citrus_fruit,
## pip_fruit,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [21172] {citrus_fruit,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001118454 0.5500000 0.002033554 5.0459422 11
## [21173] {citrus_fruit,
## pip_fruit,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001118454 0.4782609 0.002338587 4.5578446 11
## [21174] {pip_fruit,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001118454 0.3548387 0.003152008 4.2872711 11
## [21175] {citrus_fruit,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001118454 0.3142857 0.003558719 4.1545699 11
## [21176] {citrus_fruit,
## pip_fruit,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [21177] {citrus_fruit,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [21178] {citrus_fruit,
## pip_fruit,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.6250000 0.001626843 5.9562742 10
## [21179] {pip_fruit,
## tropical_fruit,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001016777 0.2702703 0.003762074 3.2654891 10
## [21180] {citrus_fruit,
## tropical_fruit,
## whole_milk,
## yogurt} => {pip_fruit} 0.001016777 0.2631579 0.003863752 3.4787068 10
## [21181] {citrus_fruit,
## other_vegetables,
## pip_fruit,
## tropical_fruit} => {whole_milk} 0.001321810 0.4642857 0.002846975 1.8170513 13
## [21182] {citrus_fruit,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001321810 0.6500000 0.002033554 3.3593011 13
## [21183] {citrus_fruit,
## other_vegetables,
## pip_fruit,
## whole_milk} => {tropical_fruit} 0.001321810 0.4642857 0.002846975 4.4246609 13
## [21184] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001321810 0.2765957 0.004778851 3.3419154 13
## [21185] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001321810 0.2653061 0.004982206 3.5071045 13
## [21186] {citrus_fruit,
## other_vegetables,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001626843 0.6153846 0.002643620 2.4083994 16
## [21187] {citrus_fruit,
## pip_fruit,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001626843 0.6956522 0.002338587 3.5952386 16
## [21188] {citrus_fruit,
## other_vegetables,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001626843 0.5714286 0.002846975 5.2425373 16
## [21189] {other_vegetables,
## pip_fruit,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001626843 0.2962963 0.005490595 3.5799436 16
## [21190] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001626843 0.2807018 0.005795628 3.7106206 16
## [21191] {citrus_fruit,
## other_vegetables,
## pip_fruit,
## yogurt} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [21192] {citrus_fruit,
## pip_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.7500000 0.001626843 3.8761167 12
## [21193] {citrus_fruit,
## other_vegetables,
## pip_fruit,
## whole_milk} => {yogurt} 0.001220132 0.4285714 0.002846975 3.0721574 12
## [21194] {other_vegetables,
## pip_fruit,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001220132 0.2400000 0.005083884 2.8997543 12
## [21195] {citrus_fruit,
## other_vegetables,
## whole_milk,
## yogurt} => {pip_fruit} 0.001220132 0.2553191 0.004778851 3.3750858 12
## [21196] {pip_fruit,
## root_vegetables,
## sausage,
## yogurt} => {whole_milk} 0.001016777 0.7692308 0.001321810 3.0104993 10
## [21197] {pip_fruit,
## root_vegetables,
## sausage,
## whole_milk} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [21198] {pip_fruit,
## sausage,
## whole_milk,
## yogurt} => {root_vegetables} 0.001016777 0.4545455 0.002236909 4.1702001 10
## [21199] {pip_fruit,
## root_vegetables,
## whole_milk,
## yogurt} => {sausage} 0.001016777 0.2857143 0.003558719 3.0411255 10
## [21200] {root_vegetables,
## sausage,
## whole_milk,
## yogurt} => {pip_fruit} 0.001016777 0.3125000 0.003253686 4.1309644 10
## [21201] {other_vegetables,
## pip_fruit,
## sausage,
## yogurt} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [21202] {pip_fruit,
## sausage,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.4545455 0.002236909 2.3491616 10
## [21203] {other_vegetables,
## pip_fruit,
## sausage,
## whole_milk} => {yogurt} 0.001016777 0.5000000 0.002033554 3.5841837 10
## [21204] {other_vegetables,
## pip_fruit,
## whole_milk,
## yogurt} => {sausage} 0.001016777 0.2000000 0.005083884 2.1287879 10
## [21205] {other_vegetables,
## sausage,
## whole_milk,
## yogurt} => {pip_fruit} 0.001016777 0.2702703 0.003762074 3.5727260 10
## [21206] {bottled_water,
## other_vegetables,
## pip_fruit,
## root_vegetables} => {whole_milk} 0.001118454 1.0000000 0.001118454 3.9136490 11
## [21207] {bottled_water,
## pip_fruit,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [21208] {bottled_water,
## other_vegetables,
## pip_fruit,
## whole_milk} => {root_vegetables} 0.001118454 0.5500000 0.002033554 5.0459422 11
## [21209] {other_vegetables,
## pip_fruit,
## root_vegetables,
## whole_milk} => {bottled_water} 0.001118454 0.2037037 0.005490595 1.8430781 11
## [21210] {bottled_water,
## other_vegetables,
## root_vegetables,
## whole_milk} => {pip_fruit} 0.001118454 0.2820513 0.003965430 3.7284602 11
## [21211] {pip_fruit,
## root_vegetables,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001525165 0.6250000 0.002440264 3.2300972 15
## [21212] {other_vegetables,
## pip_fruit,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001525165 0.4545455 0.003355363 3.2583488 15
## [21213] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001525165 0.4285714 0.003558719 3.9319030 15
## [21214] {other_vegetables,
## pip_fruit,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001525165 0.5172414 0.002948653 4.9293304 15
## [21215] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## yogurt} => {pip_fruit} 0.001525165 0.3061224 0.004982206 4.0466590 15
## [21216] {pip_fruit,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001830198 0.7500000 0.002440264 2.9352368 18
## [21217] {pip_fruit,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001830198 0.5806452 0.003152008 4.1622778 18
## [21218] {pip_fruit,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001830198 0.4864865 0.003762074 4.4632412 18
## [21219] {pip_fruit,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001830198 0.5142857 0.003558719 4.9011628 18
## [21220] {root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {pip_fruit} 0.001830198 0.3214286 0.005693950 4.2489919 18
## [21221] {pip_fruit,
## rolls/buns,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [21222] {pip_fruit,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001016777 0.3225806 0.003152008 1.7537759 10
## [21223] {pip_fruit,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001016777 0.5263158 0.001931876 4.8286528 10
## [21224] {pip_fruit,
## rolls/buns,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001016777 0.5555556 0.001830198 5.2944660 10
## [21225] {rolls/buns,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.001016777 0.2702703 0.003762074 3.5727260 10
## [21226] {other_vegetables,
## pip_fruit,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.002440264 0.7272727 0.003355363 2.8462902 24
## [21227] {pip_fruit,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.002440264 0.7741935 0.003152008 4.0011527 24
## [21228] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.002440264 0.5106383 0.004778851 4.6848206 24
## [21229] {other_vegetables,
## pip_fruit,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.002440264 0.4444444 0.005490595 4.2355728 24
## [21230] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {pip_fruit} 0.002440264 0.3478261 0.007015760 4.5979430 24
## [21231] {pip_fruit,
## rolls/buns,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [21232] {pip_fruit,
## tropical_fruit,
## whole_milk,
## yogurt} => {rolls/buns} 0.001016777 0.2702703 0.003762074 1.4693798 10
## [21233] {pip_fruit,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [21234] {pip_fruit,
## rolls/buns,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.4347826 0.002338587 4.1434951 10
## [21235] {rolls/buns,
## tropical_fruit,
## whole_milk,
## yogurt} => {pip_fruit} 0.001016777 0.2083333 0.004880529 2.7539763 10
## [21236] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## yogurt} => {whole_milk} 0.002338587 0.6571429 0.003558719 2.5718265 23
## [21237] {pip_fruit,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.002338587 0.6216216 0.003762074 3.2126372 23
## [21238] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## whole_milk} => {yogurt} 0.002338587 0.4893617 0.004778851 3.5079244 23
## [21239] {other_vegetables,
## pip_fruit,
## whole_milk,
## yogurt} => {tropical_fruit} 0.002338587 0.4600000 0.005083884 4.3838178 23
## [21240] {other_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {pip_fruit} 0.002338587 0.3066667 0.007625826 4.0538530 23
## [21241] {pip_fruit,
## root_vegetables,
## soda,
## yogurt} => {whole_milk} 0.001220132 0.8571429 0.001423488 3.3545563 12
## [21242] {pip_fruit,
## root_vegetables,
## soda,
## whole_milk} => {yogurt} 0.001220132 0.6666667 0.001830198 4.7789116 12
## [21243] {pip_fruit,
## root_vegetables,
## whole_milk,
## yogurt} => {soda} 0.001220132 0.3428571 0.003558719 1.9661808 12
## [21244] {pip_fruit,
## soda,
## whole_milk,
## yogurt} => {root_vegetables} 0.001220132 0.6000000 0.002033554 5.5046642 12
## [21245] {root_vegetables,
## soda,
## whole_milk,
## yogurt} => {pip_fruit} 0.001220132 0.5000000 0.002440264 6.6095430 12
## [21246] {other_vegetables,
## pip_fruit,
## root_vegetables,
## soda} => {whole_milk} 0.001321810 0.8125000 0.001626843 3.1798398 13
## [21247] {pip_fruit,
## root_vegetables,
## soda,
## whole_milk} => {other_vegetables} 0.001321810 0.7222222 0.001830198 3.7325568 13
## [21248] {other_vegetables,
## pip_fruit,
## root_vegetables,
## whole_milk} => {soda} 0.001321810 0.2407407 0.005490595 1.3805745 13
## [21249] {other_vegetables,
## pip_fruit,
## soda,
## whole_milk} => {root_vegetables} 0.001321810 0.5200000 0.002541942 4.7707090 13
## [21250] {other_vegetables,
## root_vegetables,
## soda,
## whole_milk} => {pip_fruit} 0.001321810 0.2954545 0.004473818 3.9056391 13
## [21251] {other_vegetables,
## pip_fruit,
## root_vegetables,
## yogurt} => {whole_milk} 0.002338587 0.7931034 0.002948653 3.1039285 23
## [21252] {pip_fruit,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.002338587 0.6571429 0.003558719 3.3962165 23
## [21253] {other_vegetables,
## pip_fruit,
## root_vegetables,
## whole_milk} => {yogurt} 0.002338587 0.4259259 0.005490595 3.0531935 23
## [21254] {other_vegetables,
## pip_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.002338587 0.4600000 0.005083884 4.2202425 23
## [21255] {other_vegetables,
## root_vegetables,
## whole_milk,
## yogurt} => {pip_fruit} 0.002338587 0.2987013 0.007829181 3.9485582 23
## [21256] {other_vegetables,
## pip_fruit,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [21257] {pip_fruit,
## rolls/buns,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [21258] {other_vegetables,
## pip_fruit,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001016777 0.3846154 0.002643620 3.5286309 10
## [21259] {other_vegetables,
## pip_fruit,
## soda,
## yogurt} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [21260] {pip_fruit,
## soda,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.6000000 0.002033554 3.1008933 12
## [21261] {other_vegetables,
## pip_fruit,
## soda,
## whole_milk} => {yogurt} 0.001220132 0.4800000 0.002541942 3.4408163 12
## [21262] {other_vegetables,
## pip_fruit,
## whole_milk,
## yogurt} => {soda} 0.001220132 0.2400000 0.005083884 1.3763265 12
## [21263] {other_vegetables,
## soda,
## whole_milk,
## yogurt} => {pip_fruit} 0.001220132 0.2790698 0.004372140 3.6890473 12
## [21264] {other_vegetables,
## pip_fruit,
## rolls/buns,
## yogurt} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [21265] {pip_fruit,
## rolls/buns,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.4782609 0.002338587 2.4717266 11
## [21266] {other_vegetables,
## pip_fruit,
## whole_milk,
## yogurt} => {rolls/buns} 0.001118454 0.2200000 0.005083884 1.1960752 11
## [21267] {other_vegetables,
## pip_fruit,
## rolls/buns,
## whole_milk} => {yogurt} 0.001118454 0.4230769 0.002643620 3.0327708 11
## [21268] {pastry,
## root_vegetables,
## sausage,
## yogurt} => {whole_milk} 0.001220132 0.7500000 0.001626843 2.9352368 12
## [21269] {pastry,
## root_vegetables,
## sausage,
## whole_milk} => {yogurt} 0.001220132 0.7500000 0.001626843 5.3762755 12
## [21270] {pastry,
## sausage,
## whole_milk,
## yogurt} => {root_vegetables} 0.001220132 0.5217391 0.002338587 4.7866645 12
## [21271] {pastry,
## root_vegetables,
## whole_milk,
## yogurt} => {sausage} 0.001220132 0.4800000 0.002541942 5.1090909 12
## [21272] {root_vegetables,
## sausage,
## whole_milk,
## yogurt} => {pastry} 0.001220132 0.3750000 0.003253686 4.2150000 12
## [21273] {other_vegetables,
## pastry,
## sausage,
## yogurt} => {whole_milk} 0.001016777 0.6666667 0.001525165 2.6090994 10
## [21274] {pastry,
## sausage,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.4347826 0.002338587 2.2470241 10
## [21275] {other_vegetables,
## pastry,
## sausage,
## whole_milk} => {yogurt} 0.001016777 0.5263158 0.001931876 3.7728249 10
## [21276] {other_vegetables,
## pastry,
## whole_milk,
## yogurt} => {sausage} 0.001016777 0.2500000 0.004067107 2.6609848 10
## [21277] {other_vegetables,
## sausage,
## whole_milk,
## yogurt} => {pastry} 0.001016777 0.2702703 0.003762074 3.0378378 10
## [21278] {pastry,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [21279] {pastry,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.6250000 0.001626843 4.4802296 10
## [21280] {pastry,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001016777 0.3333333 0.003050330 3.0581468 10
## [21281] {pastry,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [21282] {pastry,
## rolls/buns,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [21283] {pastry,
## tropical_fruit,
## whole_milk,
## yogurt} => {rolls/buns} 0.001525165 0.5000000 0.003050330 2.7183527 15
## [21284] {pastry,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001525165 0.7894737 0.001931876 5.6592374 15
## [21285] {pastry,
## rolls/buns,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001525165 0.5000000 0.003050330 4.7650194 15
## [21286] {rolls/buns,
## tropical_fruit,
## whole_milk,
## yogurt} => {pastry} 0.001525165 0.3125000 0.004880529 3.5125000 15
## [21287] {other_vegetables,
## pastry,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [21288] {pastry,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.3666667 0.003050330 1.8949904 11
## [21289] {other_vegetables,
## pastry,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.4583333 0.002440264 3.2855017 11
## [21290] {other_vegetables,
## pastry,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.2750000 0.004067107 2.6207607 11
## [21291] {other_vegetables,
## pastry,
## root_vegetables,
## soda} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [21292] {pastry,
## root_vegetables,
## soda,
## whole_milk} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [21293] {other_vegetables,
## pastry,
## root_vegetables,
## whole_milk} => {soda} 0.001118454 0.3666667 0.003050330 2.1027211 11
## [21294] {other_vegetables,
## pastry,
## soda,
## whole_milk} => {root_vegetables} 0.001118454 0.3928571 0.002846975 3.6042444 11
## [21295] {other_vegetables,
## root_vegetables,
## soda,
## whole_milk} => {pastry} 0.001118454 0.2500000 0.004473818 2.8100000 11
## [21296] {other_vegetables,
## pastry,
## root_vegetables,
## yogurt} => {whole_milk} 0.001626843 0.7272727 0.002236909 2.8462902 16
## [21297] {pastry,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001626843 0.6400000 0.002541942 3.3076195 16
## [21298] {other_vegetables,
## pastry,
## root_vegetables,
## whole_milk} => {yogurt} 0.001626843 0.5333333 0.003050330 3.8231293 16
## [21299] {other_vegetables,
## pastry,
## whole_milk,
## yogurt} => {root_vegetables} 0.001626843 0.4000000 0.004067107 3.6697761 16
## [21300] {other_vegetables,
## root_vegetables,
## whole_milk,
## yogurt} => {pastry} 0.001626843 0.2077922 0.007829181 2.3355844 16
## [21301] {other_vegetables,
## pastry,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001118454 0.5789474 0.001931876 2.2657968 11
## [21302] {pastry,
## rolls/buns,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [21303] {other_vegetables,
## pastry,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001118454 0.3666667 0.003050330 1.9934586 11
## [21304] {other_vegetables,
## pastry,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001118454 0.4074074 0.002745297 3.7377349 11
## [21305] {other_vegetables,
## pastry,
## soda,
## yogurt} => {whole_milk} 0.001118454 0.7333333 0.001525165 2.8700093 11
## [21306] {pastry,
## soda,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.4400000 0.002541942 2.2739884 11
## [21307] {other_vegetables,
## pastry,
## soda,
## whole_milk} => {yogurt} 0.001118454 0.3928571 0.002846975 2.8161443 11
## [21308] {other_vegetables,
## pastry,
## whole_milk,
## yogurt} => {soda} 0.001118454 0.2750000 0.004067107 1.5770408 11
## [21309] {other_vegetables,
## soda,
## whole_milk,
## yogurt} => {pastry} 0.001118454 0.2558140 0.004372140 2.8753488 11
## [21310] {other_vegetables,
## pastry,
## rolls/buns,
## yogurt} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [21311] {pastry,
## rolls/buns,
## whole_milk,
## yogurt} => {other_vegetables} 0.001220132 0.4000000 0.003050330 2.0672622 12
## [21312] {other_vegetables,
## pastry,
## whole_milk,
## yogurt} => {rolls/buns} 0.001220132 0.3000000 0.004067107 1.6310116 12
## [21313] {other_vegetables,
## pastry,
## rolls/buns,
## whole_milk} => {yogurt} 0.001220132 0.4444444 0.002745297 3.1859410 12
## [21314] {other_vegetables,
## rolls/buns,
## whole_milk,
## yogurt} => {pastry} 0.001220132 0.2033898 0.005998983 2.2861017 12
## [21315] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## sausage} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [21316] {citrus_fruit,
## root_vegetables,
## sausage,
## whole_milk} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [21317] {citrus_fruit,
## other_vegetables,
## sausage,
## whole_milk} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [21318] {other_vegetables,
## root_vegetables,
## sausage,
## whole_milk} => {citrus_fruit} 0.001016777 0.2941176 0.003457041 3.5536205 10
## [21319] {bottled_water,
## citrus_fruit,
## other_vegetables,
## tropical_fruit} => {whole_milk} 0.001321810 0.8666667 0.001525165 3.3918292 13
## [21320] {bottled_water,
## citrus_fruit,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [21321] {bottled_water,
## citrus_fruit,
## other_vegetables,
## whole_milk} => {tropical_fruit} 0.001321810 0.4482759 0.002948653 4.2720863 13
## [21322] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {bottled_water} 0.001321810 0.2653061 0.004982206 2.4004468 13
## [21323] {bottled_water,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001321810 0.3714286 0.003558719 4.4877150 13
## [21324] {bottled_water,
## citrus_fruit,
## other_vegetables,
## root_vegetables} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [21325] {bottled_water,
## citrus_fruit,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001321810 0.6500000 0.002033554 3.3593011 13
## [21326] {bottled_water,
## citrus_fruit,
## other_vegetables,
## whole_milk} => {root_vegetables} 0.001321810 0.4482759 0.002948653 4.1126801 13
## [21327] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whole_milk} => {bottled_water} 0.001321810 0.2280702 0.005795628 2.0635420 13
## [21328] {bottled_water,
## other_vegetables,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001321810 0.3333333 0.003965430 4.0274365 13
## [21329] {bottled_water,
## citrus_fruit,
## other_vegetables,
## yogurt} => {whole_milk} 0.001016777 0.6250000 0.001626843 2.4460306 10
## [21330] {bottled_water,
## citrus_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.5555556 0.001830198 2.8711975 10
## [21331] {bottled_water,
## citrus_fruit,
## other_vegetables,
## whole_milk} => {yogurt} 0.001016777 0.3448276 0.002948653 2.4718508 10
## [21332] {citrus_fruit,
## other_vegetables,
## whole_milk,
## yogurt} => {bottled_water} 0.001016777 0.2127660 0.004778851 1.9250719 10
## [21333] {bottled_water,
## other_vegetables,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001016777 0.2564103 0.003965430 3.0980281 10
## [21334] {citrus_fruit,
## root_vegetables,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001728521 0.8095238 0.002135231 4.1837450 17
## [21335] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001728521 0.3863636 0.004473818 2.7695965 17
## [21336] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001728521 0.5483871 0.003152008 5.0311447 17
## [21337] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001728521 0.6071429 0.002846975 5.7860950 17
## [21338] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## yogurt} => {citrus_fruit} 0.001728521 0.3469388 0.004982206 4.1918217 17
## [21339] {citrus_fruit,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001525165 0.7142857 0.002135231 2.7954636 15
## [21340] {citrus_fruit,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001525165 0.4285714 0.003558719 3.0721574 15
## [21341] {citrus_fruit,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001525165 0.3947368 0.003863752 3.6214896 15
## [21342] {citrus_fruit,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001525165 0.4838710 0.003152008 4.6113091 15
## [21343] {root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001525165 0.2678571 0.005693950 3.2363329 15
## [21344] {citrus_fruit,
## rolls/buns,
## root_vegetables,
## tropical_fruit} => {other_vegetables} 0.001118454 0.8461538 0.001321810 4.3730547 11
## [21345] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {rolls/buns} 0.001118454 0.2500000 0.004473818 1.3591763 11
## [21346] {citrus_fruit,
## other_vegetables,
## rolls/buns,
## tropical_fruit} => {root_vegetables} 0.001118454 0.6111111 0.001830198 5.6066024 11
## [21347] {citrus_fruit,
## other_vegetables,
## rolls/buns,
## root_vegetables} => {tropical_fruit} 0.001118454 0.5000000 0.002236909 4.7650194 11
## [21348] {other_vegetables,
## rolls/buns,
## root_vegetables,
## tropical_fruit} => {citrus_fruit} 0.001118454 0.3142857 0.003558719 3.7972973 11
## [21349] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.003152008 0.7045455 0.004473818 2.7573436 31
## [21350] {citrus_fruit,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.003152008 0.8857143 0.003558719 4.5775092 31
## [21351] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.003152008 0.6326531 0.004982206 5.8042377 31
## [21352] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.003152008 0.5438596 0.005795628 5.1830035 31
## [21353] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.003152008 0.4492754 0.007015760 5.4282840 31
## [21354] {citrus_fruit,
## rolls/buns,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.5882353 0.001728521 2.3021465 10
## [21355] {citrus_fruit,
## tropical_fruit,
## whole_milk,
## yogurt} => {rolls/buns} 0.001016777 0.2631579 0.003863752 1.4307119 10
## [21356] {citrus_fruit,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.4545455 0.002236909 3.2583488 10
## [21357] {citrus_fruit,
## rolls/buns,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.3846154 0.002643620 3.6653995 10
## [21358] {rolls/buns,
## tropical_fruit,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001016777 0.2083333 0.004880529 2.5171478 10
## [21359] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.002440264 0.7741935 0.003152008 3.0299218 24
## [21360] {citrus_fruit,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.002440264 0.6315789 0.003863752 3.2640982 24
## [21361] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.002440264 0.4897959 0.004982206 3.5110371 24
## [21362] {citrus_fruit,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.002440264 0.5106383 0.004778851 4.8664028 24
## [21363] {other_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {citrus_fruit} 0.002440264 0.3200000 0.007625826 3.8663391 24
## [21364] {citrus_fruit,
## other_vegetables,
## rolls/buns,
## tropical_fruit} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [21365] {citrus_fruit,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001220132 0.5454545 0.002236909 2.8189939 12
## [21366] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001220132 0.2448980 0.004982206 1.3314380 12
## [21367] {citrus_fruit,
## other_vegetables,
## rolls/buns,
## whole_milk} => {tropical_fruit} 0.001220132 0.4000000 0.003050330 3.8120155 12
## [21368] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {citrus_fruit} 0.001220132 0.3000000 0.004067107 3.6246929 12
## [21369] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## soda} => {whole_milk} 0.001220132 0.5714286 0.002135231 2.2363709 12
## [21370] {citrus_fruit,
## root_vegetables,
## soda,
## whole_milk} => {other_vegetables} 0.001220132 0.7500000 0.001626843 3.8761167 12
## [21371] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whole_milk} => {soda} 0.001220132 0.2105263 0.005795628 1.2073040 12
## [21372] {citrus_fruit,
## other_vegetables,
## soda,
## whole_milk} => {root_vegetables} 0.001220132 0.5714286 0.002135231 5.2425373 12
## [21373] {other_vegetables,
## root_vegetables,
## soda,
## whole_milk} => {citrus_fruit} 0.001220132 0.2727273 0.004473818 3.2951753 12
## [21374] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.002338587 0.8214286 0.002846975 3.2147831 23
## [21375] {citrus_fruit,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.002338587 0.7419355 0.003152008 3.8344380 23
## [21376] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.002338587 0.4035088 0.005795628 2.8924991 23
## [21377] {citrus_fruit,
## other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.002338587 0.4893617 0.004778851 4.4896197 23
## [21378] {other_vegetables,
## root_vegetables,
## whole_milk,
## yogurt} => {citrus_fruit} 0.002338587 0.2987013 0.007829181 3.6090016 23
## [21379] {citrus_fruit,
## other_vegetables,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001321810 0.5909091 0.002236909 2.3126108 13
## [21380] {citrus_fruit,
## rolls/buns,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001321810 0.6842105 0.001931876 3.5361064 13
## [21381] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001321810 0.2280702 0.005795628 1.2399503 13
## [21382] {citrus_fruit,
## other_vegetables,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001321810 0.4333333 0.003050330 3.9755908 13
## [21383] {other_vegetables,
## rolls/buns,
## root_vegetables,
## whole_milk} => {citrus_fruit} 0.001321810 0.2131148 0.006202339 2.5749184 13
## [21384] {other_vegetables,
## root_vegetables,
## shopping_bags,
## soda} => {whole_milk} 0.001016777 0.7142857 0.001423488 2.7954636 10
## [21385] {root_vegetables,
## shopping_bags,
## soda,
## whole_milk} => {other_vegetables} 0.001016777 0.7142857 0.001423488 3.6915397 10
## [21386] {other_vegetables,
## root_vegetables,
## shopping_bags,
## whole_milk} => {soda} 0.001016777 0.3448276 0.002948653 1.9774806 10
## [21387] {other_vegetables,
## shopping_bags,
## soda,
## whole_milk} => {root_vegetables} 0.001016777 0.4347826 0.002338587 3.9888871 10
## [21388] {other_vegetables,
## root_vegetables,
## soda,
## whole_milk} => {shopping_bags} 0.001016777 0.2272727 0.004473818 2.3067361 10
## [21389] {other_vegetables,
## root_vegetables,
## shopping_bags,
## yogurt} => {whole_milk} 0.001118454 0.5238095 0.002135231 2.0500066 11
## [21390] {root_vegetables,
## shopping_bags,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [21391] {other_vegetables,
## root_vegetables,
## shopping_bags,
## whole_milk} => {yogurt} 0.001118454 0.3793103 0.002948653 2.7190359 11
## [21392] {other_vegetables,
## shopping_bags,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.5500000 0.002033554 5.0459422 11
## [21393] {root_vegetables,
## sausage,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001525165 0.9375000 0.001626843 3.6690460 15
## [21394] {root_vegetables,
## sausage,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001525165 0.5555556 0.002745297 3.9824263 15
## [21395] {sausage,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001525165 0.4838710 0.003152008 4.4392453 15
## [21396] {root_vegetables,
## sausage,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001525165 0.4687500 0.003253686 4.4672057 15
## [21397] {root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {sausage} 0.001525165 0.2678571 0.005693950 2.8510552 15
## [21398] {rolls/buns,
## root_vegetables,
## sausage,
## tropical_fruit} => {whole_milk} 0.001016777 1.0000000 0.001016777 3.9136490 10
## [21399] {root_vegetables,
## sausage,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001016777 0.3703704 0.002745297 2.0135946 10
## [21400] {rolls/buns,
## sausage,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001016777 0.4545455 0.002236909 4.1702001 10
## [21401] {rolls/buns,
## root_vegetables,
## sausage,
## whole_milk} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [21402] {rolls/buns,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {sausage} 0.001016777 0.2702703 0.003762074 2.8767404 10
## [21403] {other_vegetables,
## root_vegetables,
## sausage,
## tropical_fruit} => {whole_milk} 0.001220132 0.7058824 0.001728521 2.7625758 12
## [21404] {root_vegetables,
## sausage,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001220132 0.4444444 0.002745297 2.2969580 12
## [21405] {other_vegetables,
## sausage,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001220132 0.4000000 0.003050330 3.6697761 12
## [21406] {other_vegetables,
## root_vegetables,
## sausage,
## whole_milk} => {tropical_fruit} 0.001220132 0.3529412 0.003457041 3.3635431 12
## [21407] {rolls/buns,
## sausage,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [21408] {sausage,
## tropical_fruit,
## whole_milk,
## yogurt} => {rolls/buns} 0.001118454 0.3548387 0.003152008 1.9291535 11
## [21409] {rolls/buns,
## sausage,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.5000000 0.002236909 3.5841837 11
## [21410] {rolls/buns,
## sausage,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.4074074 0.002745297 3.8826084 11
## [21411] {rolls/buns,
## tropical_fruit,
## whole_milk,
## yogurt} => {sausage} 0.001118454 0.2291667 0.004880529 2.4392361 11
## [21412] {other_vegetables,
## sausage,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001423488 0.6363636 0.002236909 2.4905039 14
## [21413] {sausage,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001423488 0.4516129 0.003152008 2.3340057 14
## [21414] {other_vegetables,
## sausage,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001423488 0.4666667 0.003050330 3.3452381 14
## [21415] {other_vegetables,
## sausage,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001423488 0.3783784 0.003762074 3.6059606 14
## [21416] {other_vegetables,
## root_vegetables,
## sausage,
## soda} => {whole_milk} 0.001016777 0.5555556 0.001830198 2.1742495 10
## [21417] {root_vegetables,
## sausage,
## soda,
## whole_milk} => {other_vegetables} 0.001016777 0.5882353 0.001728521 3.0400915 10
## [21418] {other_vegetables,
## root_vegetables,
## sausage,
## whole_milk} => {soda} 0.001016777 0.2941176 0.003457041 1.6866747 10
## [21419] {other_vegetables,
## sausage,
## soda,
## whole_milk} => {root_vegetables} 0.001016777 0.3846154 0.002643620 3.5286309 10
## [21420] {other_vegetables,
## root_vegetables,
## soda,
## whole_milk} => {sausage} 0.001016777 0.2272727 0.004473818 2.4190771 10
## [21421] {rolls/buns,
## root_vegetables,
## sausage,
## yogurt} => {whole_milk} 0.001220132 0.6666667 0.001830198 2.6090994 12
## [21422] {root_vegetables,
## sausage,
## whole_milk,
## yogurt} => {rolls/buns} 0.001220132 0.3750000 0.003253686 2.0387645 12
## [21423] {rolls/buns,
## root_vegetables,
## sausage,
## whole_milk} => {yogurt} 0.001220132 0.4800000 0.002541942 3.4408163 12
## [21424] {rolls/buns,
## sausage,
## whole_milk,
## yogurt} => {root_vegetables} 0.001220132 0.4444444 0.002745297 4.0775290 12
## [21425] {rolls/buns,
## root_vegetables,
## whole_milk,
## yogurt} => {sausage} 0.001220132 0.2608696 0.004677173 2.7766798 12
## [21426] {other_vegetables,
## root_vegetables,
## sausage,
## yogurt} => {whole_milk} 0.001626843 0.6400000 0.002541942 2.5047354 16
## [21427] {root_vegetables,
## sausage,
## whole_milk,
## yogurt} => {other_vegetables} 0.001626843 0.5000000 0.003253686 2.5840778 16
## [21428] {other_vegetables,
## root_vegetables,
## sausage,
## whole_milk} => {yogurt} 0.001626843 0.4705882 0.003457041 3.3733493 16
## [21429] {other_vegetables,
## sausage,
## whole_milk,
## yogurt} => {root_vegetables} 0.001626843 0.4324324 0.003762074 3.9673255 16
## [21430] {other_vegetables,
## root_vegetables,
## whole_milk,
## yogurt} => {sausage} 0.001626843 0.2077922 0.007829181 2.2117277 16
## [21431] {other_vegetables,
## rolls/buns,
## root_vegetables,
## sausage} => {whole_milk} 0.001016777 0.4347826 0.002338587 1.7015865 10
## [21432] {rolls/buns,
## root_vegetables,
## sausage,
## whole_milk} => {other_vegetables} 0.001016777 0.4000000 0.002541942 2.0672622 10
## [21433] {other_vegetables,
## root_vegetables,
## sausage,
## whole_milk} => {rolls/buns} 0.001016777 0.2941176 0.003457041 1.5990310 10
## [21434] {other_vegetables,
## rolls/buns,
## sausage,
## whole_milk} => {root_vegetables} 0.001016777 0.3333333 0.003050330 3.0581468 10
## [21435] {other_vegetables,
## sausage,
## soda,
## yogurt} => {whole_milk} 0.001118454 0.4583333 0.002440264 1.7937558 11
## [21436] {sausage,
## soda,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.5000000 0.002236909 2.5840778 11
## [21437] {other_vegetables,
## sausage,
## soda,
## whole_milk} => {yogurt} 0.001118454 0.4230769 0.002643620 3.0327708 11
## [21438] {other_vegetables,
## sausage,
## whole_milk,
## yogurt} => {soda} 0.001118454 0.2972973 0.003762074 1.7049090 11
## [21439] {other_vegetables,
## soda,
## whole_milk,
## yogurt} => {sausage} 0.001118454 0.2558140 0.004372140 2.7228682 11
## [21440] {bottled_water,
## root_vegetables,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001423488 0.6363636 0.002236909 3.2888263 14
## [21441] {bottled_water,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001423488 0.5384615 0.002643620 3.8598901 14
## [21442] {bottled_water,
## other_vegetables,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001423488 0.4666667 0.003050330 4.2814055 14
## [21443] {bottled_water,
## other_vegetables,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001423488 0.7000000 0.002033554 6.6710271 14
## [21444] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## yogurt} => {bottled_water} 0.001423488 0.2857143 0.004982206 2.5850966 14
## [21445] {bottled_water,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001525165 0.6818182 0.002236909 2.6683971 15
## [21446] {bottled_water,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001525165 0.6000000 0.002541942 4.3010204 15
## [21447] {bottled_water,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001525165 0.4166667 0.003660397 3.8226835 15
## [21448] {bottled_water,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001525165 0.6521739 0.002338587 6.2152427 15
## [21449] {root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {bottled_water} 0.001525165 0.2678571 0.005693950 2.4235281 15
## [21450] {bottled_water,
## rolls/buns,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001118454 0.9166667 0.001220132 3.5875116 11
## [21451] {bottled_water,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001118454 0.4400000 0.002541942 2.3921504 11
## [21452] {bottled_water,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001118454 0.3928571 0.002846975 3.6042444 11
## [21453] {bottled_water,
## rolls/buns,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001118454 0.4782609 0.002338587 4.5578446 11
## [21454] {rolls/buns,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {bottled_water} 0.001118454 0.2972973 0.003762074 2.6898978 11
## [21455] {bottled_water,
## other_vegetables,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001728521 0.6538462 0.002643620 2.5589244 17
## [21456] {bottled_water,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001728521 0.6800000 0.002541942 3.5143458 17
## [21457] {bottled_water,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001728521 0.4857143 0.003558719 4.4561567 17
## [21458] {bottled_water,
## other_vegetables,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001728521 0.4358974 0.003965430 4.1541195 17
## [21459] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {bottled_water} 0.001728521 0.2463768 0.007015760 2.2291775 17
## [21460] {bottled_water,
## soda,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001016777 0.4166667 0.002440264 2.2652939 10
## [21461] {bottled_water,
## rolls/buns,
## soda,
## tropical_fruit} => {yogurt} 0.001016777 0.7692308 0.001321810 5.5141287 10
## [21462] {bottled_water,
## rolls/buns,
## tropical_fruit,
## yogurt} => {soda} 0.001016777 0.4166667 0.002440264 2.3894558 10
## [21463] {bottled_water,
## rolls/buns,
## soda,
## yogurt} => {tropical_fruit} 0.001016777 0.3333333 0.003050330 3.1766796 10
## [21464] {rolls/buns,
## soda,
## tropical_fruit,
## yogurt} => {bottled_water} 0.001016777 0.4347826 0.002338587 3.9338426 10
## [21465] {bottled_water,
## soda,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.4166667 0.002440264 1.6306871 10
## [21466] {bottled_water,
## soda,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.6666667 0.001525165 4.7789116 10
## [21467] {bottled_water,
## tropical_fruit,
## whole_milk,
## yogurt} => {soda} 0.001016777 0.2777778 0.003660397 1.5929705 10
## [21468] {bottled_water,
## soda,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.3571429 0.002846975 3.4035853 10
## [21469] {soda,
## tropical_fruit,
## whole_milk,
## yogurt} => {bottled_water} 0.001016777 0.3225806 0.003152008 2.9186574 10
## [21470] {bottled_water,
## rolls/buns,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001016777 0.4166667 0.002440264 2.1533981 10
## [21471] {bottled_water,
## other_vegetables,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001016777 0.3333333 0.003050330 1.8122351 10
## [21472] {bottled_water,
## other_vegetables,
## rolls/buns,
## tropical_fruit} => {yogurt} 0.001016777 0.6666667 0.001525165 4.7789116 10
## [21473] {bottled_water,
## other_vegetables,
## rolls/buns,
## yogurt} => {tropical_fruit} 0.001016777 0.4000000 0.002541942 3.8120155 10
## [21474] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## yogurt} => {bottled_water} 0.001016777 0.2702703 0.003762074 2.4453616 10
## [21475] {bottled_water,
## rolls/buns,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001321810 0.5416667 0.002440264 2.1198932 13
## [21476] {bottled_water,
## tropical_fruit,
## whole_milk,
## yogurt} => {rolls/buns} 0.001321810 0.3611111 0.003660397 1.9632547 13
## [21477] {bottled_water,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001321810 0.4642857 0.002846975 3.3281706 13
## [21478] {bottled_water,
## rolls/buns,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001321810 0.4814815 0.002745297 4.5885372 13
## [21479] {rolls/buns,
## tropical_fruit,
## whole_milk,
## yogurt} => {bottled_water} 0.001321810 0.2708333 0.004880529 2.4504561 13
## [21480] {bottled_water,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.002033554 0.6666667 0.003050330 2.6090994 20
## [21481] {bottled_water,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.002033554 0.5555556 0.003660397 2.8711975 20
## [21482] {bottled_water,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.002033554 0.5714286 0.003558719 4.0962099 20
## [21483] {bottled_water,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.002033554 0.5128205 0.003965430 4.8871994 20
## [21484] {other_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {bottled_water} 0.002033554 0.2666667 0.007625826 2.4127568 20
## [21485] {bottled_water,
## other_vegetables,
## root_vegetables,
## yogurt} => {whole_milk} 0.001423488 0.7000000 0.002033554 2.7395543 14
## [21486] {bottled_water,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.001423488 0.6086957 0.002338587 3.1458338 14
## [21487] {bottled_water,
## other_vegetables,
## root_vegetables,
## whole_milk} => {yogurt} 0.001423488 0.3589744 0.003965430 2.5732601 14
## [21488] {bottled_water,
## other_vegetables,
## whole_milk,
## yogurt} => {root_vegetables} 0.001423488 0.3589744 0.003965430 3.2933888 14
## [21489] {bottled_water,
## other_vegetables,
## rolls/buns,
## root_vegetables} => {whole_milk} 0.001220132 0.5454545 0.002236909 2.1347177 12
## [21490] {bottled_water,
## rolls/buns,
## root_vegetables,
## whole_milk} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [21491] {bottled_water,
## other_vegetables,
## root_vegetables,
## whole_milk} => {rolls/buns} 0.001220132 0.3076923 0.003965430 1.6728324 12
## [21492] {bottled_water,
## other_vegetables,
## rolls/buns,
## whole_milk} => {root_vegetables} 0.001220132 0.4615385 0.002643620 4.2343571 12
## [21493] {bottled_water,
## other_vegetables,
## soda,
## yogurt} => {whole_milk} 0.001016777 0.4761905 0.002135231 1.8636424 10
## [21494] {bottled_water,
## soda,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.3571429 0.002846975 1.8457698 10
## [21495] {bottled_water,
## other_vegetables,
## soda,
## whole_milk} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [21496] {bottled_water,
## other_vegetables,
## whole_milk,
## yogurt} => {soda} 0.001016777 0.2564103 0.003965430 1.4704343 10
## [21497] {other_vegetables,
## soda,
## whole_milk,
## yogurt} => {bottled_water} 0.001016777 0.2325581 0.004372140 2.1041484 10
## [21498] {bottled_water,
## other_vegetables,
## rolls/buns,
## yogurt} => {whole_milk} 0.001016777 0.4000000 0.002541942 1.5654596 10
## [21499] {bottled_water,
## rolls/buns,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.3703704 0.002745297 1.9141317 10
## [21500] {bottled_water,
## other_vegetables,
## whole_milk,
## yogurt} => {rolls/buns} 0.001016777 0.2564103 0.003965430 1.3940270 10
## [21501] {bottled_water,
## other_vegetables,
## rolls/buns,
## whole_milk} => {yogurt} 0.001016777 0.3846154 0.002643620 2.7570644 10
## [21502] {other_vegetables,
## root_vegetables,
## soda,
## tropical_fruit} => {whole_milk} 0.001118454 0.4782609 0.002338587 1.8717452 11
## [21503] {root_vegetables,
## soda,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [21504] {other_vegetables,
## soda,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001118454 0.3666667 0.003050330 3.3639614 11
## [21505] {other_vegetables,
## root_vegetables,
## soda,
## whole_milk} => {tropical_fruit} 0.001118454 0.2500000 0.004473818 2.3825097 11
## [21506] {rolls/buns,
## root_vegetables,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001830198 0.6666667 0.002745297 3.4454370 18
## [21507] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001830198 0.3673469 0.004982206 1.9971571 18
## [21508] {other_vegetables,
## rolls/buns,
## root_vegetables,
## tropical_fruit} => {yogurt} 0.001830198 0.5142857 0.003558719 3.6865889 18
## [21509] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## yogurt} => {root_vegetables} 0.001830198 0.4864865 0.003762074 4.4632412 18
## [21510] {other_vegetables,
## rolls/buns,
## root_vegetables,
## yogurt} => {tropical_fruit} 0.001830198 0.4390244 0.004168785 4.1839195 18
## [21511] {rolls/buns,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.002236909 0.8148148 0.002745297 3.1888992 22
## [21512] {root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {rolls/buns} 0.002236909 0.3928571 0.005693950 2.1358485 22
## [21513] {rolls/buns,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.002236909 0.5945946 0.003762074 4.2622725 22
## [21514] {rolls/buns,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.002236909 0.4583333 0.004880529 4.2049518 22
## [21515] {rolls/buns,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.002236909 0.4782609 0.004677173 4.5578446 22
## [21516] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.003558719 0.7142857 0.004982206 2.7954636 35
## [21517] {root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.003558719 0.6250000 0.005693950 3.2300972 35
## [21518] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.003558719 0.5072464 0.007015760 3.6361284 35
## [21519] {other_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.003558719 0.4666667 0.007625826 4.2814055 35
## [21520] {other_vegetables,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.003558719 0.4545455 0.007829181 4.3318358 35
## [21521] {other_vegetables,
## rolls/buns,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.002033554 0.5714286 0.003558719 2.2363709 20
## [21522] {rolls/buns,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.002033554 0.5405405 0.003762074 2.7935976 20
## [21523] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.002033554 0.2898551 0.007015760 1.5758566 20
## [21524] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.002033554 0.5000000 0.004067107 4.5872201 20
## [21525] {other_vegetables,
## rolls/buns,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.002033554 0.3278689 0.006202339 3.1246029 20
## [21526] {rolls/buns,
## soda,
## tropical_fruit,
## yogurt} => {other_vegetables} 0.001220132 0.5217391 0.002338587 2.6964290 12
## [21527] {other_vegetables,
## soda,
## tropical_fruit,
## yogurt} => {rolls/buns} 0.001220132 0.6000000 0.002033554 3.2620232 12
## [21528] {other_vegetables,
## rolls/buns,
## soda,
## tropical_fruit} => {yogurt} 0.001220132 0.5454545 0.002236909 3.9100186 12
## [21529] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## yogurt} => {soda} 0.001220132 0.3243243 0.003762074 1.8599007 12
## [21530] {other_vegetables,
## rolls/buns,
## soda,
## yogurt} => {tropical_fruit} 0.001220132 0.3636364 0.003355363 3.4654686 12
## [21531] {rolls/buns,
## soda,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.4347826 0.002338587 1.7015865 10
## [21532] {soda,
## tropical_fruit,
## whole_milk,
## yogurt} => {rolls/buns} 0.001016777 0.3225806 0.003152008 1.7537759 10
## [21533] {rolls/buns,
## soda,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.4761905 0.002135231 3.4135083 10
## [21534] {rolls/buns,
## tropical_fruit,
## whole_milk,
## yogurt} => {soda} 0.001016777 0.2083333 0.004880529 1.1947279 10
## [21535] {rolls/buns,
## soda,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.3571429 0.002846975 3.4035853 10
## [21536] {other_vegetables,
## soda,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.5500000 0.002033554 2.1525070 11
## [21537] {soda,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.3548387 0.003152008 1.8338616 11
## [21538] {other_vegetables,
## soda,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.3666667 0.003050330 2.6284014 11
## [21539] {other_vegetables,
## soda,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.2558140 0.004372140 2.4379169 11
## [21540] {other_vegetables,
## rolls/buns,
## soda,
## tropical_fruit} => {whole_milk} 0.001118454 0.5000000 0.002236909 1.9568245 11
## [21541] {rolls/buns,
## soda,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001118454 0.5238095 0.002135231 2.7071291 11
## [21542] {other_vegetables,
## soda,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001118454 0.3666667 0.003050330 1.9934586 11
## [21543] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {soda} 0.001118454 0.2750000 0.004067107 1.5770408 11
## [21544] {other_vegetables,
## rolls/buns,
## soda,
## whole_milk} => {tropical_fruit} 0.001118454 0.2558140 0.004372140 2.4379169 11
## [21545] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## yogurt} => {whole_milk} 0.002541942 0.6756757 0.003762074 2.6443574 25
## [21546] {rolls/buns,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.002541942 0.5208333 0.004880529 2.6917477 25
## [21547] {other_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {rolls/buns} 0.002541942 0.3333333 0.007625826 1.8122351 25
## [21548] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {yogurt} 0.002541942 0.6250000 0.004067107 4.4802296 25
## [21549] {other_vegetables,
## rolls/buns,
## whole_milk,
## yogurt} => {tropical_fruit} 0.002541942 0.4237288 0.005998983 4.0381520 25
## [21550] {rolls/buns,
## root_vegetables,
## soda,
## yogurt} => {other_vegetables} 0.001016777 0.7692308 0.001321810 3.9755043 10
## [21551] {other_vegetables,
## root_vegetables,
## soda,
## yogurt} => {rolls/buns} 0.001016777 0.4166667 0.002440264 2.2652939 10
## [21552] {other_vegetables,
## rolls/buns,
## root_vegetables,
## soda} => {yogurt} 0.001016777 0.3703704 0.002745297 2.6549509 10
## [21553] {other_vegetables,
## rolls/buns,
## root_vegetables,
## yogurt} => {soda} 0.001016777 0.2439024 0.004168785 1.3987058 10
## [21554] {other_vegetables,
## rolls/buns,
## soda,
## yogurt} => {root_vegetables} 0.001016777 0.3030303 0.003355363 2.7801334 10
## [21555] {other_vegetables,
## root_vegetables,
## soda,
## yogurt} => {whole_milk} 0.001423488 0.5833333 0.002440264 2.2829619 14
## [21556] {root_vegetables,
## soda,
## whole_milk,
## yogurt} => {other_vegetables} 0.001423488 0.5833333 0.002440264 3.0147574 14
## [21557] {other_vegetables,
## root_vegetables,
## soda,
## whole_milk} => {yogurt} 0.001423488 0.3181818 0.004473818 2.2808442 14
## [21558] {other_vegetables,
## soda,
## whole_milk,
## yogurt} => {root_vegetables} 0.001423488 0.3255814 0.004372140 2.9870271 14
## [21559] {other_vegetables,
## rolls/buns,
## root_vegetables,
## soda} => {whole_milk} 0.001525165 0.5555556 0.002745297 2.1742495 15
## [21560] {rolls/buns,
## root_vegetables,
## soda,
## whole_milk} => {other_vegetables} 0.001525165 0.6250000 0.002440264 3.2300972 15
## [21561] {other_vegetables,
## root_vegetables,
## soda,
## whole_milk} => {rolls/buns} 0.001525165 0.3409091 0.004473818 1.8534223 15
## [21562] {other_vegetables,
## rolls/buns,
## root_vegetables,
## whole_milk} => {soda} 0.001525165 0.2459016 0.006202339 1.4101706 15
## [21563] {other_vegetables,
## rolls/buns,
## soda,
## whole_milk} => {root_vegetables} 0.001525165 0.3488372 0.004372140 3.2003862 15
## [21564] {other_vegetables,
## rolls/buns,
## root_vegetables,
## yogurt} => {whole_milk} 0.002440264 0.5853659 0.004168785 2.2909165 24
## [21565] {rolls/buns,
## root_vegetables,
## whole_milk,
## yogurt} => {other_vegetables} 0.002440264 0.5217391 0.004677173 2.6964290 24
## [21566] {other_vegetables,
## root_vegetables,
## whole_milk,
## yogurt} => {rolls/buns} 0.002440264 0.3116883 0.007829181 1.6945575 24
## [21567] {other_vegetables,
## rolls/buns,
## root_vegetables,
## whole_milk} => {yogurt} 0.002440264 0.3934426 0.006202339 2.8203413 24
## [21568] {other_vegetables,
## rolls/buns,
## whole_milk,
## yogurt} => {root_vegetables} 0.002440264 0.4067797 0.005998983 3.7319757 24
## [21569] {other_vegetables,
## rolls/buns,
## soda,
## yogurt} => {whole_milk} 0.001626843 0.4848485 0.003355363 1.8975268 16
## [21570] {rolls/buns,
## soda,
## whole_milk,
## yogurt} => {other_vegetables} 0.001626843 0.5714286 0.002846975 2.9532317 16
## [21571] {other_vegetables,
## soda,
## whole_milk,
## yogurt} => {rolls/buns} 0.001626843 0.3720930 0.004372140 2.0229601 16
## [21572] {other_vegetables,
## rolls/buns,
## soda,
## whole_milk} => {yogurt} 0.001626843 0.3720930 0.004372140 2.6672995 16
## [21573] {other_vegetables,
## rolls/buns,
## whole_milk,
## yogurt} => {soda} 0.001626843 0.2711864 0.005998983 1.5551712 16
## [21574] {oil,
## other_vegetables,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 1.0000000 0.001016777 3.9136490 10
## [21575] {oil,
## root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.9090909 0.001118454 4.6983232 10
## [21576] {oil,
## other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.7692308 0.001321810 5.5141287 10
## [21577] {oil,
## other_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001016777 0.9090909 0.001118454 8.3404003 10
## [21578] {oil,
## other_vegetables,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.7142857 0.001423488 6.8071705 10
## [21579] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {oil} 0.001016777 0.2857143 0.003558719 10.1811594 10
## [21580] {beef,
## other_vegetables,
## rolls/buns,
## root_vegetables,
## tropical_fruit} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [21581] {beef,
## rolls/buns,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {other_vegetables} 0.001118454 0.7857143 0.001423488 4.0606936 11
## [21582] {beef,
## other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {rolls/buns} 0.001118454 0.5789474 0.001931876 3.1475663 11
## [21583] {beef,
## other_vegetables,
## rolls/buns,
## tropical_fruit,
## whole_milk} => {root_vegetables} 0.001118454 0.7333333 0.001525165 6.7279229 11
## [21584] {beef,
## other_vegetables,
## rolls/buns,
## root_vegetables,
## whole_milk} => {tropical_fruit} 0.001118454 0.6470588 0.001728521 6.1664957 11
## [21585] {other_vegetables,
## rolls/buns,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {beef} 0.001118454 0.5500000 0.002033554 10.4830426 11
## [21586] {butter,
## domestic_eggs,
## other_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001016777 0.9090909 0.001118454 3.5578628 10
## [21587] {butter,
## domestic_eggs,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.8333333 0.001220132 4.3067963 10
## [21588] {butter,
## domestic_eggs,
## other_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001016777 0.7692308 0.001321810 5.5141287 10
## [21589] {butter,
## domestic_eggs,
## other_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001016777 0.7692308 0.001321810 7.3307990 10
## [21590] {butter,
## other_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {domestic_eggs} 0.001016777 0.4347826 0.002338587 6.8527035 10
## [21591] {domestic_eggs,
## other_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {butter} 0.001016777 0.6250000 0.001626843 11.2786697 10
## [21592] {butter,
## other_vegetables,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.8461538 0.001321810 3.3115492 11
## [21593] {butter,
## root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.6470588 0.001728521 3.3441006 11
## [21594] {butter,
## other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.7333333 0.001525165 5.2568027 11
## [21595] {butter,
## other_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.4782609 0.002338587 4.3877758 11
## [21596] {butter,
## other_vegetables,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.6875000 0.001626843 6.5519016 11
## [21597] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {butter} 0.001118454 0.3142857 0.003558719 5.6715596 11
## [21598] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001016777 0.8333333 0.001220132 3.2613742 10
## [21599] {citrus_fruit,
## root_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001016777 0.9090909 0.001118454 4.6983232 10
## [21600] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001016777 0.6666667 0.001525165 4.7789116 10
## [21601] {citrus_fruit,
## other_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {root_vegetables} 0.001016777 0.5882353 0.001728521 5.3967296 10
## [21602] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001016777 0.4347826 0.002338587 5.2531781 10
## [21603] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001016777 0.4347826 0.002338587 6.0653716 10
## [21604] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## yogurt} => {whole_milk} 0.001118454 0.6470588 0.001728521 2.5323611 11
## [21605] {root_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.6875000 0.001626843 3.5531069 11
## [21606] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk} => {yogurt} 0.001118454 0.5789474 0.001931876 4.1501074 11
## [21607] {other_vegetables,
## tropical_fruit,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.4583333 0.002440264 4.2049518 11
## [21608] {other_vegetables,
## root_vegetables,
## whipped/sour_cream,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.4782609 0.002338587 4.5578446 11
## [21609] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {whipped/sour_cream} 0.001118454 0.3142857 0.003558719 4.3843972 11
## [21610] {other_vegetables,
## pip_fruit,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001321810 0.8666667 0.001525165 3.3918292 13
## [21611] {pip_fruit,
## root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.7222222 0.001830198 3.7325568 13
## [21612] {other_vegetables,
## pip_fruit,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001321810 0.5416667 0.002440264 3.8828656 13
## [21613] {other_vegetables,
## pip_fruit,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001321810 0.5652174 0.002338587 5.1855532 13
## [21614] {other_vegetables,
## pip_fruit,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001321810 0.5652174 0.002338587 5.3865436 13
## [21615] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {pip_fruit} 0.001321810 0.3714286 0.003558719 4.9099462 13
## [21616] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001423488 0.8235294 0.001728521 3.2230051 14
## [21617] {citrus_fruit,
## root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001423488 0.9333333 0.001525165 4.8236118 14
## [21618] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001423488 0.4516129 0.003152008 3.2373272 14
## [21619] {citrus_fruit,
## other_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001423488 0.5833333 0.002440264 5.3517568 14
## [21620] {citrus_fruit,
## other_vegetables,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001423488 0.6086957 0.002338587 5.8008932 14
## [21621] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {citrus_fruit} 0.001423488 0.4000000 0.003558719 4.8329238 14
## [21622] {bottled_water,
## other_vegetables,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001118454 0.7857143 0.001423488 3.0750099 11
## [21623] {bottled_water,
## root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001118454 0.7333333 0.001525165 3.7899807 11
## [21624] {bottled_water,
## other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001118454 0.6470588 0.001728521 4.6383553 11
## [21625] {bottled_water,
## other_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001118454 0.5500000 0.002033554 5.0459422 11
## [21626] {bottled_water,
## other_vegetables,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001118454 0.7857143 0.001423488 7.4878876 11
## [21627] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {bottled_water} 0.001118454 0.3142857 0.003558719 2.8436063 11
## [21628] {other_vegetables,
## rolls/buns,
## root_vegetables,
## tropical_fruit,
## yogurt} => {whole_milk} 0.001321810 0.7222222 0.001830198 2.8265243 13
## [21629] {rolls/buns,
## root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {other_vegetables} 0.001321810 0.5909091 0.002236909 3.0539101 13
## [21630] {other_vegetables,
## root_vegetables,
## tropical_fruit,
## whole_milk,
## yogurt} => {rolls/buns} 0.001321810 0.3714286 0.003558719 2.0193477 13
## [21631] {other_vegetables,
## rolls/buns,
## root_vegetables,
## tropical_fruit,
## whole_milk} => {yogurt} 0.001321810 0.6500000 0.002033554 4.6594388 13
## [21632] {other_vegetables,
## rolls/buns,
## tropical_fruit,
## whole_milk,
## yogurt} => {root_vegetables} 0.001321810 0.5200000 0.002541942 4.7707090 13
## [21633] {other_vegetables,
## rolls/buns,
## root_vegetables,
## whole_milk,
## yogurt} => {tropical_fruit} 0.001321810 0.5416667 0.002440264 5.1621043 13
#inspecting
# Load required libraries
library(arules)
# 1. Load Data & Preprocess
grocery_trans <- read.transactions("cleaned_grocery_data.csv", format = "basket", sep = ",")
# 2. Cluster Transactions (K-Means Alternative)
binary_matrix <- as(grocery_trans, "matrix") * 1 # Convert to 0/1 numeric matrix
set.seed(135)
kmeans_result <- kmeans(binary_matrix, centers = 3)
cluster_labels <- kmeans_result$cluster
# 3. Mine Rules for Cluster 1
cluster1_trans <- grocery_trans[cluster_labels == 1]
rules_cluster1 <- apriori(
cluster1_trans,
parameter = list(support = 0.005, confidence = 0.2, minlen = 2)
)
## Apriori
##
## Parameter specification:
## confidence minval smax arem aval originalSupport maxtime support minlen
## 0.2 0.1 1 none FALSE TRUE 5 0.005 2
## maxlen target ext
## 10 rules TRUE
##
## Algorithmic control:
## filter tree heap memopt load sort verbose
## 0.1 TRUE TRUE FALSE TRUE 2 TRUE
##
## Absolute minimum support count: 30
##
## set item appearances ...[0 item(s)] done [0.00s].
## set transactions ...[165 item(s), 6145 transaction(s)] done [0.00s].
## sorting and recoding items ... [105 item(s)] done [0.00s].
## creating transaction tree ... done [0.00s].
## checking subsets of size 1 2 3 4 done [0.01s].
## writing ... [76 rule(s)] done [0.00s].
## creating S4 object ... done [0.00s].
# 4. Filter GLOBAL Rules Properly
all_rules <- apriori(
grocery_trans,
parameter = list(support = 0.001, confidence = 0.2, minlen = 2)
)
## Apriori
##
## Parameter specification:
## confidence minval smax arem aval originalSupport maxtime support minlen
## 0.2 0.1 1 none FALSE TRUE 5 0.001 2
## maxlen target ext
## 10 rules TRUE
##
## Algorithmic control:
## filter tree heap memopt load sort verbose
## 0.1 TRUE TRUE FALSE TRUE 2 TRUE
##
## Absolute minimum support count: 9
##
## set item appearances ...[0 item(s)] done [0.00s].
## set transactions ...[169 item(s), 9835 transaction(s)] done [0.00s].
## sorting and recoding items ... [157 item(s)] done [0.00s].
## creating transaction tree ... done [0.00s].
## checking subsets of size 1 2 3 4 5 6 done [0.01s].
## writing ... [21633 rule(s)] done [0.00s].
## creating S4 object ... done [0.00s].
# Fix: Preserve support/confidence/lift while adding new measures
quality(all_rules) <- cbind(
quality(all_rules),
interestMeasure(all_rules, measure = c("lift", "conviction"), transactions = grocery_trans)
)
# Filter rules using VALID quality columns
strong_rules <- subset(
all_rules,
lift > 3 &
support > 0.002 &
confidence > 0.2
)
# 5. View Results
cat("\n=== Cluster 1 Rules ===\n")
##
## === Cluster 1 Rules ===
inspect(head(sort(rules_cluster1, by = "lift"), 10))
## lhs rhs support
## [1] {berries} => {whipped/sour_cream} 0.006183889
## [2] {liquor} => {bottled_beer} 0.007160293
## [3] {beef} => {root_vegetables} 0.008136697
## [4] {rolls/buns, shopping_bags} => {sausage} 0.005207486
## [5] {pip_fruit} => {tropical_fruit} 0.011391375
## [6] {rolls/buns, soda} => {sausage} 0.008950366
## [7] {shopping_bags, soda} => {sausage} 0.005370220
## [8] {bottled_beer, soda} => {bottled_water} 0.005207486
## [9] {fruit/vegetable_juice, soda} => {bottled_water} 0.005044752
## [10] {berries} => {yogurt} 0.007160293
## confidence coverage lift count
## [1] 0.2420382 0.02554923 6.171472 38
## [2] 0.4782609 0.01497152 5.819630 44
## [3] 0.2487562 0.03270952 4.417939 50
## [4] 0.3018868 0.01724980 4.015356 32
## [5] 0.2194357 0.05191212 3.143200 70
## [6] 0.2330508 0.03840521 3.099778 55
## [7] 0.2275862 0.02359642 3.027094 33
## [8] 0.2990654 0.01741253 3.017663 32
## [9] 0.2980769 0.01692433 3.007689 31
## [10] 0.2802548 0.02554923 2.851268 44
cat("\n=== Strong Global Rules ===\n")
##
## === Strong Global Rules ===
inspect(head(sort(strong_rules, by = "lift"), 10))
## lhs rhs support confidence coverage lift count lift conviction
## [1] {instant_food_products} => {hamburger_meat} 0.003050330 0.3797468 0.008032537 11.421438 30 11.421438 1.558640
## [2] {flour,
## whole_milk} => {sugar} 0.002846975 0.3373494 0.008439248 9.963457 28 9.963457 1.457995
## [3] {flour} => {sugar} 0.004982206 0.2865497 0.017386884 8.463112 49 8.463112 1.354182
## [4] {hard_cheese,
## whipped/sour_cream} => {butter} 0.002033554 0.4545455 0.004473818 8.202669 20 8.202669 1.731740
## [5] {popcorn} => {salty_snack} 0.002236909 0.3098592 0.007219115 8.192110 22 8.192110 1.394173
## [6] {processed_cheese,
## whole_milk} => {white_bread} 0.002135231 0.3043478 0.007015760 7.230099 21 7.230099 1.376989
## [7] {butter,
## hard_cheese} => {whipped/sour_cream} 0.002033554 0.5128205 0.003965430 7.154028 20 7.154028 1.905493
## [8] {bottled_water,
## root_vegetables,
## whole_milk} => {butter} 0.002440264 0.3333333 0.007320793 6.015291 24 6.015291 1.416878
## [9] {processed_cheese} => {white_bread} 0.004168785 0.2515337 0.016573462 5.975445 41 5.975445 1.279824
## [10] {butter,
## other_vegetables,
## tropical_fruit} => {whipped/sour_cream} 0.002338587 0.4259259 0.005490595 5.941818 23 5.941818 1.617069
# Load required libraries
library(arules)
library(factoextra) # For PCA visualization
## Warning: package 'factoextra' was built under R version 4.4.3
## Loading required package: ggplot2
## Warning: package 'ggplot2' was built under R version 4.4.3
## Welcome! Want to learn more? See two factoextra-related books at https://goo.gl/ve3WBa
library(ggplot2)
# 1. Load Data & Cluster Labels (from previous code)
grocery_trans <- read.transactions("cleaned_grocery_data.csv", format = "basket", sep = ",")
binary_matrix <- as(grocery_trans, "matrix") * 1 # Convert to 0/1 numeric matrix
set.seed(135)
kmeans_result <- kmeans(binary_matrix, centers = 3)
cluster_labels <- kmeans_result$cluster
# 2. Print Cluster Summary
cat("=== Cluster Distribution ===\n")
## === Cluster Distribution ===
print(table(cluster_labels)) # Number of transactions per cluster
## cluster_labels
## 1 2 3
## 6145 1777 1913
# 3. Print Top Items in Each Cluster
for (cluster in 1:3) {
cat("\n=== Top Items in Cluster", cluster, "===\n")
cluster_trans <- grocery_trans[cluster_labels == cluster]
item_freq <- itemFrequency(cluster_trans, type = "absolute")
print(head(sort(item_freq, decreasing = TRUE), 5)) # Top 5 items per cluster
}
##
## === Top Items in Cluster 1 ===
## soda rolls/buns canned_beer bottled_water yogurt
## 1134 1007 616 609 604
##
## === Top Items in Cluster 2 ===
## whole_milk rolls/buns yogurt soda root_vegetables
## 1777 381 332 257 253
##
## === Top Items in Cluster 3 ===
## other_vegetables whole_milk root_vegetables yogurt
## 1903 736 473 436
## rolls/buns
## 421
# 4. Visualize Clusters with PCA
pca <- prcomp(binary_matrix, scale = TRUE) # Perform PCA
pca_scores <- as.data.frame(pca$x[, 1:2]) # Extract first two PCs
pca_scores$cluster <- as.factor(cluster_labels)
# Plot clusters
ggplot(pca_scores, aes(x = PC1, y = PC2, color = cluster)) +
geom_point(alpha = 0.5) +
labs(title = "Cluster Visualization (PCA-Reduced Data)",
x = "Principal Component 1",
y = "Principal Component 2") +
theme_minimal()
The grocery dataset analysis revealed three distinct customer segments through k-means clustering, validated by PCA visualization. Cluster 1 as 6,145 transactions is characterized by frequent purchases of soda, rolls/buns, canned beer, and bottled water, suggesting a convenience-focused segment likely making quick, snack-oriented purchases. Cluster 2 with 1,777 transactions prioritizes whole milk, rolls/buns, and yogurt, representing staple grocery buyers who regularly stock household essentials. Cluster 3 as 1,913 transactions emphasizes other vegetables, whole milk, and root vegetables, aligning with health-conscious shoppers purchasing fresh produce and dairy for balanced meals.
The PCA plot showed reasonable separation between clusters, though partial overlap between Clusters 2 and 3 suggests shared staples like whole milk. This overlap likely stems from common household items bridging segments, while unique items example as other vegetables in Cluster 3 maintain distinctiveness. Association rules filtered for lift > 3 highlighted strong item relationships, such as {other vegetables, root vegetables} => {whole milk} (lift = 3.5), which aligns with Cluster 3’s health-oriented behavior, the High-lift rules like {yogurt, tropical fruit} => {whole milk} further validate recurring purchase patterns within clusters.
The results demonstrate meaningful customer segmentation and actionable associations, talking about Cluster 1 benefits from impulse-buy strategies mentioning as example placing snacks near checkouts, while Cluster 3 could be targeted with promotions for fresh produce and organic products. The overlap between Clusters 2 and 3 indicates opportunities for cross-selling staples like milk with complementary items example vegetables. The high-lift rules provide statistically significant insights for inventory bundling and personalized marketing.
While the clusters are well-defined, refining parameters example testing k=4 clusters might uncover niche segments, such as alcohol-focused buyers, in the future work could integrate demographic data to enhance segmentation or validate rules through A/B testing. Overall, this analysis offers a robust foundation for data-driven retail strategies, balancing operational efficiency with customer-centric targeting.
Note that the echo = FALSE
parameter was added to the
code chunk to prevent printing of the R code that generated the
plot.