Source Code: https://github.com/djlofland/DATA624_PredictiveAnalytics/tree/master/Homework_10

Overview

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. Due May 3 before midnight.

Load Data

# Load Groceries Dataset
groceries_df <- read.csv("./GroceryDataSet.csv", header = FALSE,
                         na.strings="", 
                         stringsAsFactors=FALSE )

# Add an id column
groceries_df$id <- seq(nrow(groceries_df))

# Trim any white space at the begining or end of product names
groceries_df <- groceries_df %>%
  mutate(across(where(is.character), str_trim))

#cols_to_trim <- names(groceries_df)[vapply(groceries_df, is.character, logical(1))]
#groceries_df[,cols_to_trim] <- lapply(groceries_df[,cols_to_trim], trimws)

# How many baskets and max products?
print(paste(nrow(groceries_df), ncol(groceries_df)))
## [1] "9835 33"
# Since the data.frame has empty cells, we need to clean those out
groceries_long <- melt(groceries_df, id.vars="id")
groceries_trans <- as(lapply(split(groceries_long$value, groceries_long$id), unique), "transactions")

# View first few baskets to make sure things look good
inspect(groceries_trans[1:5])
##     items                      transactionID
## [1] {citrus fruit,                          
##      margarine,                             
##      ready soups,                           
##      semi-finished bread}                  1
## [2] {coffee,                                
##      tropical fruit,                        
##      yogurt}                               2
## [3] {whole milk}                           3
## [4] {cream cheese,                          
##      meat spreads,                          
##      pip fruit,                             
##      yogurt}                               4
## [5] {condensed milk,                        
##      long life bakery product,              
##      other vegetables,                      
##      whole milk}                           5
# Plot product frequency for top items

itemFrequencyPlot(groceries_trans, 
                  topN=30, 
                  type="absolute",
                  col=brewer.pal(8,'Pastel2'),
                  main='Absolute Item Frequency Plot',
                  ylab="Item Frequency (Absolute)")

# iFreq <- itemFrequency(groceries_trans, type="relative")

Create Basket Rules

I am filtering to only include rules with 1~4 items on the RHS. Rules with 5+ items are probably less useful and would increase noise. Given the large number of receipts, I’m using a lower support threshold and I experimented with different confidence values to get what look like reasonable rules.

Note: I tried to remove redundant rules using examples from documentation, but for some reason (I don’t know why), the filtering treated ALL rules as redundant. After a fair bit of troubleshooting, I just removed that step for now. This would certainly be something I would circle back to if I were using this analysis for real.

rules <- apriori(groceries_trans, 
                 parameter = list(supp = 0.001, 
                                  conf = 0.15,
                                  minlen = 2,
                                  maxlen = 5))
## Apriori
## 
## Parameter specification:
##  confidence minval smax arem  aval originalSupport maxtime support minlen
##        0.15    0.1    1 none FALSE            TRUE       5   0.001      2
##  maxlen target  ext
##       5  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
## Warning in apriori(groceries_trans, parameter = list(supp = 0.001, conf =
## 0.15, : Mining stopped (maxlen reached). Only patterns up to a length of 5
## returned!
##  done [0.01s].
## writing ... [26760 rule(s)] done [0.00s].
## creating S4 object  ... done [0.01s].
# find redundant rules
# subset.matrix <- is.subset(rules, rules)
# subset.matrix[lower.tri(subset.matrix, diag=T)] <- NA
# redundant <- colSums(subset.matrix, na.rm=T) >= 1

# remove redundant rules
# rules.pruned <- rules[!redundant]
# rules <- rules.pruned

rules <- sort(rules, by="lift", decreasing=TRUE)
inspect(rules[1:10])
##      lhs                        rhs                     support confidence coverage lift count
## [1]  {bottled beer,                                                                           
##       red/blush wine}        => {liquor}                 0.0019       0.40   0.0049   36    19
## [2]  {hamburger meat,                                                                         
##       soda}                  => {Instant food products}  0.0012       0.21   0.0058   26    12
## [3]  {ham,                                                                                    
##       white bread}           => {processed cheese}       0.0019       0.38   0.0051   23    19
## [4]  {other vegetables,                                                                       
##       root vegetables,                                                                        
##       whole milk,                                                                             
##       yogurt}                => {rice}                   0.0013       0.17   0.0078   22    13
## [5]  {bottled beer,                                                                           
##       liquor}                => {red/blush wine}         0.0019       0.41   0.0047   21    19
## [6]  {Instant food products,                                                                  
##       soda}                  => {hamburger meat}         0.0012       0.63   0.0019   19    12
## [7]  {curd,                                                                                   
##       sugar}                 => {flour}                  0.0011       0.32   0.0035   19    11
## [8]  {baking powder,                                                                          
##       sugar}                 => {flour}                  0.0010       0.31   0.0033   18    10
## [9]  {processed cheese,                                                                       
##       white bread}           => {ham}                    0.0019       0.46   0.0042   18    19
## [10] {fruit/vegetable juice,                                                                  
##       ham}                   => {processed cheese}       0.0011       0.29   0.0039   17    11

Stepping back, if this were being used in a real setting, I would explore generating a score using a geometric mean of support, confidence and lift … then sorting my rules based on this new metric, score. Ideally we want rules that are both prevalent and meaningful. A large lift with low support not be actionable. Alternatively, a high confidence with low support or low lift would also not be as actionable. Ideally, we want rules that identify both high lift and high support.

Per instructions, I’ve just sorted based on lift for now; however, lift alone probably isn’t the best approach.

Visualize Rules

# Sort rules by Confidence
plot(rules[1:20], 
     method="graph", 
     engine='default', 
     control = list(type='items'))
## Available control parameters (with default values):
## main  =  Graph for 20 rules
## nodeColors    =  c("#66CC6680", "#9999CC80")
## nodeCol   =  c("#EE0000FF", "#EE0303FF", "#EE0606FF", "#EE0909FF", "#EE0C0CFF", "#EE0F0FFF", "#EE1212FF", "#EE1515FF", "#EE1818FF", "#EE1B1BFF", "#EE1E1EFF", "#EE2222FF", "#EE2525FF", "#EE2828FF", "#EE2B2BFF", "#EE2E2EFF", "#EE3131FF", "#EE3434FF", "#EE3737FF", "#EE3A3AFF", "#EE3D3DFF", "#EE4040FF", "#EE4444FF", "#EE4747FF", "#EE4A4AFF", "#EE4D4DFF", "#EE5050FF", "#EE5353FF", "#EE5656FF", "#EE5959FF", "#EE5C5CFF", "#EE5F5FFF", "#EE6262FF", "#EE6666FF", "#EE6969FF", "#EE6C6CFF", "#EE6F6FFF", "#EE7272FF", "#EE7575FF",  "#EE7878FF", "#EE7B7BFF", "#EE7E7EFF", "#EE8181FF", "#EE8484FF", "#EE8888FF", "#EE8B8BFF", "#EE8E8EFF", "#EE9191FF", "#EE9494FF", "#EE9797FF", "#EE9999FF", "#EE9B9BFF", "#EE9D9DFF", "#EE9F9FFF", "#EEA0A0FF", "#EEA2A2FF", "#EEA4A4FF", "#EEA5A5FF", "#EEA7A7FF", "#EEA9A9FF", "#EEABABFF", "#EEACACFF", "#EEAEAEFF", "#EEB0B0FF", "#EEB1B1FF", "#EEB3B3FF", "#EEB5B5FF", "#EEB7B7FF", "#EEB8B8FF", "#EEBABAFF", "#EEBCBCFF", "#EEBDBDFF", "#EEBFBFFF", "#EEC1C1FF", "#EEC3C3FF", "#EEC4C4FF", "#EEC6C6FF", "#EEC8C8FF",  "#EEC9C9FF", "#EECBCBFF", "#EECDCDFF", "#EECFCFFF", "#EED0D0FF", "#EED2D2FF", "#EED4D4FF", "#EED5D5FF", "#EED7D7FF", "#EED9D9FF", "#EEDBDBFF", "#EEDCDCFF", "#EEDEDEFF", "#EEE0E0FF", "#EEE1E1FF", "#EEE3E3FF", "#EEE5E5FF", "#EEE7E7FF", "#EEE8E8FF", "#EEEAEAFF", "#EEECECFF", "#EEEEEEFF")
## edgeCol   =  c("#474747FF", "#494949FF", "#4B4B4BFF", "#4D4D4DFF", "#4F4F4FFF", "#515151FF", "#535353FF", "#555555FF", "#575757FF", "#595959FF", "#5B5B5BFF", "#5E5E5EFF", "#606060FF", "#626262FF", "#646464FF", "#666666FF", "#686868FF", "#6A6A6AFF", "#6C6C6CFF", "#6E6E6EFF", "#707070FF", "#727272FF", "#747474FF", "#767676FF", "#787878FF", "#7A7A7AFF", "#7C7C7CFF", "#7E7E7EFF", "#808080FF", "#828282FF", "#848484FF", "#868686FF", "#888888FF", "#8A8A8AFF", "#8C8C8CFF", "#8D8D8DFF", "#8F8F8FFF", "#919191FF", "#939393FF",  "#959595FF", "#979797FF", "#999999FF", "#9A9A9AFF", "#9C9C9CFF", "#9E9E9EFF", "#A0A0A0FF", "#A2A2A2FF", "#A3A3A3FF", "#A5A5A5FF", "#A7A7A7FF", "#A9A9A9FF", "#AAAAAAFF", "#ACACACFF", "#AEAEAEFF", "#AFAFAFFF", "#B1B1B1FF", "#B3B3B3FF", "#B4B4B4FF", "#B6B6B6FF", "#B7B7B7FF", "#B9B9B9FF", "#BBBBBBFF", "#BCBCBCFF", "#BEBEBEFF", "#BFBFBFFF", "#C1C1C1FF", "#C2C2C2FF", "#C3C3C4FF", "#C5C5C5FF", "#C6C6C6FF", "#C8C8C8FF", "#C9C9C9FF", "#CACACAFF", "#CCCCCCFF", "#CDCDCDFF", "#CECECEFF", "#CFCFCFFF", "#D1D1D1FF",  "#D2D2D2FF", "#D3D3D3FF", "#D4D4D4FF", "#D5D5D5FF", "#D6D6D6FF", "#D7D7D7FF", "#D8D8D8FF", "#D9D9D9FF", "#DADADAFF", "#DBDBDBFF", "#DCDCDCFF", "#DDDDDDFF", "#DEDEDEFF", "#DEDEDEFF", "#DFDFDFFF", "#E0E0E0FF", "#E0E0E0FF", "#E1E1E1FF", "#E1E1E1FF", "#E2E2E2FF", "#E2E2E2FF", "#E2E2E2FF")
## alpha     =  0.5
## cex   =  1
## itemLabels    =  TRUE
## labelCol  =  #000000B3
## measureLabels     =  FALSE
## precision     =  3
## layout    =  NULL
## layoutParams  =  list()
## arrowSize     =  0.5
## engine    =  igraph
## plot  =  TRUE
## plot_options  =  list()
## max   =  100
## verbose   =  FALSE

plot(rules[1:20],
     method = "paracoord",
     control = list(reorder = TRUE))

Cluster Analysis

s <- groceries_trans[,itemFrequency(groceries_trans) > 0.02]
d_jaccard <- dissimilarity(s, which = "items", method="affinity")
plot(hclust(d_jaccard, method = "ward.D2"), main = "Dendrogram for Items")

d_affinity <- dissimilarity(rules[1:20], 
                            method = "affinity", 
                            args = list(transactions = groceries_trans))
hc <- hclust(d_affinity, method = "ward.D2")
plot(hc, main = "Dendrogram for Rules (Affinity)") 

## create 4 groups and inspect the rules in the first group.
assign <- cutree(hc, k = 3)
inspect(rules[assign == 1])
##        lhs                            rhs                        support confidence coverage  lift count
## [1]    {bottled beer,                                                                                   
##         red/blush wine}            => {liquor}                    0.0019       0.40   0.0049 35.72    19
## [2]    {bottled beer,                                                                                   
##         liquor}                    => {red/blush wine}            0.0019       0.41   0.0047 21.49    19
## [3]    {Instant food products,                                                                          
##         rolls/buns}                => {hamburger meat}            0.0010       0.43   0.0023 13.08    10
## [4]    {citrus fruit,                                                                                   
##         fruit/vegetable juice,                                                                          
##         tropical fruit}            => {grapes}                    0.0011       0.28   0.0040 12.61    11
## [5]    {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         yogurt}                    => {soft cheese}               0.0011       0.19   0.0058 11.30    11
## [6]    {cream cheese,                                                                                   
##         other vegetables,                                                                               
##         whipped/sour cream,                                                                             
##         yogurt}                    => {curd}                      0.0010       0.59   0.0017 11.04    10
## [7]    {other vegetables,                                                                               
##         root vegetables,                                                                                
##         shopping bags}             => {herbs}                     0.0011       0.17   0.0066 10.40    11
## [8]    {butter,                                                                                         
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk}                => {onions}                    0.0013       0.32   0.0042 10.22    13
## [9]    {fruit/vegetable juice,                                                                          
##         white bread}               => {processed cheese}          0.0012       0.16   0.0074  9.92    12
## [10]   {butter,                                                                                         
##         napkins,                                                                                        
##         whole milk}                => {hygiene articles}          0.0010       0.32   0.0032  9.79    10
## [11]   {butter,                                                                                         
##         hard cheese,                                                                                    
##         whole milk}                => {whipped/sour cream}        0.0014       0.67   0.0021  9.30    14
## [12]   {domestic eggs,                                                                                  
##         whole milk,                                                                                     
##         yogurt}                    => {soft cheese}               0.0012       0.16   0.0077  9.24    12
## [13]   {sugar,                                                                                          
##         whipped/sour cream,                                                                             
##         yogurt}                    => {curd}                      0.0010       0.48   0.0021  8.94    10
## [14]   {soda,                                                                                           
##         sugar}                     => {flour}                     0.0011       0.15   0.0073  8.79    11
## [15]   {baking powder,                                                                                  
##         whipped/sour cream}        => {sugar}                     0.0013       0.29   0.0046  8.53    13
## [16]   {fruit/vegetable juice,                                                                          
##         white bread}               => {ham}                       0.0016       0.22   0.0074  8.42    16
## [17]   {butter,                                                                                         
##         other vegetables,                                                                               
##         tropical fruit}            => {sliced cheese}             0.0011       0.20   0.0055  8.31    11
## [18]   {chocolate,                                                                                      
##         tropical fruit,                                                                                 
##         whole milk}                => {long life bakery product}  0.0012       0.31   0.0040  8.22    12
## [19]   {citrus fruit,                                                                                   
##         domestic eggs,                                                                                  
##         yogurt}                    => {chicken}                   0.0010       0.34   0.0029  8.04    10
## [20]   {long life bakery product,                                                                       
##         other vegetables,                                                                               
##         whipped/sour cream}        => {butter}                    0.0012       0.44   0.0027  8.02    12
## [21]   {butter,                                                                                         
##         whipped/sour cream,                                                                             
##         yogurt}                    => {hamburger meat}            0.0010       0.26   0.0039  7.91    10
## [22]   {butter,                                                                                         
##         hard cheese,                                                                                    
##         other vegetables}          => {domestic eggs}             0.0010       0.50   0.0020  7.88    10
## [23]   {long life bakery product,                                                                       
##         other vegetables,                                                                               
##         tropical fruit}            => {chocolate}                 0.0010       0.38   0.0026  7.75    10
## [24]   {chocolate,                                                                                      
##         root vegetables,                                                                                
##         whole milk}                => {butter}                    0.0015       0.43   0.0036  7.73    15
## [25]   {cream cheese,                                                                                   
##         curd,                                                                                           
##         yogurt}                    => {whipped/sour cream}        0.0013       0.54   0.0024  7.56    13
## [26]   {butter,                                                                                         
##         root vegetables,                                                                                
##         yogurt}                    => {beef}                      0.0015       0.39   0.0039  7.52    15
## [27]   {long life bakery product,                                                                       
##         tropical fruit,                                                                                 
##         whole milk}                => {white bread}               0.0010       0.31   0.0033  7.42    10
## [28]   {butter,                                                                                         
##         whipped/sour cream,                                                                             
##         whole milk}                => {sliced cheese}             0.0012       0.18   0.0067  7.42    12
## [29]   {cream cheese,                                                                                   
##         margarine,                                                                                      
##         yogurt}                    => {whipped/sour cream}        0.0010       0.53   0.0019  7.34    10
## [30]   {candy,                                                                                          
##         shopping bags}             => {chocolate}                 0.0016       0.36   0.0045  7.33    16
## [31]   {hygiene articles,                                                                               
##         root vegetables,                                                                                
##         whole milk}                => {butter}                    0.0014       0.40   0.0036  7.22    14
## [32]   {rolls/buns,                                                                                     
##         root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         whole milk}                => {beef}                      0.0014       0.38   0.0038  7.21    14
## [33]   {curd,                                                                                           
##         other vegetables,                                                                               
##         yogurt}                    => {cream cheese}              0.0017       0.28   0.0061  7.15    17
## [34]   {sausage,                                                                                        
##         whole milk,                                                                                     
##         yogurt}                    => {sliced cheese}             0.0015       0.17   0.0087  7.12    15
## [35]   {citrus fruit,                                                                                   
##         fruit/vegetable juice,                                                                          
##         oil}                       => {root vegetables}           0.0010       0.77   0.0013  7.06    10
## [36]   {herbs,                                                                                          
##         other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         whole milk}                => {root vegetables}           0.0010       0.77   0.0013  7.06    10
## [37]   {citrus fruit,                                                                                   
##         pastry,                                                                                         
##         rolls/buns,                                                                                     
##         whole milk}                => {whipped/sour cream}        0.0010       0.50   0.0020  6.98    10
## [38]   {beef,                                                                                           
##         curd,                                                                                           
##         whole milk}                => {butter}                    0.0010       0.38   0.0026  6.94    10
## [39]   {root vegetables,                                                                                
##         shopping bags,                                                                                  
##         whole milk}                => {oil}                       0.0010       0.19   0.0053  6.85    10
## [40]   {napkins,                                                                                        
##         whipped/sour cream,                                                                             
##         whole milk}                => {long life bakery product}  0.0010       0.26   0.0040  6.85    10
## [41]   {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         root vegetables}           => {hard cheese}               0.0012       0.17   0.0073  6.80    12
## [42]   {butter,                                                                                         
##         root vegetables,                                                                                
##         whole milk}                => {onions}                    0.0017       0.21   0.0082  6.77    17
## [43]   {dessert,                                                                                        
##         other vegetables,                                                                               
##         tropical fruit}            => {curd}                      0.0010       0.36   0.0028  6.70    10
## [44]   {butter,                                                                                         
##         tropical fruit,                                                                                 
##         whole milk}                => {hard cheese}               0.0010       0.16   0.0062  6.69    10
## [45]   {other vegetables,                                                                               
##         salty snack,                                                                                    
##         yogurt}                    => {fruit/vegetable juice}     0.0013       0.48   0.0027  6.66    13
## [46]   {beef,                                                                                           
##         cream cheese,                                                                                   
##         whole milk}                => {whipped/sour cream}        0.0010       0.48   0.0021  6.64    10
## [47]   {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         tropical fruit}            => {ham}                       0.0016       0.17   0.0095  6.61    16
## [48]   {brown bread,                                                                                    
##         other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         whole milk}                => {pip fruit}                 0.0013       0.50   0.0026  6.61    13
## [49]   {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         sugar}                     => {domestic eggs}             0.0010       0.42   0.0024  6.57    10
## [50]   {other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         whipped/sour cream,                                                                             
##         whole milk}                => {butter}                    0.0016       0.36   0.0045  6.56    16
## [51]   {chicken,                                                                                        
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk}                => {domestic eggs}             0.0012       0.41   0.0029  6.52    12
## [52]   {butter,                                                                                         
##         other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         white bread}               => {yogurt}                    0.0010       0.91   0.0011  6.52    10
## [53]   {curd,                                                                                           
##         other vegetables,                                                                               
##         whipped/sour cream}        => {cream cheese}              0.0011       0.26   0.0044  6.45    11
## [54]   {hamburger meat,                                                                                 
##         whipped/sour cream}        => {butter}                    0.0015       0.36   0.0043  6.44    15
## [55]   {butter,                                                                                         
##         sausage,                                                                                        
##         whole milk}                => {berries}                   0.0010       0.21   0.0048  6.40    10
## [56]   {rice,                                                                                           
##         yogurt}                    => {root vegetables}           0.0016       0.70   0.0023  6.38    16
## [57]   {domestic eggs,                                                                                  
##         sausage,                                                                                        
##         whole milk}                => {chicken}                   0.0012       0.27   0.0045  6.36    12
## [58]   {citrus fruit,                                                                                   
##         hygiene articles,                                                                               
##         pip fruit}                 => {tropical fruit}            0.0010       0.67   0.0015  6.35    10
## [59]   {flour,                                                                                          
##         other vegetables,                                                                               
##         yogurt}                    => {margarine}                 0.0010       0.37   0.0027  6.32    10
## [60]   {other vegetables,                                                                               
##         root vegetables,                                                                                
##         whipped/sour cream}        => {hard cheese}               0.0013       0.15   0.0085  6.32    13
## [61]   {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         yogurt}                    => {butter milk}               0.0014       0.17   0.0081  6.26    14
## [62]   {cream cheese,                                                                                   
##         whipped/sour cream,                                                                             
##         whole milk}                => {curd}                      0.0013       0.33   0.0040  6.26    13
## [63]   {beef,                                                                                           
##         root vegetables,                                                                                
##         sausage}                   => {butter}                    0.0010       0.34   0.0029  6.22    10
## [64]   {bottled water,                                                                                  
##         root vegetables,                                                                                
##         whole milk,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0015       0.65   0.0023  6.22    15
## [65]   {onions,                                                                                         
##         whole milk,                                                                                     
##         yogurt}                    => {butter}                    0.0013       0.34   0.0039  6.17    13
## [66]   {other vegetables,                                                                               
##         root vegetables,                                                                                
##         sugar}                     => {beef}                      0.0011       0.32   0.0035  6.17    11
## [67]   {dessert,                                                                                        
##         other vegetables,                                                                               
##         tropical fruit}            => {pip fruit}                 0.0013       0.46   0.0028  6.14    13
## [68]   {frozen vegetables,                                                                              
##         long life bakery product}  => {chicken}                   0.0010       0.26   0.0039  6.13    10
## [69]   {oil,                                                                                            
##         other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         yogurt}                    => {root vegetables}           0.0010       0.67   0.0015  6.12    10
## [70]   {beef,                                                                                           
##         rolls/buns,                                                                                     
##         tropical fruit,                                                                                 
##         whole milk}                => {root vegetables}           0.0014       0.67   0.0021  6.12    14
## [71]   {bottled water,                                                                                  
##         butter,                                                                                         
##         whole milk}                => {onions}                    0.0010       0.19   0.0054  6.08    10
## [72]   {butter,                                                                                         
##         margarine,                                                                                      
##         tropical fruit}            => {yogurt}                    0.0011       0.85   0.0013  6.07    11
## [73]   {other vegetables,                                                                               
##         soft cheese,                                                                                    
##         whole milk}                => {domestic eggs}             0.0013       0.38   0.0035  6.03    13
## [74]   {soft cheese,                                                                                    
##         whipped/sour cream}        => {butter}                    0.0010       0.33   0.0031  6.02    10
## [75]   {butter,                                                                                         
##         domestic eggs,                                                                                  
##         whole milk}                => {onions}                    0.0011       0.19   0.0060  6.01    11
## [76]   {citrus fruit,                                                                                   
##         frozen vegetables,                                                                              
##         whole milk}                => {napkins}                   0.0011       0.31   0.0036  6.00    11
## [77]   {cream cheese,                                                                                   
##         margarine,                                                                                      
##         whipped/sour cream}        => {yogurt}                    0.0010       0.83   0.0012  5.97    10
## [78]   {margarine,                                                                                      
##         root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         whole milk}                => {yogurt}                    0.0010       0.83   0.0012  5.97    10
## [79]   {citrus fruit,                                                                                   
##         pip fruit,                                                                                      
##         whole milk,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0010       0.62   0.0016  5.96    10
## [80]   {tropical fruit,                                                                                 
##         white bread,                                                                                    
##         whole milk}                => {long life bakery product}  0.0010       0.22   0.0046  5.94    10
## [81]   {butter,                                                                                         
##         chicken,                                                                                        
##         whole milk}                => {domestic eggs}             0.0012       0.38   0.0033  5.91    12
## [82]   {frozen vegetables,                                                                              
##         other vegetables,                                                                               
##         yogurt}                    => {whipped/sour cream}        0.0022       0.42   0.0053  5.90    22
## [83]   {cat food,                                                                                       
##         rolls/buns}                => {beef}                      0.0012       0.31   0.0040  5.86    12
## [84]   {oil,                                                                                            
##         soda}                      => {dessert}                   0.0010       0.22   0.0047  5.86    10
## [85]   {beef,                                                                                           
##         citrus fruit,                                                                                   
##         other vegetables}          => {root vegetables}           0.0021       0.64   0.0034  5.84    21
## [86]   {root vegetables,                                                                                
##         white bread,                                                                                    
##         yogurt}                    => {domestic eggs}             0.0010       0.37   0.0027  5.84    10
## [87]   {domestic eggs,                                                                                  
##         soft cheese}               => {butter}                    0.0010       0.32   0.0032  5.82    10
## [88]   {ham,                                                                                            
##         soda}                      => {white bread}               0.0012       0.24   0.0050  5.82    12
## [89]   {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         whole milk}                => {root vegetables}           0.0032       0.63   0.0050  5.80    31
## [90]   {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         tropical fruit}            => {citrus fruit}              0.0012       0.48   0.0025  5.80    12
## [91]   {chocolate,                                                                                      
##         citrus fruit}              => {hygiene articles}          0.0012       0.19   0.0064  5.78    12
## [92]   {fruit/vegetable juice,                                                                          
##         long life bakery product}  => {frozen meals}              0.0010       0.16   0.0062  5.78    10
## [93]   {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         shopping bags}             => {whipped/sour cream}        0.0012       0.41   0.0029  5.77    12
## [94]   {butter,                                                                                         
##         white bread}               => {chocolate}                 0.0012       0.29   0.0043  5.76    12
## [95]   {berries,                                                                                        
##         bottled beer}              => {root vegetables}           0.0010       0.62   0.0016  5.73    10
## [96]   {frankfurter,                                                                                    
##         sliced cheese,                                                                                  
##         whole milk}                => {root vegetables}           0.0010       0.62   0.0016  5.73    10
## [97]   {frozen vegetables,                                                                              
##         sausage,                                                                                        
##         whole milk}                => {fruit/vegetable juice}     0.0012       0.41   0.0029  5.72    12
## [98]   {root vegetables,                                                                                
##         turkey}                    => {tropical fruit}            0.0015       0.60   0.0025  5.72    15
## [99]   {rolls/buns,                                                                                     
##         root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         yogurt}                    => {whipped/sour cream}        0.0011       0.41   0.0027  5.68    11
## [100]  {frozen vegetables,                                                                              
##         onions,                                                                                         
##         other vegetables}          => {root vegetables}           0.0013       0.62   0.0021  5.68    13
## [101]  {pastry,                                                                                         
##         rolls/buns,                                                                                     
##         tropical fruit,                                                                                 
##         whole milk}                => {yogurt}                    0.0015       0.79   0.0019  5.66    15
## [102]  {bottled beer,                                                                                   
##         butter}                    => {onions}                    0.0010       0.18   0.0058  5.66    10
## [103]  {butter,                                                                                         
##         onions,                                                                                         
##         tropical fruit}            => {yogurt}                    0.0011       0.79   0.0014  5.63    11
## [104]  {beef,                                                                                           
##         rolls/buns,                                                                                     
##         whole milk,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0013       0.59   0.0022  5.63    13
## [105]  {butter,                                                                                         
##         root vegetables,                                                                                
##         whipped/sour cream}        => {napkins}                   0.0010       0.29   0.0035  5.62    10
## [106]  {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk}                => {butter}                    0.0014       0.31   0.0046  5.61    14
## [107]  {frankfurter,                                                                                    
##         rolls/buns,                                                                                     
##         root vegetables}           => {beef}                      0.0010       0.29   0.0035  5.61    10
## [108]  {curd,                                                                                           
##         other vegetables,                                                                               
##         pip fruit,                                                                                      
##         yogurt}                    => {tropical fruit}            0.0010       0.59   0.0017  5.61    10
## [109]  {frozen meals,                                                                                   
##         other vegetables,                                                                               
##         root vegetables}           => {whipped/sour cream}        0.0010       0.40   0.0025  5.58    10
## [110]  {chicken,                                                                                        
##         sausage,                                                                                        
##         whole milk}                => {whipped/sour cream}        0.0012       0.40   0.0031  5.58    12
## [111]  {soft cheese,                                                                                    
##         whole milk,                                                                                     
##         yogurt}                    => {domestic eggs}             0.0012       0.35   0.0035  5.56    12
## [112]  {other vegetables,                                                                               
##         rice}                      => {butter}                    0.0012       0.31   0.0040  5.55    12
## [113]  {curd,                                                                                           
##         sugar}                     => {margarine}                 0.0011       0.32   0.0035  5.52    11
## [114]  {frozen meals,                                                                                   
##         other vegetables,                                                                               
##         pip fruit}                 => {tropical fruit}            0.0011       0.58   0.0019  5.52    11
## [115]  {citrus fruit,                                                                                   
##         curd,                                                                                           
##         whole milk}                => {butter}                    0.0011       0.31   0.0037  5.51    11
## [116]  {ham,                                                                                            
##         tropical fruit,                                                                                 
##         yogurt}                    => {pip fruit}                 0.0010       0.42   0.0024  5.51    10
## [117]  {berries,                                                                                        
##         whole milk,                                                                                     
##         yogurt}                    => {whipped/sour cream}        0.0013       0.39   0.0034  5.50    13
## [118]  {hygiene articles,                                                                               
##         pip fruit,                                                                                      
##         tropical fruit}            => {citrus fruit}              0.0010       0.45   0.0022  5.49    10
## [119]  {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         yogurt}                    => {whipped/sour cream}        0.0011       0.39   0.0028  5.48    11
## [120]  {sugar,                                                                                          
##         whipped/sour cream}        => {curd}                      0.0014       0.29   0.0049  5.47    14
## [121]  {frozen fish,                                                                                    
##         pip fruit}                 => {tropical fruit}            0.0012       0.57   0.0021  5.45    12
## [122]  {butter,                                                                                         
##         other vegetables,                                                                               
##         whipped/sour cream,                                                                             
##         yogurt}                    => {tropical fruit}            0.0012       0.57   0.0021  5.45    12
## [123]  {long life bakery product,                                                                       
##         other vegetables,                                                                               
##         yogurt}                    => {whipped/sour cream}        0.0014       0.39   0.0037  5.43    14
## [124]  {whipped/sour cream,                                                                             
##         whole milk,                                                                                     
##         yogurt}                    => {cream cheese}              0.0023       0.21   0.0109  5.42    23
## [125]  {beef,                                                                                           
##         pasta}                     => {root vegetables}           0.0010       0.59   0.0017  5.40    10
## [126]  {chicken,                                                                                        
##         sausage,                                                                                        
##         yogurt}                    => {root vegetables}           0.0010       0.59   0.0017  5.40    10
## [127]  {other vegetables,                                                                               
##         pork,                                                                                           
##         yogurt}                    => {beef}                      0.0013       0.28   0.0047  5.39    13
## [128]  {oil,                                                                                            
##         other vegetables,                                                                               
##         yogurt}                    => {coffee}                    0.0010       0.31   0.0033  5.38    10
## [129]  {domestic eggs,                                                                                  
##         pip fruit,                                                                                      
##         yogurt}                    => {whipped/sour cream}        0.0010       0.38   0.0026  5.37    10
## [130]  {beef,                                                                                           
##         rolls/buns,                                                                                     
##         yogurt}                    => {butter}                    0.0011       0.30   0.0038  5.36    11
## [131]  {sausage,                                                                                        
##         whipped/sour cream,                                                                             
##         whole milk}                => {long life bakery product}  0.0010       0.20   0.0051  5.35    10
## [132]  {citrus fruit,                                                                                   
##         flour}                     => {margarine}                 0.0010       0.31   0.0033  5.34    10
## [133]  {citrus fruit,                                                                                   
##         frozen vegetables,                                                                              
##         root vegetables}           => {fruit/vegetable juice}     0.0010       0.38   0.0026  5.32    10
## [134]  {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         yogurt}                    => {chicken}                   0.0013       0.23   0.0058  5.32    13
## [135]  {chicken,                                                                                        
##         frankfurter}               => {pork}                      0.0011       0.31   0.0037  5.30    11
## [136]  {frankfurter,                                                                                    
##         frozen meals,                                                                                   
##         whole milk}                => {tropical fruit}            0.0010       0.56   0.0018  5.29    10
## [137]  {other vegetables,                                                                               
##         white bread,                                                                                    
##         whole milk}                => {butter}                    0.0017       0.29   0.0059  5.29    17
## [138]  {soda,                                                                                           
##         white bread,                                                                                    
##         yogurt}                    => {pip fruit}                 0.0010       0.40   0.0025  5.29    10
## [139]  {pork,                                                                                           
##         whole milk,                                                                                     
##         yogurt}                    => {butter}                    0.0014       0.29   0.0049  5.26    14
## [140]  {napkins,                                                                                        
##         pastry}                    => {chocolate}                 0.0018       0.26   0.0070  5.26    18
## [141]  {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         whipped/sour cream,                                                                             
##         whole milk}                => {domestic eggs}             0.0012       0.33   0.0037  5.25    12
## [142]  {other vegetables,                                                                               
##         root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         whole milk}                => {beef}                      0.0019       0.28   0.0070  5.25    19
## [143]  {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         whipped/sour cream}        => {root vegetables}           0.0012       0.57   0.0021  5.24    12
## [144]  {butter,                                                                                         
##         sliced cheese,                                                                                  
##         whole milk}                => {tropical fruit}            0.0011       0.55   0.0020  5.24    11
## [145]  {curd,                                                                                           
##         pip fruit,                                                                                      
##         whole milk}                => {whipped/sour cream}        0.0018       0.38   0.0049  5.23    18
## [146]  {tropical fruit,                                                                                 
##         whipped/sour cream,                                                                             
##         yogurt}                    => {curd}                      0.0017       0.28   0.0062  5.23    17
## [147]  {frozen vegetables,                                                                              
##         semi-finished bread}       => {tropical fruit}            0.0012       0.55   0.0022  5.20    12
## [148]  {chicken,                                                                                        
##         other vegetables,                                                                               
##         yogurt}                    => {frozen vegetables}         0.0012       0.25   0.0049  5.20    12
## [149]  {curd,                                                                                           
##         other vegetables,                                                                               
##         tropical fruit}            => {dessert}                   0.0010       0.19   0.0053  5.18    10
## [150]  {butter,                                                                                         
##         other vegetables,                                                                               
##         soda}                      => {whipped/sour cream}        0.0013       0.37   0.0036  5.18    13
## [151]  {citrus fruit,                                                                                   
##         root vegetables,                                                                                
##         soft cheese}               => {other vegetables}          0.0010       1.00   0.0010  5.17    10
## [152]  {ham,                                                                                            
##         pip fruit,                                                                                      
##         tropical fruit,                                                                                 
##         whole milk}                => {other vegetables}          0.0011       1.00   0.0011  5.17    11
## [153]  {coffee,                                                                                         
##         other vegetables,                                                                               
##         whole milk}                => {sugar}                     0.0011       0.17   0.0064  5.16    11
## [154]  {citrus fruit,                                                                                   
##         frozen vegetables,                                                                              
##         whole milk}                => {butter}                    0.0010       0.29   0.0036  5.16    10
## [155]  {dessert,                                                                                        
##         pip fruit}                 => {domestic eggs}             0.0016       0.33   0.0050  5.15    16
## [156]  {other vegetables,                                                                               
##         pork,                                                                                           
##         root vegetables}           => {onions}                    0.0011       0.16   0.0070  5.14    11
## [157]  {curd,                                                                                           
##         sliced cheese,                                                                                  
##         whole milk}                => {yogurt}                    0.0010       0.71   0.0014  5.12    10
## [158]  {cream cheese,                                                                                   
##         root vegetables,                                                                                
##         whipped/sour cream}        => {yogurt}                    0.0015       0.71   0.0021  5.12    15
## [159]  {beef,                                                                                           
##         whole milk,                                                                                     
##         yogurt}                    => {butter}                    0.0017       0.28   0.0061  5.11    17
## [160]  {brown bread,                                                                                    
##         root vegetables,                                                                                
##         tropical fruit}            => {citrus fruit}              0.0011       0.42   0.0026  5.11    11
## [161]  {domestic eggs,                                                                                  
##         oil,                                                                                            
##         whole milk}                => {root vegetables}           0.0010       0.56   0.0018  5.10    10
## [162]  {beef,                                                                                           
##         butter,                                                                                         
##         whole milk}                => {root vegetables}           0.0020       0.56   0.0037  5.10    20
## [163]  {oil,                                                                                            
##         other vegetables,                                                                               
##         root vegetables}           => {citrus fruit}              0.0016       0.42   0.0039  5.09    16
## [164]  {frankfurter,                                                                                    
##         hygiene articles}          => {domestic eggs}             0.0010       0.32   0.0032  5.08    10
## [165]  {canned beer,                                                                                    
##         rolls/buns,                                                                                     
##         soda}                      => {shopping bags}             0.0015       0.50   0.0031  5.07    15
## [166]  {beef,                                                                                           
##         cream cheese}              => {curd}                      0.0010       0.27   0.0038  5.07    10
## [167]  {cream cheese,                                                                                   
##         curd,                                                                                           
##         other vegetables,                                                                               
##         whole milk}                => {yogurt}                    0.0012       0.71   0.0017  5.06    12
## [168]  {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         tropical fruit}            => {white bread}               0.0010       0.21   0.0048  5.05    10
## [169]  {butter milk,                                                                                    
##         pip fruit}                 => {cream cheese}              0.0010       0.20   0.0051  5.04    10
## [170]  {napkins,                                                                                        
##         root vegetables,                                                                                
##         whole milk}                => {chocolate}                 0.0012       0.25   0.0049  5.04    12
## [171]  {newspapers,                                                                                     
##         rolls/buns,                                                                                     
##         soda,                                                                                           
##         yogurt}                    => {bottled water}             0.0010       0.56   0.0018  5.03    10
## [172]  {other vegetables,                                                                               
##         root vegetables,                                                                                
##         sugar}                     => {margarine}                 0.0010       0.29   0.0035  5.02    10
## [173]  {newspapers,                                                                                     
##         other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0010       0.53   0.0019  5.02    10
## [174]  {turkey,                                                                                         
##         whole milk}                => {butter}                    0.0010       0.28   0.0037  5.01    10
## [175]  {hygiene articles,                                                                               
##         whipped/sour cream}        => {napkins}                   0.0011       0.26   0.0043  5.00    11
## [176]  {onions,                                                                                         
##         other vegetables,                                                                               
##         whole milk}                => {butter}                    0.0018       0.28   0.0066  5.00    18
## [177]  {bottled water,                                                                                  
##         margarine,                                                                                      
##         tropical fruit}            => {yogurt}                    0.0016       0.70   0.0023  4.99    16
## [178]  {domestic eggs,                                                                                  
##         napkins}                   => {long life bakery product}  0.0011       0.19   0.0060  4.98    11
## [179]  {pip fruit,                                                                                      
##         processed cheese}          => {tropical fruit}            0.0012       0.52   0.0023  4.97    12
## [180]  {curd,                                                                                           
##         fruit/vegetable juice,                                                                          
##         other vegetables}          => {tropical fruit}            0.0012       0.52   0.0023  4.97    12
## [181]  {cream cheese,                                                                                   
##         pip fruit,                                                                                      
##         whole milk}                => {fruit/vegetable juice}     0.0014       0.36   0.0040  4.97    14
## [182]  {butter,                                                                                         
##         other vegetables,                                                                               
##         tropical fruit}            => {domestic eggs}             0.0017       0.31   0.0055  4.96    17
## [183]  {domestic eggs,                                                                                  
##         onions}                    => {white bread}               0.0010       0.21   0.0049  4.95    10
## [184]  {brown bread,                                                                                    
##         sliced cheese}             => {sausage}                   0.0013       0.46   0.0028  4.94    13
## [185]  {butter,                                                                                         
##         tropical fruit,                                                                                 
##         whole milk}                => {berries}                   0.0010       0.16   0.0062  4.93    10
## [186]  {curd,                                                                                           
##         frozen meals,                                                                                   
##         whole milk}                => {yogurt}                    0.0011       0.69   0.0016  4.93    11
## [187]  {domestic eggs,                                                                                  
##         sausage,                                                                                        
##         whole milk}                => {butter}                    0.0012       0.27   0.0045  4.92    12
## [188]  {chocolate,                                                                                      
##         other vegetables}          => {long life bakery product}  0.0023       0.18   0.0127  4.92    23
## [189]  {brown bread,                                                                                    
##         soda,                                                                                           
##         yogurt}                    => {fruit/vegetable juice}     0.0011       0.35   0.0032  4.91    11
## [190]  {other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         tropical fruit,                                                                                 
##         whipped/sour cream}        => {yogurt}                    0.0013       0.68   0.0019  4.90    13
## [191]  {beef,                                                                                           
##         waffles}                   => {root vegetables}           0.0016       0.53   0.0031  4.89    16
## [192]  {curd,                                                                                           
##         soft cheese}               => {yogurt}                    0.0015       0.68   0.0022  4.89    15
## [193]  {margarine,                                                                                      
##         white bread}               => {butter}                    0.0010       0.27   0.0038  4.88    10
## [194]  {hygiene articles,                                                                               
##         pip fruit}                 => {napkins}                   0.0012       0.26   0.0048  4.88    12
## [195]  {citrus fruit,                                                                                   
##         napkins}                   => {hygiene articles}          0.0012       0.16   0.0076  4.86    12
## [196]  {root vegetables,                                                                                
##         whipped/sour cream,                                                                             
##         whole milk}                => {onions}                    0.0014       0.15   0.0095  4.85    14
## [197]  {rolls/buns,                                                                                     
##         root vegetables,                                                                                
##         sausage}                   => {frankfurter}               0.0014       0.29   0.0050  4.84    14
## [198]  {rolls/buns,                                                                                     
##         whipped/sour cream,                                                                             
##         whole milk}                => {chicken}                   0.0016       0.21   0.0078  4.84    16
## [199]  {cream cheese,                                                                                   
##         other vegetables,                                                                               
##         whole milk}                => {curd}                      0.0017       0.26   0.0067  4.83    17
## [200]  {domestic eggs,                                                                                  
##         sugar,                                                                                          
##         whole milk}                => {citrus fruit}              0.0014       0.40   0.0036  4.83    14
## [201]  {beef,                                                                                           
##         tropical fruit,                                                                                 
##         whole milk,                                                                                     
##         yogurt}                    => {root vegetables}           0.0010       0.53   0.0019  4.83    10
## [202]  {onions,                                                                                         
##         other vegetables,                                                                               
##         root vegetables}           => {frozen vegetables}         0.0013       0.23   0.0057  4.83    13
## [203]  {margarine,                                                                                      
##         pip fruit,                                                                                      
##         whole milk}                => {curd}                      0.0010       0.26   0.0040  4.81    10
## [204]  {beef,                                                                                           
##         pork}                      => {berries}                   0.0012       0.16   0.0076  4.81    12
## [205]  {domestic eggs,                                                                                  
##         herbs}                     => {root vegetables}           0.0011       0.52   0.0021  4.81    11
## [206]  {margarine,                                                                                      
##         other vegetables,                                                                               
##         whipped/sour cream,                                                                             
##         whole milk}                => {root vegetables}           0.0011       0.52   0.0021  4.81    11
## [207]  {pip fruit,                                                                                      
##         shopping bags,                                                                                  
##         tropical fruit}            => {whipped/sour cream}        0.0011       0.34   0.0033  4.80    11
## [208]  {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         whole milk,                                                                                     
##         yogurt}                    => {curd}                      0.0012       0.26   0.0048  4.79    12
## [209]  {root vegetables,                                                                                
##         sliced cheese,                                                                                  
##         whipped/sour cream}        => {yogurt}                    0.0012       0.67   0.0018  4.78    12
## [210]  {chicken,                                                                                        
##         citrus fruit,                                                                                   
##         whipped/sour cream}        => {yogurt}                    0.0010       0.67   0.0015  4.78    10
## [211]  {fruit/vegetable juice,                                                                          
##         napkins}                   => {sugar}                     0.0011       0.16   0.0069  4.78    11
## [212]  {cream cheese,                                                                                   
##         other vegetables,                                                                               
##         whipped/sour cream}        => {domestic eggs}             0.0010       0.30   0.0034  4.78    10
## [213]  {citrus fruit,                                                                                   
##         oil,                                                                                            
##         whole milk}                => {root vegetables}           0.0013       0.52   0.0025  4.77    13
## [214]  {beef,                                                                                           
##         newspapers,                                                                                     
##         whole milk}                => {root vegetables}           0.0013       0.52   0.0025  4.77    13
## [215]  {semi-finished bread,                                                                            
##         whole milk,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0010       0.50   0.0020  4.77    10
## [216]  {butter,                                                                                         
##         hard cheese,                                                                                    
##         other vegetables}          => {tropical fruit}            0.0010       0.50   0.0020  4.77    10
## [217]  {citrus fruit,                                                                                   
##         pip fruit,                                                                                      
##         yogurt}                    => {tropical fruit}            0.0016       0.50   0.0033  4.77    16
## [218]  {other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         whipped/sour cream,                                                                             
##         whole milk}                => {beef}                      0.0011       0.25   0.0045  4.77    11
## [219]  {other vegetables,                                                                               
##         semi-finished bread}       => {pork}                      0.0014       0.27   0.0052  4.76    14
## [220]  {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         sausage}                   => {whipped/sour cream}        0.0015       0.34   0.0045  4.76    15
## [221]  {hygiene articles,                                                                               
##         whole milk,                                                                                     
##         yogurt}                    => {pip fruit}                 0.0014       0.36   0.0040  4.75    14
## [222]  {cream cheese,                                                                                   
##         curd}                      => {whipped/sour cream}        0.0017       0.34   0.0051  4.74    17
## [223]  {brown bread,                                                                                    
##         chocolate}                 => {fruit/vegetable juice}     0.0013       0.34   0.0039  4.73    13
## [224]  {margarine,                                                                                      
##         whipped/sour cream,                                                                             
##         whole milk}                => {domestic eggs}             0.0012       0.30   0.0041  4.73    12
## [225]  {chicken,                                                                                        
##         citrus fruit,                                                                                   
##         other vegetables}          => {root vegetables}           0.0018       0.51   0.0036  4.72    18
## [226]  {curd,                                                                                           
##         root vegetables}           => {cream cheese}              0.0020       0.19   0.0109  4.71    20
## [227]  {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         soda}                      => {root vegetables}           0.0021       0.51   0.0042  4.70    21
## [228]  {butter milk,                                                                                    
##         pork,                                                                                           
##         whole milk}                => {other vegetables}          0.0010       0.91   0.0011  4.70    10
## [229]  {margarine,                                                                                      
##         tropical fruit,                                                                                 
##         whole milk}                => {curd}                      0.0011       0.25   0.0045  4.69    11
## [230]  {other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         whipped/sour cream,                                                                             
##         whole milk}                => {curd}                      0.0011       0.25   0.0045  4.69    11
## [231]  {hygiene articles,                                                                               
##         root vegetables}           => {beef}                      0.0013       0.25   0.0054  4.68    13
## [232]  {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         root vegetables,                                                                                
##         whole milk}                => {cream cheese}              0.0010       0.19   0.0055  4.67    10
## [233]  {domestic eggs,                                                                                  
##         rolls/buns,                                                                                     
##         whole milk}                => {chicken}                   0.0013       0.20   0.0066  4.66    13
## [234]  {berries,                                                                                        
##         cream cheese}              => {yogurt}                    0.0013       0.65   0.0020  4.66    13
## [235]  {butter,                                                                                         
##         tropical fruit,                                                                                 
##         whole milk}                => {domestic eggs}             0.0018       0.30   0.0062  4.65    18
## [236]  {ham,                                                                                            
##         root vegetables}           => {whipped/sour cream}        0.0012       0.33   0.0037  4.65    12
## [237]  {napkins,                                                                                        
##         root vegetables,                                                                                
##         whole milk}                => {whipped/sour cream}        0.0016       0.33   0.0049  4.65    16
## [238]  {butter,                                                                                         
##         citrus fruit,                                                                                   
##         yogurt}                    => {whipped/sour cream}        0.0010       0.33   0.0031  4.65    10
## [239]  {beef,                                                                                           
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk}                => {tropical fruit}            0.0019       0.49   0.0040  4.64    19
## [240]  {cream cheese,                                                                                   
##         other vegetables,                                                                               
##         pip fruit,                                                                                      
##         whole milk}                => {yogurt}                    0.0011       0.65   0.0017  4.64    11
## [241]  {ham,                                                                                            
##         whole milk,                                                                                     
##         yogurt}                    => {butter}                    0.0010       0.26   0.0040  4.63    10
## [242]  {margarine,                                                                                      
##         other vegetables,                                                                               
##         tropical fruit}            => {butter}                    0.0010       0.26   0.0040  4.63    10
## [243]  {curd,                                                                                           
##         domestic eggs}             => {sugar}                     0.0010       0.16   0.0065  4.61    10
## [244]  {bottled beer,                                                                                   
##         bottled water,                                                                                  
##         other vegetables}          => {domestic eggs}             0.0012       0.29   0.0042  4.61    12
## [245]  {sliced cheese,                                                                                  
##         tropical fruit,                                                                                 
##         whole milk}                => {yogurt}                    0.0018       0.64   0.0028  4.61    18
## [246]  {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         pip fruit}                 => {tropical fruit}            0.0028       0.48   0.0059  4.60    28
## [247]  {butter,                                                                                         
##         pork}                      => {beef}                      0.0013       0.24   0.0055  4.59    13
## [248]  {pastry,                                                                                         
##         pip fruit,                                                                                      
##         rolls/buns}                => {tropical fruit}            0.0013       0.48   0.0027  4.59    13
## [249]  {frozen dessert,                                                                                 
##         other vegetables,                                                                               
##         whole milk}                => {root vegetables}           0.0010       0.50   0.0020  4.59    10
## [250]  {butter,                                                                                         
##         hard cheese,                                                                                    
##         other vegetables}          => {root vegetables}           0.0010       0.50   0.0020  4.59    10
## [251]  {domestic eggs,                                                                                  
##         fruit/vegetable juice,                                                                          
##         other vegetables}          => {root vegetables}           0.0017       0.50   0.0035  4.59    17
## [252]  {beef,                                                                                           
##         other vegetables,                                                                               
##         soda,                                                                                           
##         whole milk}                => {root vegetables}           0.0010       0.50   0.0020  4.59    10
## [253]  {pip fruit,                                                                                      
##         tropical fruit,                                                                                 
##         whole milk,                                                                                     
##         yogurt}                    => {brown bread}               0.0011       0.30   0.0038  4.58    11
## [254]  {fruit/vegetable juice,                                                                          
##         root vegetables}           => {frozen vegetables}         0.0026       0.22   0.0120  4.58    26
## [255]  {butter,                                                                                         
##         sausage,                                                                                        
##         yogurt}                    => {tropical fruit}            0.0012       0.48   0.0025  4.57    12
## [256]  {domestic eggs,                                                                                  
##         frozen vegetables}         => {chicken}                   0.0010       0.20   0.0052  4.57    10
## [257]  {frozen vegetables,                                                                              
##         fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         whole milk}                => {yogurt}                    0.0014       0.64   0.0022  4.56    14
## [258]  {curd,                                                                                           
##         other vegetables,                                                                               
##         tropical fruit}            => {whipped/sour cream}        0.0017       0.33   0.0053  4.56    17
## [259]  {chicken,                                                                                        
##         other vegetables,                                                                               
##         whole milk}                => {domestic eggs}             0.0024       0.29   0.0084  4.56    24
## [260]  {newspapers,                                                                                     
##         root vegetables}           => {beef}                      0.0027       0.24   0.0115  4.55    27
## [261]  {curd cheese,                                                                                    
##         other vegetables}          => {tropical fruit}            0.0010       0.48   0.0021  4.54    10
## [262]  {fruit/vegetable juice,                                                                          
##         hard cheese,                                                                                    
##         whole milk}                => {tropical fruit}            0.0010       0.48   0.0021  4.54    10
## [263]  {herbs,                                                                                          
##         other vegetables,                                                                               
##         whole milk}                => {whipped/sour cream}        0.0013       0.33   0.0041  4.53    13
## [264]  {hygiene articles,                                                                               
##         tropical fruit}            => {UHT-milk}                  0.0010       0.15   0.0067  4.53    10
## [265]  {cream cheese,                                                                                   
##         tropical fruit,                                                                                 
##         whipped/sour cream}        => {other vegetables}          0.0014       0.88   0.0016  4.52    14
## [266]  {rice,                                                                                           
##         whole milk}                => {frozen vegetables}         0.0010       0.22   0.0047  4.52    10
## [267]  {bottled water,                                                                                  
##         hygiene articles}          => {butter}                    0.0014       0.25   0.0057  4.51    14
## [268]  {white bread,                                                                                    
##         whole milk,                                                                                     
##         yogurt}                    => {butter}                    0.0012       0.25   0.0049  4.51    12
## [269]  {beef,                                                                                           
##         other vegetables,                                                                               
##         rolls/buns}                => {root vegetables}           0.0028       0.49   0.0058  4.51    28
## [270]  {butter milk,                                                                                    
##         yogurt}                    => {cream cheese}              0.0015       0.18   0.0085  4.50    15
## [271]  {other vegetables,                                                                               
##         waffles,                                                                                        
##         yogurt}                    => {whipped/sour cream}        0.0010       0.32   0.0032  4.50    10
## [272]  {butter,                                                                                         
##         frozen vegetables}         => {chicken}                   0.0011       0.19   0.0058  4.50    11
## [273]  {ham,                                                                                            
##         tropical fruit}            => {pip fruit}                 0.0018       0.34   0.0054  4.49    18
## [274]  {chocolate,                                                                                      
##         rolls/buns}                => {waffles}                   0.0020       0.17   0.0118  4.49    20
## [275]  {frozen vegetables,                                                                              
##         soda,                                                                                           
##         whipped/sour cream}        => {yogurt}                    0.0010       0.62   0.0016  4.48    10
## [276]  {ham,                                                                                            
##         other vegetables,                                                                               
##         pip fruit,                                                                                      
##         tropical fruit}            => {yogurt}                    0.0010       0.62   0.0016  4.48    10
## [277]  {other vegetables,                                                                               
##         sugar,                                                                                          
##         whole milk}                => {pork}                      0.0016       0.26   0.0063  4.48    16
## [278]  {cat food,                                                                                       
##         whole milk,                                                                                     
##         yogurt}                    => {citrus fruit}              0.0010       0.37   0.0027  4.47    10
## [279]  {ice cream,                                                                                      
##         other vegetables}          => {whipped/sour cream}        0.0016       0.32   0.0051  4.46    16
## [280]  {pip fruit,                                                                                      
##         tropical fruit,                                                                                 
##         whole milk,                                                                                     
##         yogurt}                    => {root vegetables}           0.0018       0.49   0.0038  4.46    18
## [281]  {napkins,                                                                                        
##         whole milk,                                                                                     
##         yogurt}                    => {long life bakery product}  0.0010       0.17   0.0061  4.45    10
## [282]  {dessert,                                                                                        
##         whole milk,                                                                                     
##         yogurt}                    => {whipped/sour cream}        0.0015       0.32   0.0048  4.45    15
## [283]  {margarine,                                                                                      
##         other vegetables,                                                                               
##         tropical fruit}            => {domestic eggs}             0.0011       0.28   0.0040  4.45    11
## [284]  {cream cheese,                                                                                   
##         whole milk,                                                                                     
##         yogurt}                    => {butter}                    0.0016       0.25   0.0066  4.44    16
## [285]  {margarine,                                                                                      
##         tropical fruit,                                                                                 
##         whole milk}                => {whipped/sour cream}        0.0014       0.32   0.0045  4.44    14
## [286]  {butter milk,                                                                                    
##         fruit/vegetable juice,                                                                          
##         whole milk}                => {yogurt}                    0.0013       0.62   0.0021  4.44    13
## [287]  {butter milk,                                                                                    
##         pork}                      => {other vegetables}          0.0018       0.86   0.0021  4.43    18
## [288]  {root vegetables,                                                                                
##         salty snack,                                                                                    
##         yogurt}                    => {other vegetables}          0.0012       0.86   0.0014  4.43    12
## [289]  {newspapers,                                                                                     
##         other vegetables,                                                                               
##         whole milk,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0013       0.46   0.0028  4.42    13
## [290]  {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         yogurt}                    => {cream cheese}              0.0010       0.18   0.0058  4.42    10
## [291]  {sugar,                                                                                          
##         yogurt}                    => {curd}                      0.0016       0.24   0.0069  4.42    16
## [292]  {red/blush wine,                                                                                 
##         soda}                      => {bottled beer}              0.0016       0.36   0.0046  4.42    16
## [293]  {dessert,                                                                                        
##         other vegetables,                                                                               
##         yogurt}                    => {pip fruit}                 0.0015       0.33   0.0046  4.41    15
## [294]  {frankfurter,                                                                                    
##         other vegetables,                                                                               
##         yogurt}                    => {pip fruit}                 0.0016       0.33   0.0049  4.41    16
## [295]  {butter,                                                                                         
##         long life bakery product,                                                                       
##         whole milk}                => {root vegetables}           0.0012       0.48   0.0025  4.40    12
## [296]  {citrus fruit,                                                                                   
##         margarine,                                                                                      
##         other vegetables}          => {root vegetables}           0.0012       0.48   0.0025  4.40    12
## [297]  {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         white bread}               => {tropical fruit}            0.0012       0.46   0.0026  4.40    12
## [298]  {chicken,                                                                                        
##         sausage}                   => {frozen vegetables}         0.0011       0.21   0.0053  4.40    11
## [299]  {hard cheese,                                                                                    
##         tropical fruit,                                                                                 
##         whole milk}                => {root vegetables}           0.0011       0.48   0.0023  4.39    11
## [300]  {bottled water,                                                                                  
##         margarine,                                                                                      
##         tropical fruit}            => {root vegetables}           0.0011       0.48   0.0023  4.39    11
## [301]  {citrus fruit,                                                                                   
##         frozen vegetables,                                                                              
##         whole milk}                => {whipped/sour cream}        0.0011       0.31   0.0036  4.38    11
## [302]  {beef,                                                                                           
##         other vegetables,                                                                               
##         whole milk}                => {pork}                      0.0023       0.25   0.0093  4.38    23
## [303]  {sausage,                                                                                        
##         sugar}                     => {domestic eggs}             0.0010       0.28   0.0037  4.38    10
## [304]  {bottled beer,                                                                                   
##         other vegetables,                                                                               
##         yogurt}                    => {domestic eggs}             0.0010       0.28   0.0037  4.38    10
## [305]  {butter,                                                                                         
##         root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         whipped/sour cream}        => {other vegetables}          0.0011       0.85   0.0013  4.37    11
## [306]  {butter,                                                                                         
##         curd}                      => {whipped/sour cream}        0.0021       0.31   0.0068  4.37    21
## [307]  {butter milk,                                                                                    
##         shopping bags}             => {fruit/vegetable juice}     0.0012       0.32   0.0039  4.37    12
## [308]  {semi-finished bread,                                                                            
##         whipped/sour cream}        => {tropical fruit}            0.0011       0.46   0.0024  4.37    11
## [309]  {ham,                                                                                            
##         other vegetables,                                                                               
##         whole milk}                => {domestic eggs}             0.0013       0.28   0.0048  4.36    13
## [310]  {curd,                                                                                           
##         other vegetables,                                                                               
##         pastry}                    => {whipped/sour cream}        0.0010       0.31   0.0033  4.36    10
## [311]  {chocolate,                                                                                      
##         pastry}                    => {napkins}                   0.0018       0.23   0.0080  4.35    18
## [312]  {pip fruit,                                                                                      
##         root vegetables,                                                                                
##         whole milk,                                                                                     
##         yogurt}                    => {fruit/vegetable juice}     0.0011       0.31   0.0036  4.35    11
## [313]  {chicken,                                                                                        
##         whole milk,                                                                                     
##         yogurt}                    => {citrus fruit}              0.0014       0.36   0.0040  4.34    14
## [314]  {hamburger meat,                                                                                 
##         yogurt}                    => {cream cheese}              0.0011       0.17   0.0065  4.33    11
## [315]  {curd,                                                                                           
##         other vegetables,                                                                               
##         sausage}                   => {tropical fruit}            0.0015       0.45   0.0034  4.33    15
## [316]  {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         tropical fruit}            => {beef}                      0.0010       0.23   0.0045  4.33    10
## [317]  {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         yogurt}                    => {dessert}                   0.0013       0.16   0.0082  4.32    13
## [318]  {long life bakery product,                                                                       
##         other vegetables}          => {cream cheese}              0.0018       0.17   0.0107  4.32    18
## [319]  {jam}                       => {beef}                      0.0012       0.23   0.0054  4.32    12
## [320]  {beef,                                                                                           
##         flour}                     => {citrus fruit}              0.0010       0.36   0.0028  4.32    10
## [321]  {dessert,                                                                                        
##         sausage,                                                                                        
##         whipped/sour cream}        => {other vegetables}          0.0010       0.83   0.0012  4.31    10
## [322]  {brown bread,                                                                                    
##         sausage,                                                                                        
##         whipped/sour cream}        => {other vegetables}          0.0010       0.83   0.0012  4.31    10
## [323]  {dessert,                                                                                        
##         whipped/sour cream}        => {curd}                      0.0011       0.23   0.0049  4.30    11
## [324]  {citrus fruit,                                                                                   
##         root vegetables,                                                                                
##         yogurt}                    => {curd}                      0.0011       0.23   0.0049  4.30    11
## [325]  {cream cheese,                                                                                   
##         other vegetables,                                                                               
##         whole milk}                => {domestic eggs}             0.0018       0.27   0.0067  4.30    18
## [326]  {berries,                                                                                        
##         whipped/sour cream,                                                                             
##         whole milk}                => {butter}                    0.0010       0.24   0.0043  4.30    10
## [327]  {pip fruit,                                                                                      
##         root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         whole milk}                => {citrus fruit}              0.0011       0.35   0.0032  4.29    11
## [328]  {root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         yogurt}                    => {butter}                    0.0019       0.24   0.0081  4.29    19
## [329]  {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         tropical fruit}            => {citrus fruit}              0.0023       0.35   0.0066  4.28    23
## [330]  {other vegetables,                                                                               
##         waffles}                   => {salty snack}               0.0016       0.16   0.0101  4.27    16
## [331]  {hygiene articles,                                                                               
##         tropical fruit,                                                                                 
##         whole milk}                => {margarine}                 0.0010       0.25   0.0041  4.27    10
## [332]  {sugar,                                                                                          
##         whipped/sour cream}        => {domestic eggs}             0.0013       0.27   0.0049  4.27    13
## [333]  {root vegetables,                                                                                
##         sausage,                                                                                        
##         whole milk}                => {beef}                      0.0017       0.22   0.0077  4.26    17
## [334]  {onions,                                                                                         
##         other vegetables,                                                                               
##         tropical fruit}            => {whipped/sour cream}        0.0011       0.31   0.0037  4.26    11
## [335]  {berries,                                                                                        
##         other vegetables,                                                                               
##         tropical fruit}            => {root vegetables}           0.0013       0.46   0.0028  4.26    13
## [336]  {chicken,                                                                                        
##         other vegetables,                                                                               
##         whole milk}                => {frozen vegetables}         0.0017       0.20   0.0084  4.26    17
## [337]  {citrus fruit,                                                                                   
##         fruit/vegetable juice,                                                                          
##         whole milk,                                                                                     
##         yogurt}                    => {other vegetables}          0.0014       0.82   0.0017  4.26    14
## [338]  {hard cheese,                                                                                    
##         yogurt}                    => {domestic eggs}             0.0017       0.27   0.0064  4.25    17
## [339]  {hygiene articles,                                                                               
##         whole milk}                => {napkins}                   0.0028       0.22   0.0128  4.24    28
## [340]  {margarine,                                                                                      
##         root vegetables,                                                                                
##         whole milk}                => {frozen vegetables}         0.0010       0.20   0.0050  4.24    10
## [341]  {bottled beer,                                                                                   
##         frozen vegetables,                                                                              
##         whole milk}                => {yogurt}                    0.0013       0.59   0.0022  4.24    13
## [342]  {chocolate,                                                                                      
##         root vegetables}           => {beef}                      0.0014       0.22   0.0064  4.24    14
## [343]  {long life bakery product,                                                                       
##         other vegetables,                                                                               
##         whole milk}                => {whipped/sour cream}        0.0017       0.30   0.0057  4.23    17
## [344]  {hard cheese,                                                                                    
##         whipped/sour cream,                                                                             
##         whole milk}                => {root vegetables}           0.0012       0.46   0.0026  4.23    12
## [345]  {brown bread,                                                                                    
##         other vegetables,                                                                               
##         root vegetables}           => {citrus fruit}              0.0014       0.35   0.0041  4.23    14
## [346]  {cream cheese,                                                                                   
##         root vegetables,                                                                                
##         whole milk}                => {yogurt}                    0.0023       0.59   0.0040  4.23    23
## [347]  {other vegetables,                                                                               
##         sausage,                                                                                        
##         yogurt}                    => {curd}                      0.0018       0.23   0.0081  4.22    18
## [348]  {butter,                                                                                         
##         other vegetables,                                                                               
##         rolls/buns}                => {domestic eggs}             0.0015       0.27   0.0057  4.22    15
## [349]  {butter,                                                                                         
##         other vegetables,                                                                               
##         white bread,                                                                                    
##         whole milk}                => {yogurt}                    0.0010       0.59   0.0017  4.22    10
## [350]  {beef,                                                                                           
##         rolls/buns,                                                                                     
##         yogurt}                    => {root vegetables}           0.0017       0.46   0.0038  4.22    17
## [351]  {other vegetables,                                                                               
##         sausage,                                                                                        
##         sliced cheese}             => {root vegetables}           0.0011       0.46   0.0024  4.20    11
## [352]  {newspapers,                                                                                     
##         other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         whole milk}                => {root vegetables}           0.0011       0.46   0.0024  4.20    11
## [353]  {frankfurter,                                                                                    
##         soda,                                                                                           
##         yogurt}                    => {bottled water}             0.0013       0.46   0.0028  4.20    13
## [354]  {citrus fruit,                                                                                   
##         herbs,                                                                                          
##         root vegetables}           => {other vegetables}          0.0013       0.81   0.0016  4.20    13
## [355]  {mayonnaise,                                                                                     
##         other vegetables}          => {root vegetables}           0.0016       0.46   0.0036  4.19    16
## [356]  {oil,                                                                                            
##         other vegetables,                                                                               
##         whole milk}                => {beef}                      0.0011       0.22   0.0051  4.19    11
## [357]  {chicken,                                                                                        
##         other vegetables,                                                                               
##         root vegetables}           => {butter}                    0.0013       0.23   0.0057  4.19    13
## [358]  {frankfurter,                                                                                    
##         frozen vegetables}         => {whipped/sour cream}        0.0015       0.30   0.0051  4.19    15
## [359]  {citrus fruit,                                                                                   
##         sausage,                                                                                        
##         whole milk}                => {domestic eggs}             0.0013       0.27   0.0050  4.18    13
## [360]  {beef,                                                                                           
##         chocolate}                 => {newspapers}                0.0011       0.33   0.0034  4.18    11
## [361]  {pork,                                                                                           
##         whipped/sour cream,                                                                             
##         whole milk}                => {curd}                      0.0010       0.22   0.0046  4.17    10
## [362]  {frozen vegetables,                                                                              
##         other vegetables,                                                                               
##         whole milk}                => {chicken}                   0.0017       0.18   0.0097  4.17    17
## [363]  {margarine,                                                                                      
##         other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         yogurt}                    => {root vegetables}           0.0010       0.45   0.0022  4.17    10
## [364]  {other vegetables,                                                                               
##         root vegetables,                                                                                
##         yogurt}                    => {cream cheese}              0.0021       0.17   0.0129  4.17    21
## [365]  {citrus fruit,                                                                                   
##         hygiene articles}          => {butter}                    0.0012       0.23   0.0053  4.16    12
## [366]  {napkins,                                                                                        
##         other vegetables,                                                                               
##         whole milk}                => {whipped/sour cream}        0.0020       0.30   0.0068  4.16    20
## [367]  {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         tropical fruit}            => {frozen vegetables}         0.0013       0.20   0.0066  4.16    13
## [368]  {other vegetables,                                                                               
##         whipped/sour cream,                                                                             
##         whole milk,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0024       0.44   0.0056  4.16    24
## [369]  {citrus fruit,                                                                                   
##         curd,                                                                                           
##         whipped/sour cream}        => {yogurt}                    0.0011       0.58   0.0019  4.15    11
## [370]  {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         tropical fruit}            => {yogurt}                    0.0011       0.58   0.0019  4.15    11
## [371]  {brown bread,                                                                                    
##         other vegetables,                                                                               
##         pip fruit}                 => {whipped/sour cream}        0.0011       0.30   0.0038  4.15    11
## [372]  {brown bread,                                                                                    
##         other vegetables,                                                                               
##         yogurt}                    => {pip fruit}                 0.0016       0.31   0.0052  4.15    16
## [373]  {chocolate,                                                                                      
##         long life bakery product,                                                                       
##         other vegetables}          => {tropical fruit}            0.0010       0.43   0.0023  4.14    10
## [374]  {frankfurter,                                                                                    
##         other vegetables,                                                                               
##         pip fruit,                                                                                      
##         whole milk}                => {tropical fruit}            0.0010       0.43   0.0023  4.14    10
## [375]  {citrus fruit,                                                                                   
##         pip fruit,                                                                                      
##         whole milk}                => {root vegetables}           0.0023       0.45   0.0052  4.14    23
## [376]  {chicken,                                                                                        
##         other vegetables}          => {frozen vegetables}         0.0036       0.20   0.0179  4.13    35
## [377]  {pip fruit,                                                                                      
##         tropical fruit,                                                                                 
##         whipped/sour cream,                                                                             
##         whole milk}                => {other vegetables}          0.0016       0.80   0.0020  4.13    16
## [378]  {tropical fruit,                                                                                 
##         whipped/sour cream,                                                                             
##         yogurt}                    => {cream cheese}              0.0010       0.16   0.0062  4.13    10
## [379]  {cream cheese,                                                                                   
##         whipped/sour cream}        => {waffles}                   0.0010       0.16   0.0064  4.13    10
## [380]  {berries,                                                                                        
##         other vegetables,                                                                               
##         root vegetables}           => {tropical fruit}            0.0013       0.43   0.0031  4.13    13
## [381]  {butter,                                                                                         
##         curd,                                                                                           
##         other vegetables}          => {pastry}                    0.0011       0.37   0.0031  4.12    11
## [382]  {other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         whipped/sour cream}        => {salty snack}               0.0012       0.16   0.0078  4.12    12
## [383]  {bottled beer,                                                                                   
##         misc. beverages}           => {bottled water}             0.0010       0.45   0.0022  4.11    10
## [384]  {tropical fruit,                                                                                 
##         white bread,                                                                                    
##         whole milk}                => {pip fruit}                 0.0014       0.31   0.0046  4.11    14
## [385]  {butter,                                                                                         
##         sausage}                   => {whipped/sour cream}        0.0025       0.29   0.0086  4.10    25
## [386]  {long life bakery product,                                                                       
##         rolls/buns,                                                                                     
##         whole milk}                => {whipped/sour cream}        0.0010       0.29   0.0035  4.10    10
## [387]  {root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         yogurt}                    => {cream cheese}              0.0013       0.16   0.0081  4.10    13
## [388]  {domestic eggs,                                                                                  
##         hard cheese,                                                                                    
##         whole milk}                => {yogurt}                    0.0012       0.57   0.0021  4.10    12
## [389]  {chocolate,                                                                                      
##         citrus fruit,                                                                                   
##         whole milk}                => {sausage}                   0.0010       0.38   0.0026  4.09    10
## [390]  {long life bakery product,                                                                       
##         other vegetables,                                                                               
##         whole milk}                => {napkins}                   0.0012       0.21   0.0057  4.09    12
## [391]  {curd,                                                                                           
##         other vegetables,                                                                               
##         root vegetables}           => {domestic eggs}             0.0014       0.26   0.0055  4.09    14
## [392]  {beverages,                                                                                      
##         pip fruit}                 => {tropical fruit}            0.0012       0.43   0.0028  4.08    12
## [393]  {frozen vegetables,                                                                              
##         root vegetables,                                                                                
##         whole milk}                => {fruit/vegetable juice}     0.0018       0.30   0.0062  4.08    18
## [394]  {ham,                                                                                            
##         pip fruit,                                                                                      
##         whole milk}                => {other vegetables}          0.0015       0.79   0.0019  4.08    15
## [395]  {chicken,                                                                                        
##         newspapers}                => {frozen vegetables}         0.0010       0.20   0.0052  4.08    10
## [396]  {long life bakery product,                                                                       
##         tropical fruit}            => {butter}                    0.0014       0.23   0.0063  4.07    14
## [397]  {bottled beer,                                                                                   
##         yogurt}                    => {salty snack}               0.0014       0.15   0.0093  4.07    14
## [398]  {curd,                                                                                           
##         other vegetables,                                                                               
##         tropical fruit}            => {pip fruit}                 0.0016       0.31   0.0053  4.07    16
## [399]  {root vegetables,                                                                                
##         soda}                      => {beef}                      0.0040       0.21   0.0186  4.06    39
## [400]  {ham,                                                                                            
##         root vegetables,                                                                                
##         yogurt}                    => {other vegetables}          0.0011       0.79   0.0014  4.06    11
## [401]  {root vegetables,                                                                                
##         whole milk,                                                                                     
##         yogurt}                    => {cream cheese}              0.0023       0.16   0.0145  4.06    23
## [402]  {frankfurter,                                                                                    
##         other vegetables,                                                                               
##         whole milk}                => {pip fruit}                 0.0023       0.31   0.0076  4.05    23
## [403]  {other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk,                                                                                     
##         yogurt}                    => {frozen vegetables}         0.0015       0.19   0.0078  4.05    15
## [404]  {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         tropical fruit}            => {whipped/sour cream}        0.0027       0.29   0.0095  4.05    27
## [405]  {margarine,                                                                                      
##         other vegetables,                                                                               
##         tropical fruit}            => {yogurt}                    0.0022       0.56   0.0040  4.04    22
## [406]  {citrus fruit,                                                                                   
##         fruit/vegetable juice,                                                                          
##         yogurt}                    => {tropical fruit}            0.0014       0.42   0.0034  4.04    14
## [407]  {domestic eggs,                                                                                  
##         whole milk,                                                                                     
##         yogurt}                    => {whipped/sour cream}        0.0022       0.29   0.0077  4.04    22
## [408]  {oil,                                                                                            
##         pip fruit}                 => {sausage}                   0.0011       0.38   0.0029  4.04    11
## [409]  {other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         yogurt}                    => {whipped/sour cream}        0.0036       0.29   0.0123  4.04    35
## [410]  {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         whole milk}                => {yogurt}                    0.0018       0.56   0.0033  4.03    18
## [411]  {newspapers,                                                                                     
##         rolls/buns,                                                                                     
##         whole milk}                => {chocolate}                 0.0015       0.20   0.0076  4.03    15
## [412]  {pip fruit,                                                                                      
##         yogurt}                    => {curd}                      0.0039       0.21   0.0180  4.03    38
## [413]  {napkins,                                                                                        
##         other vegetables,                                                                               
##         tropical fruit}            => {citrus fruit}              0.0013       0.33   0.0040  4.03    13
## [414]  {newspapers,                                                                                     
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk}                => {citrus fruit}              0.0010       0.33   0.0031  4.03    10
## [415]  {domestic eggs,                                                                                  
##         whipped/sour cream,                                                                             
##         whole milk}                => {curd}                      0.0012       0.21   0.0057  4.02    12
## [416]  {misc. beverages,                                                                                
##         whole milk}                => {cream cheese}              0.0011       0.16   0.0070  4.02    11
## [417]  {other vegetables,                                                                               
##         root vegetables,                                                                                
##         whipped/sour cream,                                                                             
##         whole milk}                => {domestic eggs}             0.0013       0.25   0.0052  4.02    13
## [418]  {shopping bags,                                                                                  
##         soft cheese}               => {pastry}                    0.0010       0.36   0.0028  4.01    10
## [419]  {curd,                                                                                           
##         pip fruit,                                                                                      
##         yogurt}                    => {tropical fruit}            0.0016       0.42   0.0039  4.01    16
## [420]  {other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk,                                                                                     
##         yogurt}                    => {white bread}               0.0013       0.17   0.0078  4.01    13
## [421]  {citrus fruit,                                                                                   
##         fruit/vegetable juice,                                                                          
##         yogurt}                    => {pip fruit}                 0.0010       0.30   0.0034  4.01    10
## [422]  {sliced cheese,                                                                                  
##         whipped/sour cream}        => {fruit/vegetable juice}     0.0011       0.29   0.0039  4.00    11
## [423]  {other vegetables,                                                                               
##         white bread,                                                                                    
##         yogurt}                    => {root vegetables}           0.0017       0.44   0.0040  4.00    17
## [424]  {tropical fruit,                                                                                 
##         whole milk,                                                                                     
##         yogurt}                    => {butter}                    0.0034       0.22   0.0151  4.00    33
## [425]  {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         tropical fruit,                                                                                 
##         whole milk}                => {curd}                      0.0010       0.21   0.0048  3.99    10
## [426]  {turkey,                                                                                         
##         yogurt}                    => {root vegetables}           0.0010       0.43   0.0023  3.99    10
## [427]  {frankfurter,                                                                                    
##         other vegetables,                                                                               
##         pip fruit,                                                                                      
##         whole milk}                => {root vegetables}           0.0010       0.43   0.0023  3.99    10
## [428]  {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         yogurt}                    => {curd}                      0.0017       0.21   0.0081  3.99    17
## [429]  {domestic eggs,                                                                                  
##         root vegetables,                                                                                
##         tropical fruit}            => {whipped/sour cream}        0.0010       0.29   0.0036  3.99    10
## [430]  {frozen vegetables,                                                                              
##         sausage}                   => {fruit/vegetable juice}     0.0017       0.29   0.0060  3.99    17
## [431]  {root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         waffles}                   => {yogurt}                    0.0010       0.56   0.0018  3.98    10
## [432]  {cream cheese,                                                                                   
##         fruit/vegetable juice,                                                                          
##         pip fruit}                 => {yogurt}                    0.0010       0.56   0.0018  3.98    10
## [433]  {fruit/vegetable juice,                                                                          
##         root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         whole milk}                => {yogurt}                    0.0010       0.56   0.0018  3.98    10
## [434]  {pork,                                                                                           
##         yogurt}                    => {frozen vegetables}         0.0018       0.19   0.0096  3.98    18
## [435]  {whipped/sour cream,                                                                             
##         white bread,                                                                                    
##         whole milk}                => {root vegetables}           0.0013       0.43   0.0031  3.98    13
## [436]  {butter,                                                                                         
##         other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         yogurt}                    => {root vegetables}           0.0013       0.43   0.0031  3.98    13
## [437]  {fruit/vegetable juice,                                                                          
##         long life bakery product,                                                                       
##         root vegetables}           => {other vegetables}          0.0010       0.77   0.0013  3.98    10
## [438]  {citrus fruit,                                                                                   
##         frozen vegetables,                                                                              
##         root vegetables}           => {other vegetables}          0.0020       0.77   0.0026  3.98    20
## [439]  {domestic eggs,                                                                                  
##         pastry,                                                                                         
##         whole milk,                                                                                     
##         yogurt}                    => {other vegetables}          0.0010       0.77   0.0013  3.98    10
## [440]  {butter,                                                                                         
##         root vegetables}           => {domestic eggs}             0.0033       0.25   0.0129  3.97    32
## [441]  {pork,                                                                                           
##         whole milk,                                                                                     
##         yogurt}                    => {beef}                      0.0010       0.21   0.0049  3.97    10
## [442]  {bottled water,                                                                                  
##         butter,                                                                                         
##         yogurt}                    => {tropical fruit}            0.0010       0.42   0.0024  3.97    10
## [443]  {other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         whipped/sour cream,                                                                             
##         whole milk}                => {root vegetables}           0.0016       0.43   0.0038  3.97    16
## [444]  {margarine,                                                                                      
##         other vegetables,                                                                               
##         whole milk}                => {butter}                    0.0020       0.22   0.0093  3.97    20
## [445]  {margarine,                                                                                      
##         pork}                      => {frozen vegetables}         0.0012       0.19   0.0064  3.96    12
## [446]  {pip fruit,                                                                                      
##         pork}                      => {white bread}               0.0010       0.17   0.0061  3.96    10
## [447]  {bottled water,                                                                                  
##         hard cheese}               => {fruit/vegetable juice}     0.0010       0.29   0.0036  3.95    10
## [448]  {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         tropical fruit,                                                                                 
##         yogurt}                    => {fruit/vegetable juice}     0.0010       0.29   0.0036  3.95    10
## [449]  {pastry,                                                                                         
##         salty snack}               => {chocolate}                 0.0010       0.20   0.0052  3.95    10
## [450]  {pip fruit,                                                                                      
##         root vegetables,                                                                                
##         tropical fruit}            => {citrus fruit}              0.0017       0.33   0.0053  3.95    17
## [451]  {hard cheese,                                                                                    
##         white bread}               => {yogurt}                    0.0011       0.55   0.0020  3.94    11
## [452]  {soft cheese,                                                                                    
##         whipped/sour cream,                                                                             
##         whole milk}                => {yogurt}                    0.0011       0.55   0.0020  3.94    11
## [453]  {frankfurter,                                                                                    
##         root vegetables,                                                                                
##         tropical fruit}            => {sausage}                   0.0010       0.37   0.0027  3.94    10
## [454]  {hard cheese,                                                                                    
##         yogurt}                    => {napkins}                   0.0013       0.21   0.0064  3.94    13
## [455]  {bottled water,                                                                                  
##         other vegetables,                                                                               
##         soda}                      => {domestic eggs}             0.0014       0.25   0.0057  3.94    14
## [456]  {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         yogurt}                    => {tropical fruit}            0.0032       0.41   0.0076  3.94    31
## [457]  {root vegetables,                                                                                
##         sugar}                     => {beef}                      0.0013       0.21   0.0064  3.93    13
## [458]  {berries,                                                                                        
##         napkins}                   => {root vegetables}           0.0012       0.43   0.0028  3.93    12
## [459]  {sausage,                                                                                        
##         whipped/sour cream,                                                                             
##         yogurt}                    => {root vegetables}           0.0015       0.43   0.0036  3.93    15
## [460]  {frankfurter,                                                                                    
##         other vegetables,                                                                               
##         whole milk,                                                                                     
##         yogurt}                    => {root vegetables}           0.0012       0.43   0.0028  3.93    12
## [461]  {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         whipped/sour cream}        => {yogurt}                    0.0023       0.55   0.0043  3.93    23
## [462]  {pip fruit,                                                                                      
##         white bread,                                                                                    
##         whole milk}                => {tropical fruit}            0.0014       0.41   0.0035  3.92    14
## [463]  {other vegetables,                                                                               
##         root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         whole milk}                => {frozen vegetables}         0.0013       0.19   0.0070  3.92    13
## [464]  {ham,                                                                                            
##         tropical fruit}            => {fruit/vegetable juice}     0.0015       0.28   0.0054  3.91    15
## [465]  {butter,                                                                                         
##         domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         whipped/sour cream}        => {whole milk}                0.0012       1.00   0.0012  3.91    12
## [466]  {beef,                                                                                           
##         pip fruit}                 => {margarine}                 0.0011       0.23   0.0049  3.91    11
## [467]  {bottled beer,                                                                                   
##         citrus fruit}              => {butter}                    0.0013       0.22   0.0061  3.91    13
## [468]  {ham,                                                                                            
##         whole milk,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0016       0.41   0.0040  3.91    16
## [469]  {bottled water,                                                                                  
##         tropical fruit,                                                                                 
##         yogurt}                    => {margarine}                 0.0016       0.23   0.0071  3.90    16
## [470]  {other vegetables,                                                                               
##         soda,                                                                                           
##         white bread}               => {fruit/vegetable juice}     0.0011       0.28   0.0040  3.90    11
## [471]  {beef,                                                                                           
##         chocolate}                 => {root vegetables}           0.0014       0.42   0.0034  3.89    14
## [472]  {butter,                                                                                         
##         root vegetables,                                                                                
##         tropical fruit}            => {yogurt}                    0.0019       0.54   0.0036  3.89    19
## [473]  {butter,                                                                                         
##         margarine}                 => {chicken}                   0.0011       0.17   0.0067  3.88    11
## [474]  {flour,                                                                                          
##         fruit/vegetable juice}     => {yogurt}                    0.0013       0.54   0.0024  3.88    13
## [475]  {frozen vegetables,                                                                              
##         root vegetables,                                                                                
##         whipped/sour cream}        => {tropical fruit}            0.0011       0.41   0.0027  3.88    11
## [476]  {pastry,                                                                                         
##         whipped/sour cream,                                                                             
##         yogurt}                    => {tropical fruit}            0.0011       0.41   0.0027  3.88    11
## [477]  {berries,                                                                                        
##         rolls/buns}                => {domestic eggs}             0.0016       0.25   0.0066  3.88    16
## [478]  {other vegetables,                                                                               
##         pastry,                                                                                         
##         yogurt}                    => {cream cheese}              0.0010       0.15   0.0066  3.88    10
## [479]  {cream cheese,                                                                                   
##         domestic eggs,                                                                                  
##         root vegetables}           => {other vegetables}          0.0012       0.75   0.0016  3.88    12
## [480]  {butter,                                                                                         
##         pip fruit,                                                                                      
##         whipped/sour cream}        => {other vegetables}          0.0015       0.75   0.0020  3.88    15
## [481]  {pip fruit,                                                                                      
##         whipped/sour cream}        => {tropical fruit}            0.0038       0.41   0.0093  3.87    37
## [482]  {citrus fruit,                                                                                   
##         fruit/vegetable juice}     => {frozen vegetables}         0.0019       0.19   0.0104  3.87    19
## [483]  {chicken,                                                                                        
##         other vegetables,                                                                               
##         whole milk}                => {whipped/sour cream}        0.0023       0.28   0.0084  3.87    23
## [484]  {other vegetables,                                                                               
##         root vegetables,                                                                                
##         sliced cheese}             => {tropical fruit}            0.0015       0.41   0.0038  3.86    15
## [485]  {butter,                                                                                         
##         coffee}                    => {whipped/sour cream}        0.0013       0.28   0.0048  3.86    13
## [486]  {bottled water,                                                                                  
##         frozen vegetables}         => {fruit/vegetable juice}     0.0017       0.28   0.0062  3.85    17
## [487]  {canned fish,                                                                                    
##         soda}                      => {shopping bags}             0.0011       0.38   0.0029  3.85    11
## [488]  {frankfurter,                                                                                    
##         whole milk,                                                                                     
##         yogurt}                    => {butter}                    0.0013       0.21   0.0062  3.85    13
## [489]  {chocolate,                                                                                      
##         domestic eggs}             => {fruit/vegetable juice}     0.0010       0.28   0.0037  3.84    10
## [490]  {pip fruit,                                                                                      
##         whipped/sour cream}        => {chicken}                   0.0015       0.16   0.0093  3.84    15
## [491]  {butter,                                                                                         
##         rolls/buns,                                                                                     
##         whole milk}                => {frozen vegetables}         0.0012       0.18   0.0066  3.84    12
## [492]  {hard cheese,                                                                                    
##         tropical fruit}            => {whipped/sour cream}        0.0011       0.28   0.0041  3.84    11
## [493]  {herbs,                                                                                          
##         whole milk}                => {frozen vegetables}         0.0014       0.18   0.0077  3.83    14
## [494]  {chocolate,                                                                                      
##         other vegetables,                                                                               
##         soda}                      => {newspapers}                0.0011       0.31   0.0037  3.83    11
## [495]  {whipped/sour cream,                                                                             
##         white bread}               => {curd}                      0.0011       0.20   0.0055  3.82    11
## [496]  {other vegetables,                                                                               
##         pastry,                                                                                         
##         root vegetables,                                                                                
##         whole milk}                => {yogurt}                    0.0016       0.53   0.0031  3.82    16
## [497]  {butter,                                                                                         
##         napkins,                                                                                        
##         other vegetables}          => {root vegetables}           0.0010       0.42   0.0024  3.82    10
## [498]  {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         whipped/sour cream,                                                                             
##         whole milk}                => {root vegetables}           0.0015       0.42   0.0037  3.82    15
## [499]  {citrus fruit,                                                                                   
##         frozen vegetables}         => {napkins}                   0.0013       0.20   0.0066  3.82    13
## [500]  {ham,                                                                                            
##         other vegetables}          => {pip fruit}                 0.0026       0.29   0.0092  3.82    26
## [501]  {hamburger meat,                                                                                 
##         rolls/buns}                => {beef}                      0.0017       0.20   0.0086  3.81    17
## [502]  {frankfurter,                                                                                    
##         frozen vegetables}         => {beef}                      0.0010       0.20   0.0051  3.81    10
## [503]  {coffee,                                                                                         
##         other vegetables,                                                                               
##         yogurt}                    => {tropical fruit}            0.0014       0.40   0.0036  3.81    14
## [504]  {beef,                                                                                           
##         sausage,                                                                                        
##         whole milk}                => {tropical fruit}            0.0012       0.40   0.0031  3.81    12
## [505]  {pastry,                                                                                         
##         root vegetables,                                                                                
##         whole milk,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0010       0.40   0.0025  3.81    10
## [506]  {curd,                                                                                           
##         other vegetables,                                                                               
##         yogurt}                    => {frozen vegetables}         0.0011       0.18   0.0061  3.81    11
## [507]  {butter,                                                                                         
##         white bread,                                                                                    
##         yogurt}                    => {other vegetables}          0.0014       0.74   0.0019  3.81    14
## [508]  {frozen fish,                                                                                    
##         whole milk}                => {frankfurter}               0.0011       0.22   0.0050  3.81    11
## [509]  {frozen vegetables,                                                                              
##         other vegetables,                                                                               
##         tropical fruit}            => {root vegetables}           0.0017       0.41   0.0042  3.80    17
## [510]  {soda,                                                                                           
##         white bread,                                                                                    
##         whole milk}                => {fruit/vegetable juice}     0.0011       0.28   0.0041  3.80    11
## [511]  {herbs,                                                                                          
##         whole milk}                => {butter}                    0.0016       0.21   0.0077  3.80    16
## [512]  {other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         root vegetables,                                                                                
##         tropical fruit}            => {citrus fruit}              0.0011       0.31   0.0036  3.80    11
## [513]  {whipped/sour cream,                                                                             
##         white bread}               => {domestic eggs}             0.0013       0.24   0.0055  3.79    13
## [514]  {other vegetables,                                                                               
##         pastry,                                                                                         
##         soda}                      => {domestic eggs}             0.0013       0.24   0.0055  3.79    13
## [515]  {pip fruit,                                                                                      
##         sliced cheese,                                                                                  
##         tropical fruit}            => {other vegetables}          0.0011       0.73   0.0015  3.79    11
## [516]  {root vegetables,                                                                                
##         salty snack,                                                                                    
##         tropical fruit}            => {other vegetables}          0.0011       0.73   0.0015  3.79    11
## [517]  {root vegetables,                                                                                
##         shopping bags,                                                                                  
##         whole milk,                                                                                     
##         yogurt}                    => {other vegetables}          0.0011       0.73   0.0015  3.79    11
## [518]  {citrus fruit,                                                                                   
##         curd}                      => {whipped/sour cream}        0.0019       0.27   0.0071  3.79    19
## [519]  {white bread,                                                                                    
##         whole milk,                                                                                     
##         yogurt}                    => {whipped/sour cream}        0.0013       0.27   0.0049  3.78    13
## [520]  {processed cheese,                                                                               
##         tropical fruit}            => {pip fruit}                 0.0012       0.29   0.0043  3.78    12
## [521]  {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         whole milk}                => {whipped/sour cream}        0.0037       0.27   0.0135  3.78    36
## [522]  {napkins,                                                                                        
##         whipped/sour cream}        => {domestic eggs}             0.0017       0.24   0.0072  3.77    17
## [523]  {butter,                                                                                         
##         domestic eggs,                                                                                  
##         whipped/sour cream}        => {yogurt}                    0.0010       0.53   0.0019  3.77    10
## [524]  {domestic eggs,                                                                                  
##         sausage,                                                                                        
##         whipped/sour cream}        => {yogurt}                    0.0010       0.53   0.0019  3.77    10
## [525]  {butter milk,                                                                                    
##         other vegetables,                                                                               
##         whole milk}                => {pork}                      0.0010       0.22   0.0047  3.77    10
## [526]  {soft cheese,                                                                                    
##         whole milk}                => {whipped/sour cream}        0.0020       0.27   0.0075  3.77    20
## [527]  {sliced cheese,                                                                                  
##         whole milk,                                                                                     
##         yogurt}                    => {frankfurter}               0.0010       0.22   0.0046  3.77    10
## [528]  {curd,                                                                                           
##         other vegetables,                                                                               
##         whipped/sour cream}        => {tropical fruit}            0.0017       0.40   0.0044  3.77    17
## [529]  {butter,                                                                                         
##         whipped/sour cream,                                                                             
##         yogurt}                    => {tropical fruit}            0.0015       0.39   0.0039  3.76    15
## [530]  {grapes,                                                                                         
##         whole milk}                => {butter}                    0.0015       0.21   0.0073  3.76    15
## [531]  {long life bakery product,                                                                       
##         root vegetables}           => {whipped/sour cream}        0.0014       0.27   0.0053  3.76    14
## [532]  {other vegetables,                                                                               
##         turkey,                                                                                         
##         whole milk}                => {yogurt}                    0.0011       0.52   0.0021  3.75    11
## [533]  {curd,                                                                                           
##         whole milk,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0040       0.39   0.0101  3.75    39
## [534]  {butter milk,                                                                                    
##         root vegetables}           => {curd}                      0.0010       0.20   0.0051  3.75    10
## [535]  {butter,                                                                                         
##         white bread}               => {domestic eggs}             0.0010       0.24   0.0043  3.75    10
## [536]  {citrus fruit,                                                                                   
##         root vegetables,                                                                                
##         tropical fruit}            => {napkins}                   0.0011       0.20   0.0057  3.75    11
## [537]  {napkins,                                                                                        
##         root vegetables,                                                                                
##         whole milk}                => {fruit/vegetable juice}     0.0013       0.27   0.0049  3.75    13
## [538]  {dessert,                                                                                        
##         pastry}                    => {butter}                    0.0011       0.21   0.0054  3.75    11
## [539]  {other vegetables,                                                                               
##         root vegetables,                                                                                
##         whipped/sour cream}        => {tropical fruit}            0.0034       0.39   0.0085  3.74    33
## [540]  {fruit/vegetable juice,                                                                          
##         sliced cheese}             => {whipped/sour cream}        0.0011       0.27   0.0042  3.74    11
## [541]  {frozen vegetables,                                                                              
##         rolls/buns,                                                                                     
##         tropical fruit}            => {yogurt}                    0.0012       0.52   0.0023  3.74    12
## [542]  {cream cheese,                                                                                   
##         other vegetables,                                                                               
##         whipped/sour cream,                                                                             
##         whole milk}                => {yogurt}                    0.0012       0.52   0.0023  3.74    12
## [543]  {hygiene articles,                                                                               
##         other vegetables,                                                                               
##         whole milk}                => {beef}                      0.0010       0.20   0.0052  3.74    10
## [544]  {sausage,                                                                                        
##         whipped/sour cream}        => {white bread}               0.0014       0.16   0.0090  3.74    14
## [545]  {butter milk,                                                                                    
##         fruit/vegetable juice,                                                                          
##         yogurt}                    => {other vegetables}          0.0013       0.72   0.0018  3.73    13
## [546]  {citrus fruit,                                                                                   
##         cream cheese,                                                                                   
##         domestic eggs}             => {other vegetables}          0.0013       0.72   0.0018  3.73    13
## [547]  {citrus fruit,                                                                                   
##         whole milk,                                                                                     
##         yogurt}                    => {whipped/sour cream}        0.0027       0.27   0.0103  3.73    27
## [548]  {other vegetables,                                                                               
##         pork,                                                                                           
##         whole milk}                => {chicken}                   0.0016       0.16   0.0102  3.73    16
## [549]  {sugar,                                                                                          
##         whole milk}                => {domestic eggs}             0.0036       0.24   0.0150  3.73    35
## [550]  {bottled beer,                                                                                   
##         other vegetables,                                                                               
##         tropical fruit}            => {root vegetables}           0.0013       0.41   0.0033  3.73    13
## [551]  {sliced cheese,                                                                                  
##         tropical fruit}            => {yogurt}                    0.0027       0.52   0.0053  3.72    27
## [552]  {beef,                                                                                           
##         root vegetables,                                                                                
##         yogurt}                    => {whipped/sour cream}        0.0012       0.27   0.0046  3.72    12
## [553]  {soda,                                                                                           
##         tropical fruit,                                                                                 
##         whipped/sour cream}        => {yogurt}                    0.0014       0.52   0.0027  3.72    14
## [554]  {citrus fruit,                                                                                   
##         fruit/vegetable juice,                                                                          
##         whole milk}                => {root vegetables}           0.0017       0.40   0.0043  3.71    17
## [555]  {fruit/vegetable juice,                                                                          
##         pip fruit,                                                                                      
##         whole milk}                => {root vegetables}           0.0019       0.40   0.0048  3.71    19
## [556]  {dessert,                                                                                        
##         long life bakery product}  => {yogurt}                    0.0015       0.52   0.0029  3.71    15
## [557]  {frozen vegetables,                                                                              
##         fruit/vegetable juice}     => {white bread}               0.0012       0.16   0.0078  3.70    12
## [558]  {rice,                                                                                           
##         root vegetables}           => {yogurt}                    0.0016       0.52   0.0032  3.70    16
## [559]  {cream cheese,                                                                                   
##         other vegetables,                                                                               
##         whole milk}                => {yogurt}                    0.0035       0.52   0.0067  3.69    34
## [560]  {curd,                                                                                           
##         yogurt}                    => {whipped/sour cream}        0.0046       0.26   0.0173  3.69    45
## [561]  {oil,                                                                                            
##         sliced cheese}             => {other vegetables}          0.0010       0.71   0.0014  3.69    10
## [562]  {frozen dessert,                                                                                 
##         tropical fruit,                                                                                 
##         whole milk}                => {other vegetables}          0.0010       0.71   0.0014  3.69    10
## [563]  {cream cheese,                                                                                   
##         domestic eggs,                                                                                  
##         whipped/sour cream}        => {other vegetables}          0.0010       0.71   0.0014  3.69    10
## [564]  {frozen vegetables,                                                                              
##         margarine,                                                                                      
##         whipped/sour cream}        => {other vegetables}          0.0010       0.71   0.0014  3.69    10
## [565]  {butter,                                                                                         
##         pork,                                                                                           
##         whipped/sour cream,                                                                             
##         whole milk}                => {other vegetables}          0.0010       0.71   0.0014  3.69    10
## [566]  {bottled water,                                                                                  
##         butter,                                                                                         
##         citrus fruit,                                                                                   
##         whole milk}                => {other vegetables}          0.0010       0.71   0.0014  3.69    10
## [567]  {grapes,                                                                                         
##         tropical fruit}            => {fruit/vegetable juice}     0.0016       0.27   0.0061  3.69    16
## [568]  {beef,                                                                                           
##         other vegetables}          => {root vegetables}           0.0079       0.40   0.0197  3.69    78
## [569]  {sausage,                                                                                        
##         waffles}                   => {butter}                    0.0010       0.20   0.0050  3.68    10
## [570]  {frozen vegetables,                                                                              
##         tropical fruit,                                                                                 
##         whole milk}                => {butter}                    0.0010       0.20   0.0050  3.68    10
## [571]  {butter,                                                                                         
##         chicken}                   => {beef}                      0.0011       0.19   0.0058  3.68    11
## [572]  {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk}                => {yogurt}                    0.0020       0.51   0.0040  3.68    20
## [573]  {bottled water,                                                                                  
##         butter,                                                                                         
##         other vegetables}          => {pip fruit}                 0.0010       0.28   0.0037  3.67    10
## [574]  {canned vegetables,                                                                              
##         whole milk}                => {whipped/sour cream}        0.0010       0.26   0.0039  3.67    10
## [575]  {citrus fruit,                                                                                   
##         oil}                       => {fruit/vegetable juice}     0.0013       0.27   0.0050  3.67    13
## [576]  {packaged fruit/vegetables,                                                                      
##         yogurt}                    => {root vegetables}           0.0010       0.40   0.0025  3.67    10
## [577]  {curd,                                                                                           
##         other vegetables,                                                                               
##         yogurt}                    => {root vegetables}           0.0024       0.40   0.0061  3.67    24
## [578]  {butter,                                                                                         
##         soda,                                                                                           
##         whole milk}                => {root vegetables}           0.0012       0.40   0.0031  3.67    12
## [579]  {rice,                                                                                           
##         root vegetables}           => {other vegetables}          0.0022       0.71   0.0032  3.67    22
## [580]  {rolls/buns,                                                                                     
##         spread cheese}             => {newspapers}                0.0012       0.29   0.0042  3.67    12
## [581]  {bottled water,                                                                                  
##         napkins,                                                                                        
##         whole milk}                => {tropical fruit}            0.0015       0.38   0.0040  3.67    15
## [582]  {pip fruit,                                                                                      
##         rolls/buns,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0015       0.38   0.0040  3.67    15
## [583]  {herbs,                                                                                          
##         pip fruit}                 => {other vegetables}          0.0017       0.71   0.0024  3.66    17
## [584]  {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         tropical fruit}            => {pip fruit}                 0.0018       0.28   0.0066  3.66    18
## [585]  {misc. beverages,                                                                                
##         whole milk}                => {domestic eggs}             0.0016       0.23   0.0070  3.65    16
## [586]  {butter,                                                                                         
##         other vegetables,                                                                               
##         root vegetables}           => {white bread}               0.0010       0.15   0.0066  3.65    10
## [587]  {root vegetables,                                                                                
##         whipped/sour cream}        => {butter}                    0.0035       0.20   0.0171  3.65    34
## [588]  {domestic eggs,                                                                                  
##         tropical fruit,                                                                                 
##         whole milk}                => {napkins}                   0.0013       0.19   0.0069  3.65    13
## [589]  {ham,                                                                                            
##         pip fruit,                                                                                      
##         yogurt}                    => {other vegetables}          0.0012       0.71   0.0017  3.65    12
## [590]  {chicken,                                                                                        
##         sausage,                                                                                        
##         yogurt}                    => {other vegetables}          0.0012       0.71   0.0017  3.65    12
## [591]  {cream cheese,                                                                                   
##         white bread}               => {tropical fruit}            0.0013       0.38   0.0035  3.64    13
## [592]  {margarine,                                                                                      
##         other vegetables,                                                                               
##         whipped/sour cream}        => {tropical fruit}            0.0013       0.38   0.0035  3.64    13
## [593]  {grapes,                                                                                         
##         other vegetables,                                                                               
##         whole milk}                => {fruit/vegetable juice}     0.0010       0.26   0.0039  3.64    10
## [594]  {oil,                                                                                            
##         tropical fruit}            => {whipped/sour cream}        0.0012       0.26   0.0047  3.64    12
## [595]  {bottled water,                                                                                  
##         chicken}                   => {domestic eggs}             0.0012       0.23   0.0053  3.64    12
## [596]  {ham,                                                                                            
##         tropical fruit,                                                                                 
##         whole milk}                => {other vegetables}          0.0019       0.70   0.0027  3.64    19
## [597]  {brown bread,                                                                                    
##         whole milk,                                                                                     
##         yogurt}                    => {frankfurter}               0.0015       0.21   0.0071  3.63    15
## [598]  {beef,                                                                                           
##         shopping bags}             => {root vegetables}           0.0019       0.40   0.0049  3.63    19
## [599]  {beef,                                                                                           
##         butter}                    => {coffee}                    0.0012       0.21   0.0058  3.63    12
## [600]  {beef,                                                                                           
##         fruit/vegetable juice}     => {citrus fruit}              0.0015       0.30   0.0051  3.62    15
## [601]  {onions,                                                                                         
##         pork}                      => {root vegetables}           0.0015       0.39   0.0039  3.62    15
## [602]  {citrus fruit,                                                                                   
##         tropical fruit,                                                                                 
##         whole milk,                                                                                     
##         yogurt}                    => {root vegetables}           0.0015       0.39   0.0039  3.62    15
## [603]  {butter,                                                                                         
##         citrus fruit,                                                                                   
##         tropical fruit}            => {other vegetables}          0.0014       0.70   0.0020  3.62    14
## [604]  {bottled water,                                                                                  
##         other vegetables,                                                                               
##         root vegetables}           => {frozen vegetables}         0.0012       0.17   0.0070  3.62    12
## [605]  {tropical fruit,                                                                                 
##         whipped/sour cream,                                                                             
##         yogurt}                    => {frankfurter}               0.0013       0.21   0.0062  3.61    13
## [606]  {fruit/vegetable juice,                                                                          
##         root vegetables,                                                                                
##         whole milk}                => {brown bread}               0.0015       0.23   0.0065  3.61    15
## [607]  {curd,                                                                                           
##         tropical fruit,                                                                                 
##         yogurt}                    => {margarine}                 0.0011       0.21   0.0053  3.61    11
## [608]  {bottled water,                                                                                  
##         whole milk,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0037       0.38   0.0097  3.61    36
## [609]  {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         whole milk,                                                                                     
##         yogurt}                    => {butter}                    0.0010       0.20   0.0051  3.61    10
## [610]  {citrus fruit,                                                                                   
##         tropical fruit,                                                                                 
##         whole milk}                => {root vegetables}           0.0036       0.39   0.0090  3.61    35
## [611]  {berries,                                                                                        
##         pip fruit}                 => {tropical fruit}            0.0014       0.38   0.0038  3.61    14
## [612]  {other vegetables,                                                                               
##         sausage,                                                                                        
##         whole milk,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0014       0.38   0.0038  3.61    14
## [613]  {frozen vegetables,                                                                              
##         other vegetables,                                                                               
##         sausage}                   => {root vegetables}           0.0011       0.39   0.0028  3.60    11
## [614]  {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         pastry}                    => {root vegetables}           0.0011       0.39   0.0028  3.60    11
## [615]  {long life bakery product,                                                                       
##         tropical fruit}            => {whipped/sour cream}        0.0016       0.26   0.0063  3.60    16
## [616]  {fruit/vegetable juice,                                                                          
##         sausage}                   => {white bread}               0.0015       0.15   0.0101  3.60    15
## [617]  {bottled beer,                                                                                   
##         butter}                    => {domestic eggs}             0.0013       0.23   0.0058  3.59    13
## [618]  {bottled water,                                                                                  
##         frozen vegetables}         => {tropical fruit}            0.0023       0.38   0.0062  3.59    23
## [619]  {domestic eggs,                                                                                  
##         sugar,                                                                                          
##         tropical fruit}            => {whole milk}                0.0011       0.92   0.0012  3.59    11
## [620]  {domestic eggs,                                                                                  
##         fruit/vegetable juice,                                                                          
##         margarine}                 => {whole milk}                0.0011       0.92   0.0012  3.59    11
## [621]  {frozen vegetables,                                                                              
##         whipped/sour cream}        => {chicken}                   0.0012       0.15   0.0079  3.59    12
## [622]  {white bread,                                                                                    
##         yogurt}                    => {curd}                      0.0017       0.19   0.0090  3.59    17
## [623]  {other vegetables,                                                                               
##         semi-finished bread,                                                                            
##         whole milk}                => {yogurt}                    0.0013       0.50   0.0026  3.58    13
## [624]  {berries,                                                                                        
##         other vegetables,                                                                               
##         soda}                      => {yogurt}                    0.0010       0.50   0.0020  3.58    10
## [625]  {frozen vegetables,                                                                              
##         other vegetables,                                                                               
##         sausage}                   => {yogurt}                    0.0014       0.50   0.0028  3.58    14
## [626]  {butter,                                                                                         
##         curd,                                                                                           
##         other vegetables}          => {yogurt}                    0.0015       0.50   0.0031  3.58    15
## [627]  {bottled water,                                                                                  
##         sausage,                                                                                        
##         soda}                      => {yogurt}                    0.0020       0.50   0.0041  3.58    20
## [628]  {citrus fruit,                                                                                   
##         frozen vegetables,                                                                              
##         other vegetables,                                                                               
##         whole milk}                => {yogurt}                    0.0010       0.50   0.0020  3.58    10
## [629]  {fruit/vegetable juice,                                                                          
##         hard cheese}               => {root vegetables}           0.0016       0.39   0.0042  3.58    16
## [630]  {fruit/vegetable juice,                                                                          
##         tropical fruit,                                                                                 
##         yogurt}                    => {pip fruit}                 0.0013       0.27   0.0049  3.58    13
## [631]  {pip fruit,                                                                                      
##         whipped/sour cream,                                                                             
##         whole milk}                => {root vegetables}           0.0023       0.39   0.0060  3.58    23
## [632]  {butter,                                                                                         
##         other vegetables,                                                                               
##         whole milk}                => {white bread}               0.0017       0.15   0.0115  3.57    17
## [633]  {margarine,                                                                                      
##         waffles}                   => {pip fruit}                 0.0010       0.27   0.0038  3.57    10
## [634]  {fruit/vegetable juice,                                                                          
##         sausage}                   => {frozen vegetables}         0.0017       0.17   0.0101  3.57    17
## [635]  {butter,                                                                                         
##         citrus fruit}              => {whipped/sour cream}        0.0023       0.26   0.0092  3.57    23
## [636]  {bottled beer,                                                                                   
##         domestic eggs,                                                                                  
##         whole milk}                => {other vegetables}          0.0020       0.69   0.0029  3.56    20
## [637]  {cereals,                                                                                        
##         curd}                      => {whole milk}                0.0010       0.91   0.0011  3.56    10
## [638]  {frankfurter,                                                                                    
##         root vegetables,                                                                                
##         sliced cheese}             => {whole milk}                0.0010       0.91   0.0011  3.56    10
## [639]  {citrus fruit,                                                                                   
##         curd,                                                                                           
##         tropical fruit,                                                                                 
##         yogurt}                    => {whole milk}                0.0010       0.91   0.0011  3.56    10
## [640]  {bottled water,                                                                                  
##         butter,                                                                                         
##         citrus fruit,                                                                                   
##         other vegetables}          => {whole milk}                0.0010       0.91   0.0011  3.56    10
## [641]  {bottled beer,                                                                                   
##         oil}                       => {citrus fruit}              0.0010       0.29   0.0035  3.55    10
## [642]  {other vegetables,                                                                               
##         root vegetables,                                                                                
##         whipped/sour cream,                                                                             
##         whole milk}                => {citrus fruit}              0.0015       0.29   0.0052  3.55    15
## [643]  {root vegetables,                                                                                
##         soft cheese,                                                                                    
##         yogurt}                    => {other vegetables}          0.0011       0.69   0.0016  3.55    11
## [644]  {hamburger meat,                                                                                 
##         tropical fruit,                                                                                 
##         yogurt}                    => {other vegetables}          0.0011       0.69   0.0016  3.55    11
## [645]  {pastry,                                                                                         
##         whipped/sour cream,                                                                             
##         whole milk,                                                                                     
##         yogurt}                    => {other vegetables}          0.0011       0.69   0.0016  3.55    11
## [646]  {long life bakery product,                                                                       
##         yogurt}                    => {napkins}                   0.0016       0.19   0.0087  3.55    16
## [647]  {other vegetables,                                                                               
##         root vegetables,                                                                                
##         whipped/sour cream,                                                                             
##         whole milk}                => {tropical fruit}            0.0019       0.37   0.0052  3.55    19
## [648]  {fruit/vegetable juice,                                                                          
##         whipped/sour cream,                                                                             
##         yogurt}                    => {pastry}                    0.0012       0.32   0.0039  3.55    12
## [649]  {bottled water,                                                                                  
##         rolls/buns,                                                                                     
##         shopping bags}             => {sausage}                   0.0010       0.33   0.0031  3.55    10
## [650]  {butter,                                                                                         
##         hard cheese}               => {fruit/vegetable juice}     0.0010       0.26   0.0040  3.55    10
## [651]  {other vegetables,                                                                               
##         whole milk,                                                                                     
##         yogurt}                    => {butter}                    0.0044       0.20   0.0223  3.54    43
## [652]  {soft cheese,                                                                                    
##         whole milk}                => {chocolate}                 0.0013       0.18   0.0075  3.54    13
## [653]  {rolls/buns,                                                                                     
##         root vegetables,                                                                                
##         yogurt}                    => {whipped/sour cream}        0.0018       0.25   0.0072  3.54    18
## [654]  {brown bread,                                                                                    
##         other vegetables,                                                                               
##         tropical fruit}            => {citrus fruit}              0.0012       0.29   0.0042  3.54    12
## [655]  {fruit/vegetable juice,                                                                          
##         pip fruit,                                                                                      
##         root vegetables,                                                                                
##         whole milk}                => {other vegetables}          0.0013       0.68   0.0019  3.54    13
## [656]  {butter,                                                                                         
##         chicken}                   => {chocolate}                 0.0010       0.18   0.0058  3.54    10
## [657]  {pastry,                                                                                         
##         root vegetables}           => {beef}                      0.0020       0.19   0.0110  3.53    20
## [658]  {curd,                                                                                           
##         dessert,                                                                                        
##         whole milk}                => {tropical fruit}            0.0010       0.37   0.0027  3.53    10
## [659]  {chicken,                                                                                        
##         other vegetables,                                                                               
##         pastry}                    => {root vegetables}           0.0010       0.38   0.0026  3.53    10
## [660]  {frankfurter,                                                                                    
##         shopping bags,                                                                                  
##         whole milk}                => {root vegetables}           0.0010       0.38   0.0026  3.53    10
## [661]  {frozen vegetables,                                                                              
##         other vegetables,                                                                               
##         whole milk}                => {whipped/sour cream}        0.0024       0.25   0.0097  3.52    24
## [662]  {other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         whole milk}                => {citrus fruit}              0.0050       0.29   0.0171  3.52    49
## [663]  {cream cheese,                                                                                   
##         whole milk,                                                                                     
##         yogurt}                    => {beef}                      0.0012       0.18   0.0066  3.52    12
## [664]  {pip fruit,                                                                                      
##         white bread}               => {frozen vegetables}         0.0011       0.17   0.0066  3.52    11
## [665]  {curd,                                                                                           
##         domestic eggs,                                                                                  
##         whole milk}                => {root vegetables}           0.0018       0.38   0.0048  3.51    18
## [666]  {rolls/buns,                                                                                     
##         tropical fruit,                                                                                 
##         whole milk,                                                                                     
##         yogurt}                    => {pastry}                    0.0015       0.31   0.0049  3.51    15
## [667]  {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         tropical fruit}            => {chicken}                   0.0014       0.15   0.0095  3.51    14
## [668]  {hygiene articles,                                                                               
##         pork}                      => {root vegetables}           0.0013       0.38   0.0035  3.51    13
## [669]  {frankfurter,                                                                                    
##         other vegetables,                                                                               
##         whole milk}                => {curd}                      0.0014       0.19   0.0076  3.50    14
## [670]  {fruit/vegetable juice,                                                                          
##         yogurt}                    => {frozen vegetables}         0.0032       0.17   0.0187  3.50    31
## [671]  {napkins,                                                                                        
##         root vegetables}           => {beef}                      0.0018       0.18   0.0100  3.50    18
## [672]  {citrus fruit,                                                                                   
##         whipped/sour cream}        => {frozen vegetables}         0.0018       0.17   0.0109  3.50    18
## [673]  {canned vegetables,                                                                              
##         yogurt}                    => {tropical fruit}            0.0011       0.37   0.0031  3.49    11
## [674]  {newspapers,                                                                                     
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk}                => {tropical fruit}            0.0011       0.37   0.0031  3.49    11
## [675]  {pip fruit,                                                                                      
##         waffles}                   => {whipped/sour cream}        0.0011       0.25   0.0045  3.49    11
## [676]  {beef,                                                                                           
##         whole milk,                                                                                     
##         yogurt}                    => {whipped/sour cream}        0.0015       0.25   0.0061  3.49    15
## [677]  {meat,                                                                                           
##         yogurt}                    => {citrus fruit}              0.0015       0.29   0.0053  3.49    15
## [678]  {other vegetables,                                                                               
##         root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         yogurt}                    => {margarine}                 0.0010       0.20   0.0050  3.48    10
## [679]  {citrus fruit,                                                                                   
##         margarine,                                                                                      
##         whole milk}                => {root vegetables}           0.0011       0.38   0.0029  3.48    11
## [680]  {other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         shopping bags}             => {sausage}                   0.0017       0.33   0.0053  3.48    17
## [681]  {candy,                                                                                          
##         yogurt}                    => {curd}                      0.0010       0.19   0.0055  3.48    10
## [682]  {other vegetables,                                                                               
##         whipped/sour cream,                                                                             
##         white bread}               => {yogurt}                    0.0016       0.48   0.0034  3.48    16
## [683]  {chocolate,                                                                                      
##         long life bakery product}  => {butter}                    0.0010       0.19   0.0053  3.47    10
## [684]  {brown bread,                                                                                    
##         rolls/buns,                                                                                     
##         whole milk}                => {butter}                    0.0010       0.19   0.0053  3.47    10
## [685]  {citrus fruit,                                                                                   
##         tropical fruit,                                                                                 
##         whipped/sour cream}        => {yogurt}                    0.0015       0.48   0.0032  3.47    15
## [686]  {citrus fruit,                                                                                   
##         whipped/sour cream,                                                                             
##         yogurt}                    => {root vegetables}           0.0017       0.38   0.0046  3.47    17
## [687]  {margarine,                                                                                      
##         rolls/buns,                                                                                     
##         whole milk}                => {frozen vegetables}         0.0013       0.17   0.0079  3.47    13
## [688]  {other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk}                => {frozen vegetables}         0.0039       0.17   0.0232  3.47    38
## [689]  {tropical fruit,                                                                                 
##         whipped/sour cream,                                                                             
##         yogurt}                    => {root vegetables}           0.0023       0.38   0.0062  3.46    23
## [690]  {candy,                                                                                          
##         shopping bags}             => {fruit/vegetable juice}     0.0011       0.25   0.0045  3.46    11
## [691]  {citrus fruit,                                                                                   
##         pastry,                                                                                         
##         whipped/sour cream}        => {whole milk}                0.0015       0.88   0.0017  3.45    15
## [692]  {berries,                                                                                        
##         sausage}                   => {citrus fruit}              0.0014       0.29   0.0050  3.45    14
## [693]  {berries,                                                                                        
##         whole milk}                => {beef}                      0.0021       0.18   0.0118  3.45    21
## [694]  {brown bread,                                                                                    
##         white bread}               => {pip fruit}                 0.0012       0.26   0.0047  3.45    12
## [695]  {mayonnaise,                                                                                     
##         whipped/sour cream}        => {other vegetables}          0.0010       0.67   0.0015  3.45    10
## [696]  {hamburger meat,                                                                                 
##         herbs}                     => {other vegetables}          0.0010       0.67   0.0015  3.45    10
## [697]  {frankfurter,                                                                                    
##         frozen meals,                                                                                   
##         whole milk}                => {other vegetables}          0.0012       0.67   0.0018  3.45    12
## [698]  {ham,                                                                                            
##         root vegetables,                                                                                
##         whole milk}                => {other vegetables}          0.0014       0.67   0.0021  3.45    14
## [699]  {dessert,                                                                                        
##         whipped/sour cream,                                                                             
##         yogurt}                    => {other vegetables}          0.0014       0.67   0.0021  3.45    14
## [700]  {butter,                                                                                         
##         chicken,                                                                                        
##         whipped/sour cream}        => {other vegetables}          0.0010       0.67   0.0015  3.45    10
## [701]  {butter,                                                                                         
##         curd,                                                                                           
##         whipped/sour cream}        => {other vegetables}          0.0014       0.67   0.0021  3.45    14
## [702]  {bottled beer,                                                                                   
##         bottled water,                                                                                  
##         domestic eggs}             => {other vegetables}          0.0012       0.67   0.0018  3.45    12
## [703]  {onions,                                                                                         
##         rolls/buns,                                                                                     
##         root vegetables,                                                                                
##         whole milk}                => {other vegetables}          0.0010       0.67   0.0015  3.45    10
## [704]  {chicken,                                                                                        
##         root vegetables,                                                                                
##         whole milk,                                                                                     
##         yogurt}                    => {other vegetables}          0.0012       0.67   0.0018  3.45    12
## [705]  {fruit/vegetable juice,                                                                          
##         tropical fruit,                                                                                 
##         whole milk,                                                                                     
##         yogurt}                    => {other vegetables}          0.0018       0.67   0.0027  3.45    18
## [706]  {beef,                                                                                           
##         napkins}                   => {newspapers}                0.0011       0.28   0.0041  3.45    11
## [707]  {pastry,                                                                                         
##         pip fruit,                                                                                      
##         sausage}                   => {yogurt}                    0.0012       0.48   0.0025  3.44    12
## [708]  {bottled water,                                                                                  
##         butter}                    => {root vegetables}           0.0034       0.38   0.0089  3.44    33
## [709]  {cream cheese,                                                                                   
##         domestic eggs}             => {pip fruit}                 0.0013       0.26   0.0051  3.44    13
## [710]  {onions,                                                                                         
##         yogurt}                    => {curd}                      0.0013       0.18   0.0072  3.44    13
## [711]  {other vegetables,                                                                               
##         sliced cheese}             => {napkins}                   0.0016       0.18   0.0090  3.43    16
## [712]  {bottled beer,                                                                                   
##         domestic eggs,                                                                                  
##         whole milk}                => {bottled water}             0.0011       0.38   0.0029  3.43    11
## [713]  {coffee,                                                                                         
##         frozen vegetables,                                                                              
##         whole milk}                => {yogurt}                    0.0011       0.48   0.0023  3.43    11
## [714]  {citrus fruit,                                                                                   
##         curd,                                                                                           
##         tropical fruit}            => {yogurt}                    0.0011       0.48   0.0023  3.43    11
## [715]  {curd,                                                                                           
##         root vegetables,                                                                                
##         yogurt}                    => {domestic eggs}             0.0010       0.22   0.0047  3.43    10
## [716]  {candy,                                                                                          
##         yogurt}                    => {brown bread}               0.0012       0.22   0.0055  3.43    12
## [717]  {fruit/vegetable juice,                                                                          
##         misc. beverages}           => {tropical fruit}            0.0014       0.36   0.0040  3.42    14
## [718]  {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         soda}                      => {pastry}                    0.0014       0.30   0.0047  3.42    14
## [719]  {bottled water,                                                                                  
##         rolls/buns,                                                                                     
##         yogurt}                    => {margarine}                 0.0014       0.20   0.0071  3.41    14
## [720]  {frozen vegetables,                                                                              
##         napkins}                   => {citrus fruit}              0.0013       0.28   0.0047  3.41    13
## [721]  {curd,                                                                                           
##         hard cheese}               => {yogurt}                    0.0010       0.48   0.0021  3.41    10
## [722]  {beef,                                                                                           
##         sliced cheese}             => {yogurt}                    0.0010       0.48   0.0021  3.41    10
## [723]  {bottled water,                                                                                  
##         other vegetables,                                                                               
##         soda,                                                                                           
##         whole milk}                => {yogurt}                    0.0010       0.48   0.0021  3.41    10
## [724]  {pastry,                                                                                         
##         tropical fruit,                                                                                 
##         whole milk}                => {curd}                      0.0012       0.18   0.0067  3.41    12
## [725]  {curd,                                                                                           
##         root vegetables,                                                                                
##         whole milk}                => {yogurt}                    0.0029       0.48   0.0062  3.41    29
## [726]  {hamburger meat,                                                                                 
##         whole milk,                                                                                     
##         yogurt}                    => {citrus fruit}              0.0011       0.28   0.0040  3.41    11
## [727]  {newspapers,                                                                                     
##         rolls/buns,                                                                                     
##         yogurt}                    => {sausage}                   0.0016       0.32   0.0051  3.41    16
## [728]  {other vegetables,                                                                               
##         pastry,                                                                                         
##         yogurt}                    => {fruit/vegetable juice}     0.0016       0.25   0.0066  3.40    16
## [729]  {margarine,                                                                                      
##         soda,                                                                                           
##         yogurt}                    => {tropical fruit}            0.0010       0.36   0.0028  3.40    10
## [730]  {bottled water,                                                                                  
##         soda,                                                                                           
##         whole milk,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0010       0.36   0.0028  3.40    10
## [731]  {root vegetables,                                                                                
##         yogurt}                    => {curd}                      0.0047       0.18   0.0258  3.40    46
## [732]  {meat,                                                                                           
##         pork}                      => {root vegetables}           0.0010       0.37   0.0027  3.40    10
## [733]  {fruit/vegetable juice,                                                                          
##         tropical fruit,                                                                                 
##         whole milk,                                                                                     
##         yogurt}                    => {root vegetables}           0.0010       0.37   0.0027  3.40    10
## [734]  {butter,                                                                                         
##         frozen vegetables}         => {fruit/vegetable juice}     0.0014       0.25   0.0058  3.40    14
## [735]  {bottled water,                                                                                  
##         pork}                      => {beef}                      0.0013       0.18   0.0074  3.39    13
## [736]  {long life bakery product,                                                                       
##         sausage}                   => {fruit/vegetable juice}     0.0013       0.25   0.0054  3.39    13
## [737]  {brown bread,                                                                                    
##         pip fruit}                 => {frankfurter}               0.0015       0.20   0.0076  3.39    15
## [738]  {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         yogurt}                    => {frankfurter}               0.0016       0.20   0.0081  3.39    16
## [739]  {dessert,                                                                                        
##         other vegetables,                                                                               
##         whole milk}                => {fruit/vegetable juice}     0.0012       0.24   0.0050  3.39    12
## [740]  {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         whole milk}                => {margarine}                 0.0024       0.20   0.0123  3.39    24
## [741]  {curd,                                                                                           
##         domestic eggs}             => {butter}                    0.0012       0.19   0.0065  3.38    12
## [742]  {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         whipped/sour cream}        => {citrus fruit}              0.0014       0.28   0.0051  3.38    14
## [743]  {bottled water,                                                                                  
##         pastry,                                                                                         
##         yogurt}                    => {tropical fruit}            0.0011       0.35   0.0032  3.38    11
## [744]  {citrus fruit,                                                                                   
##         UHT-milk}                  => {fruit/vegetable juice}     0.0011       0.24   0.0046  3.38    11
## [745]  {soda,                                                                                           
##         UHT-milk}                  => {bottled water}             0.0028       0.37   0.0076  3.38    28
## [746]  {margarine,                                                                                      
##         sausage}                   => {domestic eggs}             0.0015       0.21   0.0071  3.38    15
## [747]  {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         soda}                      => {sausage}                   0.0013       0.32   0.0042  3.37    13
## [748]  {canned beer,                                                                                    
##         rolls/buns,                                                                                     
##         yogurt}                    => {soda}                      0.0010       0.59   0.0017  3.37    10
## [749]  {tropical fruit,                                                                                 
##         whipped/sour cream,                                                                             
##         whole milk,                                                                                     
##         yogurt}                    => {citrus fruit}              0.0012       0.28   0.0044  3.37    12
## [750]  {hamburger meat,                                                                                 
##         rolls/buns,                                                                                     
##         yogurt}                    => {other vegetables}          0.0015       0.65   0.0023  3.37    15
## [751]  {curd,                                                                                           
##         sausage}                   => {butter}                    0.0014       0.19   0.0076  3.37    14
## [752]  {beef,                                                                                           
##         rolls/buns,                                                                                     
##         whole milk}                => {pork}                      0.0013       0.19   0.0068  3.37    13
## [753]  {whipped/sour cream,                                                                             
##         yogurt}                    => {frozen vegetables}         0.0034       0.16   0.0207  3.36    33
## [754]  {brown bread,                                                                                    
##         citrus fruit,                                                                                   
##         other vegetables}          => {tropical fruit}            0.0012       0.35   0.0035  3.36    12
## [755]  {newspapers,                                                                                     
##         other vegetables,                                                                               
##         whipped/sour cream}        => {yogurt}                    0.0015       0.47   0.0033  3.36    15
## [756]  {semi-finished bread,                                                                            
##         whole milk,                                                                                     
##         yogurt}                    => {other vegetables}          0.0013       0.65   0.0020  3.36    13
## [757]  {salty snack,                                                                                    
##         yogurt}                    => {margarine}                 0.0012       0.20   0.0062  3.36    12
## [758]  {napkins,                                                                                        
##         sausage}                   => {chocolate}                 0.0011       0.17   0.0067  3.36    11
## [759]  {chicken,                                                                                        
##         frankfurter}               => {citrus fruit}              0.0010       0.28   0.0037  3.36    10
## [760]  {cream cheese,                                                                                   
##         root vegetables}           => {napkins}                   0.0013       0.18   0.0075  3.35    13
## [761]  {bottled water,                                                                                  
##         butter,                                                                                         
##         whipped/sour cream}        => {whole milk}                0.0012       0.86   0.0014  3.35    12
## [762]  {citrus fruit,                                                                                   
##         curd,                                                                                           
##         other vegetables,                                                                               
##         yogurt}                    => {whole milk}                0.0012       0.86   0.0014  3.35    12
## [763]  {frozen vegetables,                                                                              
##         other vegetables,                                                                               
##         yogurt}                    => {root vegetables}           0.0019       0.37   0.0053  3.35    19
## [764]  {sausage,                                                                                        
##         tropical fruit,                                                                                 
##         yogurt}                    => {brown bread}               0.0010       0.22   0.0047  3.35    10
## [765]  {newspapers,                                                                                     
##         root vegetables,                                                                                
##         whole milk}                => {pork}                      0.0011       0.19   0.0058  3.35    11
## [766]  {butter,                                                                                         
##         other vegetables,                                                                               
##         root vegetables}           => {citrus fruit}              0.0018       0.28   0.0066  3.35    18
## [767]  {herbs,                                                                                          
##         root vegetables,                                                                                
##         tropical fruit}            => {other vegetables}          0.0011       0.65   0.0017  3.34    11
## [768]  {pip fruit,                                                                                      
##         sugar,                                                                                          
##         yogurt}                    => {other vegetables}          0.0011       0.65   0.0017  3.34    11
## [769]  {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         tropical fruit,                                                                                 
##         whole milk}                => {citrus fruit}              0.0013       0.28   0.0048  3.34    13
## [770]  {root vegetables,                                                                                
##         whipped/sour cream}        => {frozen vegetables}         0.0027       0.16   0.0171  3.34    27
## [771]  {berries,                                                                                        
##         tropical fruit,                                                                                 
##         whole milk}                => {root vegetables}           0.0012       0.36   0.0034  3.34    12
## [772]  {pork,                                                                                           
##         sausage,                                                                                        
##         whole milk}                => {root vegetables}           0.0012       0.36   0.0034  3.34    12
## [773]  {soda,                                                                                           
##         whipped/sour cream,                                                                             
##         yogurt}                    => {tropical fruit}            0.0014       0.35   0.0041  3.34    14
## [774]  {beef,                                                                                           
##         newspapers}                => {napkins}                   0.0011       0.17   0.0064  3.33    11
## [775]  {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         root vegetables,                                                                                
##         whole milk}                => {fruit/vegetable juice}     0.0013       0.24   0.0055  3.33    13
## [776]  {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         whole milk}                => {butter}                    0.0019       0.18   0.0105  3.33    19
## [777]  {curd,                                                                                           
##         sausage}                   => {frozen vegetables}         0.0012       0.16   0.0076  3.33    12
## [778]  {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         root vegetables,                                                                                
##         whipped/sour cream}        => {whole milk}                0.0017       0.85   0.0020  3.33    17
## [779]  {other vegetables,                                                                               
##         whole milk,                                                                                     
##         yogurt}                    => {frozen vegetables}         0.0036       0.16   0.0223  3.32    35
## [780]  {cream cheese,                                                                                   
##         long life bakery product}  => {other vegetables}          0.0018       0.64   0.0028  3.32    18
## [781]  {chocolate,                                                                                      
##         other vegetables}          => {butter}                    0.0023       0.18   0.0127  3.32    23
## [782]  {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         root vegetables}           => {margarine}                 0.0014       0.19   0.0073  3.32    14
## [783]  {hard cheese,                                                                                    
##         sausage}                   => {citrus fruit}              0.0014       0.27   0.0052  3.32    14
## [784]  {other vegetables,                                                                               
##         pork,                                                                                           
##         yogurt}                    => {tropical fruit}            0.0016       0.35   0.0047  3.31    16
## [785]  {domestic eggs,                                                                                  
##         rice}                      => {whole milk}                0.0011       0.85   0.0013  3.31    11
## [786]  {butter milk,                                                                                    
##         sausage,                                                                                        
##         yogurt}                    => {whole milk}                0.0011       0.85   0.0013  3.31    11
## [787]  {brown bread,                                                                                    
##         other vegetables,                                                                               
##         soda,                                                                                           
##         yogurt}                    => {whole milk}                0.0011       0.85   0.0013  3.31    11
## [788]  {dessert,                                                                                        
##         other vegetables,                                                                               
##         yogurt}                    => {sausage}                   0.0014       0.31   0.0046  3.31    14
## [789]  {hamburger meat,                                                                                 
##         whipped/sour cream,                                                                             
##         whole milk}                => {yogurt}                    0.0012       0.46   0.0026  3.31    12
## [790]  {root vegetables,                                                                                
##         white bread,                                                                                    
##         whole milk}                => {yogurt}                    0.0018       0.46   0.0040  3.31    18
## [791]  {butter milk,                                                                                    
##         pip fruit}                 => {other vegetables}          0.0033       0.64   0.0051  3.31    32
## [792]  {hamburger meat,                                                                                 
##         pip fruit,                                                                                      
##         whole milk}                => {other vegetables}          0.0016       0.64   0.0025  3.31    16
## [793]  {root vegetables,                                                                                
##         UHT-milk}                  => {pip fruit}                 0.0012       0.25   0.0049  3.30    12
## [794]  {citrus fruit,                                                                                   
##         cream cheese}              => {pip fruit}                 0.0014       0.25   0.0057  3.30    14
## [795]  {pip fruit,                                                                                      
##         rolls/buns,                                                                                     
##         whole milk}                => {chocolate}                 0.0010       0.16   0.0062  3.30    10
## [796]  {hard cheese,                                                                                    
##         rolls/buns}                => {sausage}                   0.0018       0.31   0.0059  3.30    18
## [797]  {frankfurter,                                                                                    
##         root vegetables,                                                                                
##         whole milk}                => {yogurt}                    0.0023       0.46   0.0051  3.30    23
## [798]  {brown bread,                                                                                    
##         meat}                      => {newspapers}                0.0010       0.26   0.0039  3.30    10
## [799]  {hygiene articles,                                                                               
##         yogurt}                    => {whipped/sour cream}        0.0017       0.24   0.0073  3.29    17
## [800]  {fruit/vegetable juice,                                                                          
##         onions}                    => {yogurt}                    0.0017       0.46   0.0038  3.29    17
## [801]  {butter,                                                                                         
##         frozen vegetables}         => {curd}                      0.0010       0.18   0.0058  3.29    10
## [802]  {bottled water,                                                                                  
##         citrus fruit,                                                                                   
##         whole milk}                => {napkins}                   0.0010       0.17   0.0059  3.29    10
## [803]  {roll products,                                                                                  
##         yogurt}                    => {other vegetables}          0.0014       0.64   0.0022  3.29    14
## [804]  {curd,                                                                                           
##         frankfurter,                                                                                    
##         whole milk}                => {other vegetables}          0.0014       0.64   0.0022  3.29    14
## [805]  {brown bread,                                                                                    
##         citrus fruit,                                                                                   
##         yogurt}                    => {tropical fruit}            0.0010       0.34   0.0029  3.29    10
## [806]  {root vegetables,                                                                                
##         whipped/sour cream,                                                                             
##         whole milk}                => {napkins}                   0.0016       0.17   0.0095  3.29    16
## [807]  {beef,                                                                                           
##         shopping bags}             => {domestic eggs}             0.0010       0.21   0.0049  3.28    10
## [808]  {bottled water,                                                                                  
##         other vegetables,                                                                               
##         rolls/buns}                => {domestic eggs}             0.0015       0.21   0.0073  3.28    15
## [809]  {citrus fruit,                                                                                   
##         fruit/vegetable juice,                                                                          
##         other vegetables}          => {brown bread}               0.0010       0.21   0.0048  3.28    10
## [810]  {bottled water,                                                                                  
##         margarine}                 => {domestic eggs}             0.0021       0.21   0.0103  3.28    21
## [811]  {dessert,                                                                                        
##         other vegetables,                                                                               
##         tropical fruit}            => {root vegetables}           0.0010       0.36   0.0028  3.28    10
## [812]  {curd,                                                                                           
##         tropical fruit,                                                                                 
##         whipped/sour cream}        => {root vegetables}           0.0010       0.36   0.0028  3.28    10
## [813]  {bottled water,                                                                                  
##         curd,                                                                                           
##         whole milk}                => {tropical fruit}            0.0011       0.34   0.0033  3.28    11
## [814]  {frozen vegetables,                                                                              
##         tropical fruit}            => {curd}                      0.0015       0.17   0.0087  3.27    15
## [815]  {frankfurter,                                                                                    
##         tropical fruit}            => {pip fruit}                 0.0023       0.25   0.0095  3.27    23
## [816]  {root vegetables,                                                                                
##         tropical fruit}            => {citrus fruit}              0.0057       0.27   0.0210  3.27    56
## [817]  {hygiene articles,                                                                               
##         yogurt}                    => {fruit/vegetable juice}     0.0017       0.24   0.0073  3.27    17
## [818]  {specialty cheese,                                                                               
##         whole milk}                => {citrus fruit}              0.0010       0.27   0.0038  3.27    10
## [819]  {root vegetables,                                                                                
##         soda,                                                                                           
##         yogurt}                    => {whipped/sour cream}        0.0011       0.23   0.0048  3.26    11
## [820]  {other vegetables,                                                                               
##         root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         whole milk}                => {curd}                      0.0012       0.17   0.0070  3.26    12
## [821]  {bottled water,                                                                                  
##         pork,                                                                                           
##         rolls/buns}                => {other vegetables}          0.0012       0.63   0.0019  3.26    12
## [822]  {domestic eggs,                                                                                  
##         sausage,                                                                                        
##         whipped/sour cream}        => {other vegetables}          0.0012       0.63   0.0019  3.26    12
## [823]  {domestic eggs,                                                                                  
##         herbs,                                                                                          
##         other vegetables}          => {whole milk}                0.0010       0.83   0.0012  3.26    10
## [824]  {detergent,                                                                                      
##         other vegetables,                                                                               
##         whipped/sour cream}        => {whole milk}                0.0010       0.83   0.0012  3.26    10
## [825]  {bottled beer,                                                                                   
##         coffee,                                                                                         
##         yogurt}                    => {whole milk}                0.0010       0.83   0.0012  3.26    10
## [826]  {herbs,                                                                                          
##         other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         root vegetables}           => {whole milk}                0.0010       0.83   0.0012  3.26    10
## [827]  {other vegetables,                                                                               
##         pastry,                                                                                         
##         root vegetables}           => {domestic eggs}             0.0012       0.21   0.0059  3.26    12
## [828]  {root vegetables,                                                                                
##         whipped/sour cream,                                                                             
##         yogurt}                    => {citrus fruit}              0.0017       0.27   0.0064  3.26    17
## [829]  {dessert,                                                                                        
##         pastry,                                                                                         
##         whole milk}                => {yogurt}                    0.0010       0.45   0.0022  3.26    10
## [830]  {margarine,                                                                                      
##         napkins,                                                                                        
##         whole milk}                => {yogurt}                    0.0010       0.45   0.0022  3.26    10
## [831]  {other vegetables,                                                                               
##         waffles,                                                                                        
##         yogurt}                    => {root vegetables}           0.0011       0.35   0.0032  3.26    11
## [832]  {margarine,                                                                                      
##         other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         whole milk}                => {root vegetables}           0.0011       0.35   0.0032  3.26    11
## [833]  {frozen vegetables,                                                                              
##         root vegetables,                                                                                
##         whole milk}                => {butter}                    0.0011       0.18   0.0062  3.25    11
## [834]  {citrus fruit,                                                                                   
##         soda,                                                                                           
##         yogurt}                    => {tropical fruit}            0.0014       0.34   0.0042  3.25    14
## [835]  {fruit/vegetable juice,                                                                          
##         root vegetables,                                                                                
##         whole milk}                => {pork}                      0.0012       0.19   0.0065  3.25    12
## [836]  {chicken}                   => {frozen vegetables}         0.0067       0.16   0.0429  3.25    66
## [837]  {margarine,                                                                                      
##         napkins}                   => {tropical fruit}            0.0015       0.34   0.0045  3.25    15
## [838]  {fruit/vegetable juice,                                                                          
##         pip fruit,                                                                                      
##         yogurt}                    => {other vegetables}          0.0022       0.63   0.0036  3.25    22
## [839]  {pip fruit,                                                                                      
##         sugar}                     => {tropical fruit}            0.0016       0.34   0.0048  3.24    16
## [840]  {butter,                                                                                         
##         white bread}               => {yogurt}                    0.0019       0.45   0.0043  3.24    19
## [841]  {curd,                                                                                           
##         newspapers}                => {whipped/sour cream}        0.0013       0.23   0.0057  3.24    13
## [842]  {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         rolls/buns}                => {margarine}                 0.0011       0.19   0.0059  3.24    11
## [843]  {citrus fruit,                                                                                   
##         curd,                                                                                           
##         other vegetables}          => {yogurt}                    0.0014       0.45   0.0032  3.24    14
## [844]  {beef,                                                                                           
##         whole milk}                => {pork}                      0.0040       0.19   0.0213  3.24    39
## [845]  {chocolate,                                                                                      
##         sausage}                   => {napkins}                   0.0011       0.17   0.0066  3.23    11
## [846]  {other vegetables,                                                                               
##         sliced cheese,                                                                                  
##         whole milk}                => {pip fruit}                 0.0011       0.24   0.0046  3.23    11
## [847]  {hamburger meat,                                                                                 
##         onions}                    => {other vegetables}          0.0015       0.62   0.0024  3.23    15
## [848]  {baking powder,                                                                                  
##         pip fruit,                                                                                      
##         whole milk}                => {other vegetables}          0.0010       0.62   0.0016  3.23    10
## [849]  {frozen vegetables,                                                                              
##         soda,                                                                                           
##         tropical fruit}            => {other vegetables}          0.0010       0.62   0.0016  3.23    10
## [850]  {pastry,                                                                                         
##         pork,                                                                                           
##         soda}                      => {other vegetables}          0.0010       0.62   0.0016  3.23    10
## [851]  {beef,                                                                                           
##         root vegetables,                                                                                
##         soda,                                                                                           
##         whole milk}                => {other vegetables}          0.0010       0.62   0.0016  3.23    10
## [852]  {brown bread,                                                                                    
##         pip fruit,                                                                                      
##         whole milk,                                                                                     
##         yogurt}                    => {other vegetables}          0.0010       0.62   0.0016  3.23    10
## [853]  {frozen vegetables,                                                                              
##         other vegetables,                                                                               
##         root vegetables}           => {fruit/vegetable juice}     0.0014       0.23   0.0061  3.23    14
## [854]  {cream cheese,                                                                                   
##         napkins}                   => {yogurt}                    0.0018       0.45   0.0041  3.23    18
## [855]  {soda,                                                                                           
##         tropical fruit,                                                                                 
##         whole milk}                => {napkins}                   0.0013       0.17   0.0078  3.22    13
## [856]  {herbs,                                                                                          
##         root vegetables,                                                                                
##         whole milk}                => {pip fruit}                 0.0010       0.24   0.0042  3.22    10
## [857]  {frankfurter,                                                                                    
##         other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         yogurt}                    => {whole milk}                0.0014       0.82   0.0017  3.22    14
## [858]  {beef,                                                                                           
##         tropical fruit}            => {citrus fruit}              0.0020       0.27   0.0076  3.22    20
## [859]  {oil,                                                                                            
##         yogurt}                    => {whipped/sour cream}        0.0012       0.23   0.0053  3.22    12
## [860]  {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         root vegetables}           => {whipped/sour cream}        0.0015       0.23   0.0066  3.22    15
## [861]  {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         whole milk}                => {domestic eggs}             0.0010       0.20   0.0050  3.22    10
## [862]  {herbs,                                                                                          
##         tropical fruit}            => {whole milk}                0.0023       0.82   0.0028  3.21    23
## [863]  {pip fruit,                                                                                      
##         rolls/buns,                                                                                     
##         yogurt}                    => {newspapers}                0.0010       0.26   0.0040  3.21    10
## [864]  {frankfurter,                                                                                    
##         other vegetables,                                                                               
##         yogurt}                    => {brown bread}               0.0010       0.21   0.0049  3.21    10
## [865]  {butter,                                                                                         
##         napkins,                                                                                        
##         whole milk}                => {bottled water}             0.0011       0.35   0.0032  3.21    11
## [866]  {bottled water,                                                                                  
##         rolls/buns,                                                                                     
##         soda}                      => {yogurt}                    0.0031       0.45   0.0068  3.21    30
## [867]  {napkins,                                                                                        
##         tropical fruit,                                                                                 
##         whole milk}                => {citrus fruit}              0.0013       0.27   0.0050  3.21    13
## [868]  {hard cheese,                                                                                    
##         yogurt}                    => {root vegetables}           0.0022       0.35   0.0064  3.20    22
## [869]  {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         pip fruit}                 => {root vegetables}           0.0015       0.35   0.0044  3.20    15
## [870]  {other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         whole milk}                => {yogurt}                    0.0076       0.45   0.0171  3.20    75
## [871]  {sausage,                                                                                        
##         tropical fruit,                                                                                 
##         whipped/sour cream}        => {other vegetables}          0.0013       0.62   0.0021  3.20    13
## [872]  {citrus fruit,                                                                                   
##         soda}                      => {chocolate}                 0.0020       0.16   0.0128  3.20    20
## [873]  {brown bread,                                                                                    
##         fruit/vegetable juice}     => {chocolate}                 0.0013       0.16   0.0083  3.20    13
## [874]  {bottled beer,                                                                                   
##         sugar}                     => {bottled water}             0.0012       0.35   0.0035  3.19    12
## [875]  {root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         whole milk}                => {whipped/sour cream}        0.0027       0.23   0.0120  3.19    27
## [876]  {rolls/buns,                                                                                     
##         waffles,                                                                                        
##         whole milk}                => {root vegetables}           0.0016       0.35   0.0047  3.19    16
## [877]  {pip fruit,                                                                                      
##         pork}                      => {other vegetables}          0.0038       0.62   0.0061  3.19    37
## [878]  {frozen meals,                                                                                   
##         pip fruit}                 => {yogurt}                    0.0020       0.44   0.0046  3.19    20
## [879]  {rolls/buns,                                                                                     
##         tropical fruit,                                                                                 
##         whole milk}                => {yogurt}                    0.0049       0.44   0.0110  3.19    48
## [880]  {other vegetables,                                                                               
##         pastry,                                                                                         
##         white bread}               => {soda}                      0.0010       0.56   0.0018  3.19    10
## [881]  {berries,                                                                                        
##         tropical fruit}            => {napkins}                   0.0011       0.17   0.0067  3.18    11
## [882]  {frozen vegetables,                                                                              
##         whole milk,                                                                                     
##         yogurt}                    => {napkins}                   0.0010       0.17   0.0061  3.18    10
## [883]  {chicken,                                                                                        
##         domestic eggs,                                                                                  
##         whole milk}                => {other vegetables}          0.0024       0.62   0.0040  3.18    24
## [884]  {brown bread,                                                                                    
##         pip fruit,                                                                                      
##         yogurt}                    => {other vegetables}          0.0016       0.62   0.0026  3.18    16
## [885]  {curd,                                                                                           
##         margarine,                                                                                      
##         rolls/buns}                => {whole milk}                0.0013       0.81   0.0016  3.18    13
## [886]  {frozen vegetables,                                                                              
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         whipped/sour cream}        => {whole milk}                0.0013       0.81   0.0016  3.18    13
## [887]  {other vegetables,                                                                               
##         pastry,                                                                                         
##         whole milk}                => {pip fruit}                 0.0025       0.24   0.0106  3.18    25
## [888]  {red/blush wine,                                                                                 
##         whole milk}                => {tropical fruit}            0.0013       0.33   0.0040  3.18    13
## [889]  {chicken,                                                                                        
##         root vegetables,                                                                                
##         yogurt}                    => {tropical fruit}            0.0010       0.33   0.0031  3.18    10
## [890]  {chocolate,                                                                                      
##         other vegetables,                                                                               
##         yogurt}                    => {tropical fruit}            0.0012       0.33   0.0037  3.18    12
## [891]  {citrus fruit,                                                                                   
##         whipped/sour cream,                                                                             
##         yogurt}                    => {tropical fruit}            0.0015       0.33   0.0046  3.18    15
## [892]  {pastry,                                                                                         
##         whole milk,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0031       0.33   0.0092  3.18    30
## [893]  {ham,                                                                                            
##         white bread}               => {pip fruit}                 0.0012       0.24   0.0051  3.17    12
## [894]  {sausage,                                                                                        
##         tropical fruit,                                                                                 
##         whole milk}                => {curd}                      0.0012       0.17   0.0072  3.17    12
## [895]  {pork,                                                                                           
##         whole milk,                                                                                     
##         yogurt}                    => {fruit/vegetable juice}     0.0011       0.23   0.0049  3.17    11
## [896]  {pip fruit,                                                                                      
##         sausage,                                                                                        
##         whole milk}                => {root vegetables}           0.0019       0.35   0.0056  3.17    19
## [897]  {cream cheese,                                                                                   
##         tropical fruit}            => {pip fruit}                 0.0017       0.24   0.0072  3.17    17
## [898]  {berries,                                                                                        
##         butter}                    => {sausage}                   0.0011       0.30   0.0038  3.16    11
## [899]  {brown bread,                                                                                    
##         citrus fruit,                                                                                   
##         yogurt}                    => {root vegetables}           0.0010       0.34   0.0029  3.16    10
## [900]  {frozen potato products,                                                                         
##         whole milk}                => {yogurt}                    0.0015       0.44   0.0035  3.16    15
## [901]  {cat food,                                                                                       
##         root vegetables}           => {pip fruit}                 0.0011       0.24   0.0047  3.16    11
## [902]  {other vegetables,                                                                               
##         waffles,                                                                                        
##         whole milk}                => {pip fruit}                 0.0011       0.24   0.0047  3.16    11
## [903]  {cream cheese,                                                                                   
##         pip fruit,                                                                                      
##         root vegetables}           => {other vegetables}          0.0011       0.61   0.0018  3.16    11
## [904]  {coffee,                                                                                         
##         root vegetables,                                                                                
##         tropical fruit}            => {other vegetables}          0.0011       0.61   0.0018  3.16    11
## [905]  {rolls/buns,                                                                                     
##         root vegetables,                                                                                
##         whipped/sour cream,                                                                             
##         yogurt}                    => {other vegetables}          0.0011       0.61   0.0018  3.16    11
## [906]  {frozen vegetables,                                                                              
##         whole milk,                                                                                     
##         yogurt}                    => {coffee}                    0.0011       0.18   0.0061  3.16    11
## [907]  {beef,                                                                                           
##         frankfurter,                                                                                    
##         other vegetables}          => {yogurt}                    0.0011       0.44   0.0025  3.15    11
## [908]  {newspapers,                                                                                     
##         tropical fruit,                                                                                 
##         whole milk}                => {yogurt}                    0.0022       0.44   0.0051  3.15    22
## [909]  {newspapers,                                                                                     
##         other vegetables,                                                                               
##         whipped/sour cream}        => {root vegetables}           0.0011       0.34   0.0033  3.15    11
## [910]  {other vegetables,                                                                               
##         specialty bar}             => {domestic eggs}             0.0011       0.20   0.0056  3.15    11
## [911]  {other vegetables,                                                                               
##         pastry,                                                                                         
##         yogurt}                    => {domestic eggs}             0.0013       0.20   0.0066  3.15    13
## [912]  {napkins,                                                                                        
##         other vegetables,                                                                               
##         whole milk}                => {root vegetables}           0.0023       0.34   0.0068  3.15    23
## [913]  {long life bakery product,                                                                       
##         soda}                      => {pastry}                    0.0021       0.28   0.0076  3.15    21
## [914]  {bottled water,                                                                                  
##         other vegetables,                                                                               
##         whole milk}                => {tropical fruit}            0.0036       0.33   0.0108  3.15    35
## [915]  {bottled beer,                                                                                   
##         tropical fruit,                                                                                 
##         yogurt}                    => {other vegetables}          0.0014       0.61   0.0023  3.15    14
## [916]  {bottled water,                                                                                  
##         root vegetables,                                                                                
##         whole milk,                                                                                     
##         yogurt}                    => {other vegetables}          0.0014       0.61   0.0023  3.15    14
## [917]  {napkins,                                                                                        
##         sausage}                   => {fruit/vegetable juice}     0.0015       0.23   0.0067  3.14    15
## [918]  {sausage,                                                                                        
##         tropical fruit,                                                                                 
##         whole milk}                => {whipped/sour cream}        0.0016       0.23   0.0072  3.14    16
## [919]  {citrus fruit,                                                                                   
##         sausage,                                                                                        
##         yogurt}                    => {root vegetables}           0.0013       0.34   0.0039  3.14    13
## [920]  {dessert,                                                                                        
##         pip fruit,                                                                                      
##         whole milk}                => {other vegetables}          0.0017       0.61   0.0028  3.14    17
## [921]  {bottled beer,                                                                                   
##         other vegetables,                                                                               
##         tropical fruit}            => {yogurt}                    0.0014       0.44   0.0033  3.14    14
## [922]  {instant coffee}            => {frozen vegetables}         0.0011       0.15   0.0074  3.13    11
## [923]  {curd,                                                                                           
##         whipped/sour cream}        => {yogurt}                    0.0046       0.44   0.0105  3.13    45
## [924]  {rolls/buns,                                                                                     
##         white bread}               => {brown bread}               0.0013       0.20   0.0065  3.13    13
## [925]  {butter,                                                                                         
##         curd,                                                                                           
##         tropical fruit,                                                                                 
##         yogurt}                    => {whole milk}                0.0012       0.80   0.0015  3.13    12
## [926]  {citrus fruit,                                                                                   
##         tropical fruit,                                                                                 
##         whipped/sour cream,                                                                             
##         yogurt}                    => {whole milk}                0.0012       0.80   0.0015  3.13    12
## [927]  {sausage,                                                                                        
##         tropical fruit,                                                                                 
##         whole milk}                => {yogurt}                    0.0032       0.44   0.0072  3.13    31
## [928]  {coffee,                                                                                         
##         whipped/sour cream}        => {curd}                      0.0010       0.17   0.0061  3.13    10
## [929]  {beef,                                                                                           
##         berries}                   => {root vegetables}           0.0015       0.34   0.0045  3.13    15
## [930]  {other vegetables,                                                                               
##         pastry,                                                                                         
##         root vegetables}           => {whipped/sour cream}        0.0013       0.22   0.0059  3.13    13
## [931]  {curd,                                                                                           
##         root vegetables,                                                                                
##         whole milk}                => {tropical fruit}            0.0020       0.33   0.0062  3.12    20
## [932]  {pip fruit,                                                                                      
##         whipped/sour cream}        => {other vegetables}          0.0056       0.60   0.0093  3.12    55
## [933]  {bottled water,                                                                                  
##         cream cheese}              => {tropical fruit}            0.0019       0.33   0.0059  3.12    19
## [934]  {citrus fruit,                                                                                   
##         whipped/sour cream,                                                                             
##         whole milk}                => {yogurt}                    0.0027       0.44   0.0063  3.12    27
## [935]  {other vegetables,                                                                               
##         sliced cheese}             => {pip fruit}                 0.0021       0.24   0.0090  3.12    21
## [936]  {frankfurter,                                                                                    
##         yogurt}                    => {beef}                      0.0018       0.16   0.0112  3.12    18
## [937]  {butter,                                                                                         
##         chocolate,                                                                                      
##         other vegetables}          => {yogurt}                    0.0010       0.43   0.0023  3.12    10
## [938]  {butter,                                                                                         
##         citrus fruit,                                                                                   
##         whipped/sour cream}        => {yogurt}                    0.0010       0.43   0.0023  3.12    10
## [939]  {sliced cheese,                                                                                  
##         whole milk}                => {sausage}                   0.0032       0.29   0.0108  3.11    31
## [940]  {butter,                                                                                         
##         whipped/sour cream,                                                                             
##         whole milk}                => {citrus fruit}              0.0017       0.26   0.0067  3.11    17
## [941]  {domestic eggs,                                                                                  
##         root vegetables}           => {beef}                      0.0023       0.16   0.0143  3.11    23
## [942]  {napkins,                                                                                        
##         shopping bags}             => {domestic eggs}             0.0014       0.20   0.0072  3.11    14
## [943]  {bottled water,                                                                                  
##         rolls/buns,                                                                                     
##         shopping bags}             => {yogurt}                    0.0013       0.43   0.0031  3.11    13
## [944]  {butter,                                                                                         
##         napkins}                   => {fruit/vegetable juice}     0.0011       0.22   0.0050  3.11    11
## [945]  {butter,                                                                                         
##         curd,                                                                                           
##         yogurt}                    => {whole milk}                0.0023       0.79   0.0029  3.10    23
## [946]  {hygiene articles,                                                                               
##         sausage}                   => {tropical fruit}            0.0014       0.33   0.0044  3.10    14
## [947]  {brown bread,                                                                                    
##         cat food}                  => {other vegetables}          0.0012       0.60   0.0020  3.10    12
## [948]  {chocolate,                                                                                      
##         frozen vegetables}         => {other vegetables}          0.0015       0.60   0.0025  3.10    15
## [949]  {citrus fruit,                                                                                   
##         margarine,                                                                                      
##         root vegetables}           => {other vegetables}          0.0012       0.60   0.0020  3.10    12
## [950]  {newspapers,                                                                                     
##         soda,                                                                                           
##         tropical fruit}            => {other vegetables}          0.0015       0.60   0.0025  3.10    15
## [951]  {bottled water,                                                                                  
##         root vegetables,                                                                                
##         tropical fruit}            => {whipped/sour cream}        0.0010       0.22   0.0046  3.10    10
## [952]  {margarine,                                                                                      
##         root vegetables}           => {curd}                      0.0018       0.17   0.0111  3.10    18
## [953]  {berries,                                                                                        
##         bottled water}             => {tropical fruit}            0.0013       0.33   0.0041  3.10    13
## [954]  {curd,                                                                                           
##         pastry}                    => {napkins}                   0.0012       0.16   0.0075  3.10    12
## [955]  {other vegetables,                                                                               
##         semi-finished bread}       => {yogurt}                    0.0022       0.43   0.0052  3.09    22
## [956]  {brown bread,                                                                                    
##         newspapers,                                                                                     
##         whole milk}                => {pastry}                    0.0011       0.28   0.0041  3.09    11
## [957]  {oil,                                                                                            
##         root vegetables,                                                                                
##         yogurt}                    => {whole milk}                0.0015       0.79   0.0019  3.09    15
## [958]  {newspapers,                                                                                     
##         sausage,                                                                                        
##         tropical fruit}            => {whole milk}                0.0015       0.79   0.0019  3.09    15
## [959]  {hard cheese,                                                                                    
##         whole milk}                => {napkins}                   0.0016       0.16   0.0101  3.09    16
## [960]  {brown bread,                                                                                    
##         napkins}                   => {citrus fruit}              0.0012       0.26   0.0048  3.08    12
## [961]  {citrus fruit,                                                                                   
##         onions}                    => {brown bread}               0.0011       0.20   0.0056  3.08    11
## [962]  {other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         whipped/sour cream}        => {frankfurter}               0.0014       0.18   0.0078  3.08    14
## [963]  {other vegetables,                                                                               
##         root vegetables,                                                                                
##         sausage}                   => {curd}                      0.0011       0.16   0.0068  3.08    11
## [964]  {brown bread,                                                                                    
##         frozen vegetables}         => {sausage}                   0.0011       0.29   0.0039  3.08    11
## [965]  {chicken,                                                                                        
##         pip fruit}                 => {other vegetables}          0.0028       0.60   0.0048  3.08    28
## [966]  {chicken,                                                                                        
##         citrus fruit}              => {whipped/sour cream}        0.0015       0.22   0.0069  3.08    15
## [967]  {butter,                                                                                         
##         root vegetables,                                                                                
##         sliced cheese}             => {whole milk}                0.0011       0.79   0.0014  3.08    11
## [968]  {curd,                                                                                           
##         sugar,                                                                                          
##         whipped/sour cream}        => {whole milk}                0.0011       0.79   0.0014  3.08    11
## [969]  {other vegetables,                                                                               
##         root vegetables,                                                                                
##         whipped/sour cream,                                                                             
##         white bread}               => {whole milk}                0.0011       0.79   0.0014  3.08    11
## [970]  {domestic eggs,                                                                                  
##         margarine,                                                                                      
##         other vegetables,                                                                               
##         root vegetables}           => {whole milk}                0.0011       0.79   0.0014  3.08    11
## [971]  {beverages,                                                                                      
##         root vegetables}           => {tropical fruit}            0.0010       0.32   0.0032  3.07    10
## [972]  {butter,                                                                                         
##         ham}                       => {tropical fruit}            0.0010       0.32   0.0032  3.07    10
## [973]  {other vegetables,                                                                               
##         sausage,                                                                                        
##         tropical fruit}            => {whipped/sour cream}        0.0013       0.22   0.0060  3.07    13
## [974]  {pastry,                                                                                         
##         root vegetables,                                                                                
##         yogurt}                    => {other vegetables}          0.0022       0.59   0.0038  3.07    22
## [975]  {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         white bread}               => {yogurt}                    0.0012       0.43   0.0028  3.07    12
## [976]  {margarine,                                                                                      
##         pastry,                                                                                         
##         whole milk}                => {yogurt}                    0.0015       0.43   0.0036  3.07    15
## [977]  {soft cheese,                                                                                    
##         yogurt}                    => {tropical fruit}            0.0019       0.32   0.0060  3.07    19
## [978]  {pastry,                                                                                         
##         root vegetables,                                                                                
##         whole milk}                => {pip fruit}                 0.0013       0.23   0.0057  3.07    13
## [979]  {frozen potato products}    => {frankfurter}               0.0015       0.18   0.0084  3.06    15
## [980]  {domestic eggs,                                                                                  
##         whipped/sour cream,                                                                             
##         whole milk}                => {tropical fruit}            0.0018       0.32   0.0057  3.06    18
## [981]  {beef,                                                                                           
##         newspapers,                                                                                     
##         root vegetables}           => {other vegetables}          0.0016       0.59   0.0027  3.06    16
## [982]  {frozen vegetables,                                                                              
##         pip fruit}                 => {frankfurter}               0.0013       0.18   0.0073  3.06    13
## [983]  {domestic eggs,                                                                                  
##         onions}                    => {root vegetables}           0.0016       0.33   0.0049  3.06    16
## [984]  {pork,                                                                                           
##         shopping bags}             => {root vegetables}           0.0021       0.33   0.0064  3.06    21
## [985]  {frozen vegetables,                                                                              
##         tropical fruit,                                                                                 
##         yogurt}                    => {root vegetables}           0.0011       0.33   0.0034  3.06    11
## [986]  {pork,                                                                                           
##         root vegetables,                                                                                
##         whole milk}                => {domestic eggs}             0.0013       0.19   0.0068  3.06    13
## [987]  {pastry,                                                                                         
##         tropical fruit,                                                                                 
##         whole milk,                                                                                     
##         yogurt}                    => {root vegetables}           0.0010       0.33   0.0031  3.06    10
## [988]  {domestic eggs,                                                                                  
##         tropical fruit,                                                                                 
##         whole milk}                => {yogurt}                    0.0029       0.43   0.0069  3.06    29
## [989]  {curd,                                                                                           
##         domestic eggs,                                                                                  
##         tropical fruit}            => {other vegetables}          0.0013       0.59   0.0022  3.05    13
## [990]  {newspapers,                                                                                     
##         pastry,                                                                                         
##         soda}                      => {other vegetables}          0.0013       0.59   0.0022  3.05    13
## [991]  {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         root vegetables}           => {pip fruit}                 0.0015       0.23   0.0066  3.05    15
## [992]  {curd,                                                                                           
##         domestic eggs,                                                                                  
##         whole milk}                => {yogurt}                    0.0020       0.43   0.0048  3.05    20
## [993]  {cream cheese,                                                                                   
##         whipped/sour cream,                                                                             
##         whole milk}                => {other vegetables}          0.0023       0.59   0.0040  3.05    23
## [994]  {salty snack,                                                                                    
##         shopping bags}             => {fruit/vegetable juice}     0.0013       0.22   0.0060  3.05    13
## [995]  {fruit/vegetable juice,                                                                          
##         long life bakery product,                                                                       
##         yogurt}                    => {whole milk}                0.0014       0.78   0.0018  3.04    14
## [996]  {butter,                                                                                         
##         pork,                                                                                           
##         root vegetables}           => {whole milk}                0.0014       0.78   0.0018  3.04    14
## [997]  {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk}                => {pork}                      0.0010       0.18   0.0058  3.04    10
## [998]  {newspapers,                                                                                     
##         root vegetables}           => {napkins}                   0.0018       0.16   0.0115  3.04    18
## [999]  {newspapers,                                                                                     
##         soda,                                                                                           
##         yogurt}                    => {sausage}                   0.0012       0.29   0.0043  3.04    12
## [1000] {shopping bags,                                                                                  
##         soda,                                                                                           
##         yogurt}                    => {sausage}                   0.0012       0.29   0.0043  3.04    12
## [1001] {onions,                                                                                         
##         sugar}                     => {other vegetables}          0.0010       0.59   0.0017  3.04    10
## [1002] {flour,                                                                                          
##         root vegetables,                                                                                
##         yogurt}                    => {other vegetables}          0.0010       0.59   0.0017  3.04    10
## [1003] {curd,                                                                                           
##         frozen vegetables,                                                                              
##         whipped/sour cream}        => {other vegetables}          0.0010       0.59   0.0017  3.04    10
## [1004] {beef,                                                                                           
##         bottled water,                                                                                  
##         tropical fruit}            => {other vegetables}          0.0010       0.59   0.0017  3.04    10
## [1005] {curd,                                                                                           
##         tropical fruit,                                                                                 
##         whipped/sour cream,                                                                             
##         yogurt}                    => {other vegetables}          0.0010       0.59   0.0017  3.04    10
## [1006] {newspapers,                                                                                     
##         rolls/buns,                                                                                     
##         tropical fruit,                                                                                 
##         whole milk}                => {other vegetables}          0.0010       0.59   0.0017  3.04    10
## [1007] {butter,                                                                                         
##         other vegetables,                                                                               
##         whole milk}                => {beef}                      0.0018       0.16   0.0115  3.04    18
## [1008] {frozen meals,                                                                                   
##         soda}                      => {pip fruit}                 0.0014       0.23   0.0062  3.03    14
## [1009] {butter,                                                                                         
##         root vegetables,                                                                                
##         whipped/sour cream,                                                                             
##         whole milk}                => {yogurt}                    0.0011       0.42   0.0026  3.03    11
## [1010] {beef,                                                                                           
##         yogurt}                    => {whipped/sour cream}        0.0025       0.22   0.0117  3.03    25
## [1011] {processed cheese,                                                                               
##         soda}                      => {domestic eggs}             0.0010       0.19   0.0053  3.03    10
## [1012] {brown bread,                                                                                    
##         rolls/buns,                                                                                     
##         whole milk}                => {domestic eggs}             0.0010       0.19   0.0053  3.03    10
## [1013] {sausage,                                                                                        
##         tropical fruit}            => {butter}                    0.0023       0.17   0.0139  3.03    23
## [1014] {root vegetables,                                                                                
##         sugar}                     => {pork}                      0.0011       0.17   0.0064  3.03    11
## [1015] {hygiene articles,                                                                               
##         whole milk}                => {tropical fruit}            0.0041       0.32   0.0128  3.03    40
## [1016] {pork,                                                                                           
##         shopping bags}             => {beef}                      0.0010       0.16   0.0064  3.03    10
## [1017] {curd,                                                                                           
##         dessert}                   => {brown bread}               0.0010       0.20   0.0052  3.02    10
## [1018] {root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         whole milk}                => {other vegetables}          0.0070       0.58   0.0120  3.02    69
## [1019] {pip fruit,                                                                                      
##         salty snack}               => {citrus fruit}              0.0010       0.25   0.0041  3.02    10
## [1020] {beef,                                                                                           
##         brown bread}               => {citrus fruit}              0.0011       0.25   0.0045  3.02    11
## [1021] {beef,                                                                                           
##         frankfurter,                                                                                    
##         yogurt}                    => {rolls/buns}                0.0010       0.56   0.0018  3.02    10
## [1022] {domestic eggs,                                                                                  
##         root vegetables,                                                                                
##         tropical fruit}            => {whole milk}                0.0027       0.77   0.0036  3.02    27
## [1023] {salty snack,                                                                                    
##         whole milk}                => {fruit/vegetable juice}     0.0024       0.22   0.0112  3.02    24
## [1024] {napkins,                                                                                        
##         whole milk,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0019       0.32   0.0061  3.02    19
## [1025] {specialty chocolate,                                                                            
##         tropical fruit}            => {bottled water}             0.0011       0.33   0.0034  3.02    11
## [1026] {frozen vegetables,                                                                              
##         root vegetables,                                                                                
##         tropical fruit}            => {bottled water}             0.0010       0.33   0.0031  3.02    10
## [1027] {bottled beer,                                                                                   
##         rolls/buns,                                                                                     
##         root vegetables}           => {other vegetables}          0.0014       0.58   0.0024  3.01    14
## [1028] {rolls/buns,                                                                                     
##         sausage,                                                                                        
##         whipped/sour cream}        => {other vegetables}          0.0014       0.58   0.0024  3.01    14
## [1029] {domestic eggs,                                                                                  
##         fruit/vegetable juice}     => {pip fruit}                 0.0018       0.23   0.0080  3.01    18
## [1030] {roll products,                                                                                  
##         sugar}                     => {whole milk}                0.0010       0.77   0.0013  3.01    10
## [1031] {long life bakery product,                                                                       
##         newspapers,                                                                                     
##         tropical fruit}            => {whole milk}                0.0010       0.77   0.0013  3.01    10
## [1032] {dessert,                                                                                        
##         pip fruit,                                                                                      
##         sausage}                   => {whole milk}                0.0010       0.77   0.0013  3.01    10
## [1033] {other vegetables,                                                                               
##         root vegetables,                                                                                
##         sliced cheese,                                                                                  
##         whipped/sour cream}        => {whole milk}                0.0010       0.77   0.0013  3.01    10
## [1034] {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         pork,                                                                                           
##         root vegetables}           => {whole milk}                0.0010       0.77   0.0013  3.01    10
## [1035] {root vegetables,                                                                                
##         waffles,                                                                                        
##         whole milk}                => {tropical fruit}            0.0012       0.32   0.0039  3.01    12
## [1036] {fruit/vegetable juice,                                                                          
##         whipped/sour cream,                                                                             
##         yogurt}                    => {tropical fruit}            0.0012       0.32   0.0039  3.01    12
## [1037] {root vegetables,                                                                                
##         sugar}                     => {coffee}                    0.0011       0.17   0.0064  3.01    11
## [1038] {margarine,                                                                                      
##         whole milk,                                                                                     
##         yogurt}                    => {fruit/vegetable juice}     0.0015       0.22   0.0070  3.01    15
## [1039] {soda,                                                                                           
##         tropical fruit,                                                                                 
##         yogurt}                    => {whipped/sour cream}        0.0014       0.22   0.0066  3.00    14
## [1040] {domestic eggs,                                                                                  
##         shopping bags}             => {napkins}                   0.0014       0.16   0.0090  3.00    14
## [1041] {napkins,                                                                                        
##         onions}                    => {other vegetables}          0.0018       0.58   0.0032  3.00    18
## [1042] {fruit/vegetable juice,                                                                          
##         pip fruit,                                                                                      
##         tropical fruit}            => {other vegetables}          0.0018       0.58   0.0032  3.00    18
## [1043] {frozen meals,                                                                                   
##         whole milk}                => {pip fruit}                 0.0022       0.23   0.0099  3.00    22
## [1044] {butter,                                                                                         
##         citrus fruit,                                                                                   
##         whole milk}                => {other vegetables}          0.0029       0.58   0.0051  3.00    29
## [1045] {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         whipped/sour cream,                                                                             
##         whole milk}                => {tropical fruit}            0.0011       0.31   0.0036  3.00    11
## [1046] {other vegetables,                                                                               
##         sugar}                     => {pip fruit}                 0.0024       0.23   0.0108  2.99    24
## [1047] {other vegetables,                                                                               
##         root vegetables,                                                                                
##         white bread,                                                                                    
##         yogurt}                    => {whole milk}                0.0013       0.76   0.0017  2.99    13
## [1048] {butter,                                                                                         
##         domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         yogurt}                    => {whole milk}                0.0013       0.76   0.0017  2.99    13
## [1049] {bottled water,                                                                                  
##         butter,                                                                                         
##         domestic eggs}             => {other vegetables}          0.0011       0.58   0.0019  2.99    11
## [1050] {citrus fruit,                                                                                   
##         pastry,                                                                                         
##         sausage}                   => {other vegetables}          0.0011       0.58   0.0019  2.99    11
## [1051] {curd,                                                                                           
##         dessert}                   => {tropical fruit}            0.0016       0.31   0.0052  2.99    16
## [1052] {ham,                                                                                            
##         whole milk}                => {curd}                      0.0018       0.16   0.0115  2.99    18
## [1053] {semi-finished bread,                                                                            
##         whipped/sour cream}        => {yogurt}                    0.0010       0.42   0.0024  2.99    10
## [1054] {hygiene articles,                                                                               
##         white bread}               => {yogurt}                    0.0010       0.42   0.0024  2.99    10
## [1055] {other vegetables,                                                                               
##         soda,                                                                                           
##         whipped/sour cream}        => {yogurt}                    0.0020       0.42   0.0049  2.99    20
## [1056] {butter milk,                                                                                    
##         whipped/sour cream}        => {whole milk}                0.0029       0.76   0.0039  2.99    29
## [1057] {domestic eggs,                                                                                  
##         margarine,                                                                                      
##         whole milk}                => {fruit/vegetable juice}     0.0011       0.22   0.0052  2.98    11
## [1058] {newspapers,                                                                                     
##         other vegetables,                                                                               
##         soda}                      => {pastry}                    0.0013       0.27   0.0050  2.98    13
## [1059] {dessert,                                                                                        
##         whipped/sour cream,                                                                             
##         whole milk}                => {other vegetables}          0.0015       0.58   0.0026  2.98    15
## [1060] {butter,                                                                                         
##         whipped/sour cream,                                                                             
##         whole milk,                                                                                     
##         yogurt}                    => {other vegetables}          0.0015       0.58   0.0026  2.98    15
## [1061] {coffee,                                                                                         
##         yogurt}                    => {tropical fruit}            0.0031       0.31   0.0098  2.98    30
## [1062] {long life bakery product,                                                                       
##         whipped/sour cream,                                                                             
##         whole milk}                => {tropical fruit}            0.0010       0.31   0.0033  2.98    10
## [1063] {beef,                                                                                           
##         tropical fruit}            => {whipped/sour cream}        0.0016       0.21   0.0076  2.98    16
## [1064] {pickled vegetables,                                                                             
##         tropical fruit}            => {root vegetables}           0.0012       0.32   0.0038  2.98    12
## [1065] {other vegetables,                                                                               
##         shopping bags,                                                                                  
##         yogurt}                    => {domestic eggs}             0.0010       0.19   0.0054  2.97    10
## [1066] {domestic eggs,                                                                                  
##         pip fruit}                 => {butter}                    0.0014       0.16   0.0086  2.97    14
## [1067] {other vegetables,                                                                               
##         pork,                                                                                           
##         root vegetables}           => {domestic eggs}             0.0013       0.19   0.0070  2.97    13
## [1068] {butter,                                                                                         
##         domestic eggs,                                                                                  
##         yogurt}                    => {whole milk}                0.0022       0.76   0.0029  2.97    22
## [1069] {beef,                                                                                           
##         frankfurter}               => {whipped/sour cream}        0.0010       0.21   0.0048  2.97    10
## [1070] {citrus fruit,                                                                                   
##         sausage,                                                                                        
##         whole milk}                => {pip fruit}                 0.0011       0.22   0.0050  2.97    11
## [1071] {chicken,                                                                                        
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk}                => {yogurt}                    0.0012       0.41   0.0029  2.97    12
## [1072] {frankfurter,                                                                                    
##         soft cheese}               => {rolls/buns}                0.0012       0.55   0.0022  2.97    12
## [1073] {domestic eggs,                                                                                  
##         pip fruit,                                                                                      
##         whole milk}                => {citrus fruit}              0.0013       0.25   0.0054  2.96    13
## [1074] {dessert,                                                                                        
##         sausage}                   => {pip fruit}                 0.0013       0.22   0.0059  2.96    13
## [1075] {newspapers,                                                                                     
##         sliced cheese}             => {root vegetables}           0.0010       0.32   0.0032  2.96    10
## [1076] {butter,                                                                                         
##         sugar}                     => {root vegetables}           0.0010       0.32   0.0032  2.96    10
## [1077] {fruit/vegetable juice,                                                                          
##         ham}                       => {pastry}                    0.0010       0.26   0.0039  2.96    10
## [1078] {curd,                                                                                           
##         pip fruit,                                                                                      
##         yogurt}                    => {pastry}                    0.0010       0.26   0.0039  2.96    10
## [1079] {butter,                                                                                         
##         root vegetables}           => {curd}                      0.0020       0.16   0.0129  2.96    20
## [1080] {bottled water,                                                                                  
##         pip fruit}                 => {margarine}                 0.0018       0.17   0.0106  2.96    18
## [1081] {bottled beer,                                                                                   
##         hamburger meat}            => {other vegetables}          0.0012       0.57   0.0021  2.95    12
## [1082] {chicken,                                                                                        
##         tropical fruit}            => {other vegetables}          0.0037       0.57   0.0064  2.95    36
## [1083] {bottled water,                                                                                  
##         napkins,                                                                                        
##         root vegetables}           => {other vegetables}          0.0012       0.57   0.0021  2.95    12
## [1084] {butter,                                                                                         
##         root vegetables,                                                                                
##         soda}                      => {other vegetables}          0.0012       0.57   0.0021  2.95    12
## [1085] {domestic eggs,                                                                                  
##         whole milk}                => {margarine}                 0.0052       0.17   0.0300  2.95    51
## [1086] {napkins,                                                                                        
##         white bread}               => {yogurt}                    0.0014       0.41   0.0035  2.95    14
## [1087] {other vegetables,                                                                               
##         soft cheese}               => {curd}                      0.0011       0.16   0.0071  2.95    11
## [1088] {onions,                                                                                         
##         tropical fruit}            => {root vegetables}           0.0018       0.32   0.0057  2.95    18
## [1089] {pip fruit,                                                                                      
##         sausage,                                                                                        
##         whole milk}                => {tropical fruit}            0.0017       0.31   0.0056  2.95    17
## [1090] {baking powder}             => {margarine}                 0.0031       0.17   0.0177  2.94    30
## [1091] {chocolate,                                                                                      
##         rolls/buns,                                                                                     
##         soda}                      => {bottled water}             0.0013       0.33   0.0041  2.94    13
## [1092] {frankfurter,                                                                                    
##         rolls/buns,                                                                                     
##         whole milk}                => {pork}                      0.0010       0.17   0.0060  2.94    10
## [1093] {tropical fruit,                                                                                 
##         whipped/sour cream,                                                                             
##         whole milk}                => {napkins}                   0.0012       0.15   0.0079  2.94    12
## [1094] {cream cheese,                                                                                   
##         whipped/sour cream}        => {pip fruit}                 0.0014       0.22   0.0064  2.94    14
## [1095] {bottled water,                                                                                  
##         turkey}                    => {whole milk}                0.0012       0.75   0.0016  2.94    12
## [1096] {long life bakery product,                                                                       
##         pickled vegetables}        => {whole milk}                0.0012       0.75   0.0016  2.94    12
## [1097] {cream cheese,                                                                                   
##         other vegetables,                                                                               
##         pork}                      => {whole milk}                0.0012       0.75   0.0016  2.94    12
## [1098] {chicken,                                                                                        
##         domestic eggs,                                                                                  
##         root vegetables}           => {whole milk}                0.0018       0.75   0.0024  2.94    18
## [1099] {fruit/vegetable juice,                                                                          
##         pastry,                                                                                         
##         sausage}                   => {whole milk}                0.0012       0.75   0.0016  2.94    12
## [1100] {pip fruit,                                                                                      
##         root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         yogurt}                    => {whole milk}                0.0018       0.75   0.0024  2.94    18
## [1101] {processed cheese,                                                                               
##         soda}                      => {tropical fruit}            0.0016       0.31   0.0053  2.93    16
## [1102] {tropical fruit,                                                                                 
##         white bread}               => {domestic eggs}             0.0016       0.19   0.0087  2.93    16
## [1103] {domestic eggs,                                                                                  
##         rolls/buns}                => {butter}                    0.0025       0.16   0.0157  2.93    25
## [1104] {other vegetables,                                                                               
##         sausage,                                                                                        
##         whole milk}                => {brown bread}               0.0019       0.19   0.0102  2.93    19
## [1105] {soda,                                                                                           
##         white bread,                                                                                    
##         whole milk}                => {sausage}                   0.0011       0.28   0.0041  2.93    11
## [1106] {specialty chocolate,                                                                            
##         whole milk}                => {brown bread}               0.0015       0.19   0.0080  2.93    15
## [1107] {frozen vegetables,                                                                              
##         fruit/vegetable juice}     => {curd}                      0.0012       0.16   0.0078  2.93    12
## [1108] {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         rolls/buns}                => {frankfurter}               0.0010       0.17   0.0059  2.92    10
## [1109] {butter,                                                                                         
##         pip fruit,                                                                                      
##         yogurt}                    => {other vegetables}          0.0013       0.57   0.0023  2.92    13
## [1110] {frozen vegetables,                                                                              
##         root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         whole milk}                => {other vegetables}          0.0013       0.57   0.0023  2.92    13
## [1111] {beef,                                                                                           
##         domestic eggs}             => {coffee}                    0.0010       0.17   0.0060  2.92    10
## [1112] {chicken,                                                                                        
##         other vegetables}          => {root vegetables}           0.0057       0.32   0.0179  2.92    56
## [1113] {newspapers,                                                                                     
##         other vegetables,                                                                               
##         soda}                      => {tropical fruit}            0.0015       0.31   0.0050  2.92    15
## [1114] {bottled water,                                                                                  
##         soda,                                                                                           
##         yogurt}                    => {sausage}                   0.0020       0.27   0.0074  2.92    20
## [1115] {frozen vegetables,                                                                              
##         sausage}                   => {pip fruit}                 0.0013       0.22   0.0060  2.91    13
## [1116] {brown bread,                                                                                    
##         other vegetables,                                                                               
##         whole milk}                => {domestic eggs}             0.0017       0.18   0.0094  2.91    17
## [1117] {long life bakery product,                                                                       
##         other vegetables,                                                                               
##         yogurt}                    => {tropical fruit}            0.0011       0.31   0.0037  2.91    11
## [1118] {pip fruit,                                                                                      
##         tropical fruit,                                                                                 
##         whole milk}                => {citrus fruit}              0.0020       0.24   0.0084  2.91    20
## [1119] {chicken,                                                                                        
##         whole milk}                => {pork}                      0.0029       0.17   0.0176  2.91    29
## [1120] {napkins,                                                                                        
##         other vegetables}          => {root vegetables}           0.0046       0.32   0.0144  2.91    45
## [1121] {fruit/vegetable juice,                                                                          
##         soda,                                                                                           
##         whole milk}                => {root vegetables}           0.0019       0.32   0.0061  2.91    19
## [1122] {bottled beer,                                                                                   
##         tropical fruit}            => {bottled water}             0.0026       0.32   0.0082  2.90    26
## [1123] {bottled beer,                                                                                   
##         frozen vegetables}         => {yogurt}                    0.0017       0.40   0.0043  2.90    17
## [1124] {long life bakery product,                                                                       
##         tropical fruit}            => {fruit/vegetable juice}     0.0013       0.21   0.0063  2.90    13
## [1125] {beef,                                                                                           
##         whipped/sour cream}        => {other vegetables}          0.0038       0.56   0.0067  2.90    37
## [1126] {grapes,                                                                                         
##         other vegetables,                                                                               
##         whole milk}                => {root vegetables}           0.0012       0.32   0.0039  2.90    12
## [1127] {cream cheese,                                                                                   
##         domestic eggs}             => {other vegetables}          0.0028       0.56   0.0051  2.89    28
## [1128] {domestic eggs,                                                                                  
##         margarine,                                                                                      
##         root vegetables}           => {other vegetables}          0.0014       0.56   0.0025  2.89    14
## [1129] {baking powder,                                                                                  
##         other vegetables,                                                                               
##         yogurt}                    => {whole milk}                0.0017       0.74   0.0023  2.89    17
## [1130] {butter,                                                                                         
##         other vegetables,                                                                               
##         white bread}               => {whole milk}                0.0017       0.74   0.0023  2.89    17
## [1131] {beef,                                                                                           
##         whole milk,                                                                                     
##         yogurt}                    => {pork}                      0.0010       0.17   0.0061  2.89    10
## [1132] {bottled water,                                                                                  
##         other vegetables,                                                                               
##         rolls/buns}                => {pork}                      0.0012       0.17   0.0073  2.89    12
## [1133] {cream cheese,                                                                                   
##         margarine}                 => {citrus fruit}              0.0011       0.24   0.0047  2.89    11
## [1134] {margarine,                                                                                      
##         root vegetables,                                                                                
##         yogurt}                    => {other vegetables}          0.0019       0.56   0.0035  2.89    19
## [1135] {newspapers,                                                                                     
##         other vegetables,                                                                               
##         sausage}                   => {tropical fruit}            0.0010       0.30   0.0034  2.89    10
## [1136] {chocolate,                                                                                      
##         sausage}                   => {curd}                      0.0010       0.15   0.0066  2.89    10
## [1137] {sausage,                                                                                        
##         whole milk}                => {butter}                    0.0048       0.16   0.0299  2.88    47
## [1138] {herbs,                                                                                          
##         whole milk}                => {tropical fruit}            0.0023       0.30   0.0077  2.88    23
## [1139] {butter,                                                                                         
##         domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         root vegetables}           => {whole milk}                0.0014       0.74   0.0019  2.88    14
## [1140] {butter,                                                                                         
##         waffles}                   => {root vegetables}           0.0011       0.31   0.0036  2.88    11
## [1141] {pip fruit,                                                                                      
##         root vegetables,                                                                                
##         yogurt}                    => {other vegetables}          0.0029       0.56   0.0053  2.88    29
## [1142] {other vegetables,                                                                               
##         soda,                                                                                           
##         white bread}               => {pastry}                    0.0010       0.26   0.0040  2.88    10
## [1143] {mustard,                                                                                        
##         whole milk}                => {root vegetables}           0.0016       0.31   0.0052  2.88    16
## [1144] {curd,                                                                                           
##         rolls/buns,                                                                                     
##         yogurt}                    => {whole milk}                0.0025       0.74   0.0035  2.88    25
## [1145] {pastry,                                                                                         
##         rolls/buns,                                                                                     
##         whole milk}                => {citrus fruit}              0.0020       0.24   0.0085  2.88    20
## [1146] {bottled water,                                                                                  
##         whole milk,                                                                                     
##         yogurt}                    => {margarine}                 0.0016       0.17   0.0097  2.88    16
## [1147] {fruit/vegetable juice,                                                                          
##         napkins}                   => {whipped/sour cream}        0.0014       0.21   0.0069  2.87    14
## [1148] {roll products,                                                                                  
##         whipped/sour cream}        => {other vegetables}          0.0010       0.56   0.0018  2.87    10
## [1149] {brown bread,                                                                                    
##         ham,                                                                                            
##         whole milk}                => {other vegetables}          0.0010       0.56   0.0018  2.87    10
## [1150] {domestic eggs,                                                                                  
##         oil,                                                                                            
##         whole milk}                => {other vegetables}          0.0010       0.56   0.0018  2.87    10
## [1151] {domestic eggs,                                                                                  
##         frankfurter,                                                                                    
##         root vegetables}           => {other vegetables}          0.0010       0.56   0.0018  2.87    10
## [1152] {domestic eggs,                                                                                  
##         margarine,                                                                                      
##         pip fruit}                 => {other vegetables}          0.0010       0.56   0.0018  2.87    10
## [1153] {other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         whole milk}                => {butter}                    0.0028       0.16   0.0179  2.87    28
## [1154] {bottled water,                                                                                  
##         butter,                                                                                         
##         whole milk}                => {fruit/vegetable juice}     0.0011       0.21   0.0054  2.87    11
## [1155] {butter milk,                                                                                    
##         cream cheese,                                                                                   
##         yogurt}                    => {whole milk}                0.0011       0.73   0.0015  2.87    11
## [1156] {citrus fruit,                                                                                   
##         hamburger meat,                                                                                 
##         yogurt}                    => {whole milk}                0.0011       0.73   0.0015  2.87    11
## [1157] {butter,                                                                                         
##         tropical fruit,                                                                                 
##         yogurt}                    => {whole milk}                0.0034       0.73   0.0046  2.87    33
## [1158] {onions,                                                                                         
##         other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         yogurt}                    => {whole milk}                0.0011       0.73   0.0015  2.87    11
## [1159] {other vegetables,                                                                               
##         white bread}               => {fruit/vegetable juice}     0.0028       0.21   0.0137  2.87    28
## [1160] {root vegetables,                                                                                
##         turkey}                    => {yogurt}                    0.0010       0.40   0.0025  2.87    10
## [1161] {butter,                                                                                         
##         onions}                    => {yogurt}                    0.0016       0.40   0.0041  2.87    16
## [1162] {waffles,                                                                                        
##         whipped/sour cream}        => {yogurt}                    0.0020       0.40   0.0051  2.87    20
## [1163] {chocolate,                                                                                      
##         other vegetables,                                                                               
##         rolls/buns}                => {soda}                      0.0019       0.50   0.0039  2.87    19
## [1164] {frankfurter,                                                                                    
##         other vegetables,                                                                               
##         rolls/buns}                => {yogurt}                    0.0022       0.40   0.0056  2.87    22
## [1165] {beef,                                                                                           
##         root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         whole milk}                => {yogurt}                    0.0010       0.40   0.0025  2.87    10
## [1166] {citrus fruit,                                                                                   
##         flour}                     => {root vegetables}           0.0010       0.31   0.0033  2.87    10
## [1167] {sausage,                                                                                        
##         white bread}               => {frankfurter}               0.0012       0.17   0.0072  2.87    12
## [1168] {rolls/buns,                                                                                     
##         whipped/sour cream,                                                                             
##         whole milk}                => {domestic eggs}             0.0014       0.18   0.0078  2.87    14
## [1169] {long life bakery product,                                                                       
##         rolls/buns}                => {whipped/sour cream}        0.0016       0.21   0.0079  2.86    16
## [1170] {newspapers,                                                                                     
##         pip fruit,                                                                                      
##         yogurt}                    => {rolls/buns}                0.0010       0.53   0.0019  2.86    10
## [1171] {candy,                                                                                          
##         rolls/buns}                => {tropical fruit}            0.0021       0.30   0.0071  2.86    21
## [1172] {butter,                                                                                         
##         whipped/sour cream}        => {tropical fruit}            0.0031       0.30   0.0102  2.86    30
## [1173] {bottled water,                                                                                  
##         frozen vegetables}         => {root vegetables}           0.0019       0.31   0.0062  2.86    19
## [1174] {sliced cheese,                                                                                  
##         whipped/sour cream}        => {other vegetables}          0.0021       0.55   0.0039  2.86    21
## [1175] {pork,                                                                                           
##         whipped/sour cream,                                                                             
##         whole milk}                => {root vegetables}           0.0014       0.31   0.0046  2.85    14
## [1176] {butter,                                                                                         
##         pip fruit}                 => {citrus fruit}              0.0017       0.24   0.0073  2.85    17
## [1177] {pip fruit,                                                                                      
##         root vegetables,                                                                                
##         whole milk}                => {yogurt}                    0.0036       0.40   0.0089  2.85    35
## [1178] {whipped/sour cream,                                                                             
##         yogurt}                    => {tropical fruit}            0.0062       0.30   0.0207  2.85    61
## [1179] {other vegetables,                                                                               
##         root vegetables,                                                                                
##         shopping bags}             => {pip fruit}                 0.0014       0.22   0.0066  2.85    14
## [1180] {fruit/vegetable juice,                                                                          
##         root vegetables}           => {other vegetables}          0.0066       0.55   0.0120  2.85    65
## [1181] {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         root vegetables}           => {brown bread}               0.0012       0.18   0.0066  2.85    12
## [1182] {butter,                                                                                         
##         citrus fruit}              => {margarine}                 0.0015       0.17   0.0092  2.85    15
## [1183] {detergent,                                                                                      
##         tropical fruit,                                                                                 
##         whole milk}                => {other vegetables}          0.0011       0.55   0.0020  2.84    11
## [1184] {pip fruit,                                                                                      
##         waffles,                                                                                        
##         whole milk}                => {other vegetables}          0.0011       0.55   0.0020  2.84    11
## [1185] {beef,                                                                                           
##         other vegetables,                                                                               
##         rolls/buns}                => {tropical fruit}            0.0017       0.30   0.0058  2.84    17
## [1186] {other vegetables,                                                                               
##         whole milk}                => {root vegetables}           0.0232       0.31   0.0748  2.84   228
## [1187] {bottled beer,                                                                                   
##         pork}                      => {bottled water}             0.0016       0.31   0.0052  2.84    16
## [1188] {curd,                                                                                           
##         whipped/sour cream,                                                                             
##         yogurt}                    => {sausage}                   0.0012       0.27   0.0046  2.84    12
## [1189] {napkins,                                                                                        
##         root vegetables}           => {citrus fruit}              0.0023       0.23   0.0100  2.84    23
## [1190] {chicken,                                                                                        
##         citrus fruit,                                                                                   
##         whole milk}                => {other vegetables}          0.0017       0.55   0.0032  2.83    17
## [1191] {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         sausage}                   => {tropical fruit}            0.0011       0.30   0.0038  2.83    11
## [1192] {pork,                                                                                           
##         tropical fruit}            => {pip fruit}                 0.0018       0.21   0.0085  2.83    18
## [1193] {berries,                                                                                        
##         domestic eggs}             => {yogurt}                    0.0015       0.39   0.0039  2.83    15
## [1194] {pork,                                                                                           
##         tropical fruit,                                                                                 
##         whole milk}                => {yogurt}                    0.0015       0.39   0.0039  2.83    15
## [1195] {bottled water,                                                                                  
##         chocolate,                                                                                      
##         soda}                      => {rolls/buns}                0.0013       0.52   0.0025  2.83    13
## [1196] {sliced cheese,                                                                                  
##         soft cheese}               => {whole milk}                0.0013       0.72   0.0018  2.83    13
## [1197] {bottled beer,                                                                                   
##         other vegetables,                                                                               
##         yogurt}                    => {whole milk}                0.0026       0.72   0.0037  2.83    26
## [1198] {curd,                                                                                           
##         root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         yogurt}                    => {whole milk}                0.0013       0.72   0.0018  2.83    13
## [1199] {hard cheese,                                                                                    
##         napkins}                   => {yogurt}                    0.0013       0.39   0.0034  2.82    13
## [1200] {chicken,                                                                                        
##         domestic eggs,                                                                                  
##         other vegetables}          => {yogurt}                    0.0013       0.39   0.0034  2.82    13
## [1201] {chocolate,                                                                                      
##         rolls/buns,                                                                                     
##         whole milk}                => {fruit/vegetable juice}     0.0010       0.20   0.0050  2.82    10
## [1202] {packaged fruit/vegetables,                                                                      
##         whole milk}                => {root vegetables}           0.0012       0.31   0.0040  2.82    12
## [1203] {domestic eggs,                                                                                  
##         sausage}                   => {whipped/sour cream}        0.0019       0.20   0.0096  2.82    19
## [1204] {chocolate,                                                                                      
##         domestic eggs}             => {shopping bags}             0.0010       0.28   0.0037  2.82    10
## [1205] {hygiene articles,                                                                               
##         margarine,                                                                                      
##         whole milk}                => {other vegetables}          0.0012       0.55   0.0022  2.82    12
## [1206] {butter,                                                                                         
##         frozen vegetables,                                                                              
##         yogurt}                    => {other vegetables}          0.0012       0.55   0.0022  2.82    12
## [1207] {curd,                                                                                           
##         onions}                    => {whole milk}                0.0018       0.72   0.0025  2.82    18
## [1208] {domestic eggs,                                                                                  
##         fruit/vegetable juice,                                                                          
##         root vegetables}           => {whole milk}                0.0018       0.72   0.0025  2.82    18
## [1209] {roll products}             => {root vegetables}           0.0032       0.31   0.0103  2.82    31
## [1210] {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         soda}                      => {tropical fruit}            0.0013       0.30   0.0045  2.82    13
## [1211] {other vegetables,                                                                               
##         soda,                                                                                           
##         whole milk}                => {brown bread}               0.0025       0.18   0.0139  2.81    25
## [1212] {fruit/vegetable juice,                                                                          
##         sugar}                     => {pip fruit}                 0.0010       0.21   0.0048  2.81    10
## [1213] {margarine,                                                                                      
##         tropical fruit,                                                                                 
##         yogurt}                    => {pastry}                    0.0010       0.25   0.0041  2.81    10
## [1214] {citrus fruit,                                                                                   
##         soda,                                                                                           
##         whole milk}                => {pastry}                    0.0011       0.25   0.0045  2.81    11
## [1215] {liquor (appetizer)}        => {canned beer}               0.0017       0.22   0.0079  2.81    17
## [1216] {butter milk,                                                                                    
##         fruit/vegetable juice}     => {yogurt}                    0.0018       0.39   0.0047  2.81    18
## [1217] {fruit/vegetable juice,                                                                          
##         tropical fruit,                                                                                 
##         whole milk}                => {other vegetables}          0.0033       0.54   0.0060  2.80    32
## [1218] {fruit/vegetable juice,                                                                          
##         napkins}                   => {tropical fruit}            0.0020       0.29   0.0069  2.80    20
## [1219] {fruit/vegetable juice,                                                                          
##         root vegetables,                                                                                
##         whole milk}                => {yogurt}                    0.0025       0.39   0.0065  2.80    25
## [1220] {butter,                                                                                         
##         grapes}                    => {other vegetables}          0.0013       0.54   0.0024  2.80    13
## [1221] {rolls/buns,                                                                                     
##         sausage,                                                                                        
##         yogurt}                    => {root vegetables}           0.0018       0.31   0.0060  2.80    18
## [1222] {onions}                    => {root vegetables}           0.0095       0.30   0.0310  2.80    93
## [1223] {frozen vegetables,                                                                              
##         rice}                      => {whole milk}                0.0010       0.71   0.0014  2.80    10
## [1224] {butter,                                                                                         
##         pot plants}                => {whole milk}                0.0010       0.71   0.0014  2.80    10
## [1225] {bottled water,                                                                                  
##         herbs,                                                                                          
##         other vegetables}          => {whole milk}                0.0010       0.71   0.0014  2.80    10
## [1226] {fruit/vegetable juice,                                                                          
##         grapes,                                                                                         
##         other vegetables}          => {whole milk}                0.0010       0.71   0.0014  2.80    10
## [1227] {domestic eggs,                                                                                  
##         oil,                                                                                            
##         root vegetables}           => {whole milk}                0.0010       0.71   0.0014  2.80    10
## [1228] {onions,                                                                                         
##         tropical fruit,                                                                                 
##         yogurt}                    => {whole milk}                0.0015       0.71   0.0021  2.80    15
## [1229] {coffee,                                                                                         
##         other vegetables,                                                                               
##         whipped/sour cream}        => {whole milk}                0.0020       0.71   0.0028  2.80    20
## [1230] {bottled water,                                                                                  
##         frozen vegetables,                                                                              
##         other vegetables}          => {whole milk}                0.0015       0.71   0.0021  2.80    15
## [1231] {citrus fruit,                                                                                   
##         pip fruit,                                                                                      
##         whipped/sour cream}        => {whole milk}                0.0010       0.71   0.0014  2.80    10
## [1232] {onions,                                                                                         
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         yogurt}                    => {whole milk}                0.0010       0.71   0.0014  2.80    10
## [1233] {dessert,                                                                                        
##         fruit/vegetable juice}     => {yogurt}                    0.0023       0.39   0.0060  2.79    23
## [1234] {butter,                                                                                         
##         fruit/vegetable juice}     => {domestic eggs}             0.0014       0.18   0.0080  2.79    14
## [1235] {citrus fruit,                                                                                   
##         napkins}                   => {whipped/sour cream}        0.0015       0.20   0.0076  2.79    15
## [1236] {newspapers,                                                                                     
##         rolls/buns,                                                                                     
##         yogurt}                    => {whipped/sour cream}        0.0010       0.20   0.0051  2.79    10
## [1237] {newspapers,                                                                                     
##         tropical fruit,                                                                                 
##         yogurt}                    => {sausage}                   0.0011       0.26   0.0043  2.79    11
## [1238] {chicken,                                                                                        
##         fruit/vegetable juice}     => {yogurt}                    0.0014       0.39   0.0037  2.79    14
## [1239] {soups}                     => {frankfurter}               0.0011       0.16   0.0068  2.78    11
## [1240] {bottled water,                                                                                  
##         rolls/buns,                                                                                     
##         soda}                      => {frankfurter}               0.0011       0.16   0.0068  2.78    11
## [1241] {hamburger meat,                                                                                 
##         napkins}                   => {other vegetables}          0.0014       0.54   0.0026  2.78    14
## [1242] {hygiene articles,                                                                               
##         whole milk,                                                                                     
##         yogurt}                    => {other vegetables}          0.0021       0.54   0.0040  2.78    21
## [1243] {mayonnaise,                                                                                     
##         whole milk}                => {root vegetables}           0.0010       0.30   0.0034  2.78    10
## [1244] {other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         soda,                                                                                           
##         yogurt}                    => {root vegetables}           0.0010       0.30   0.0034  2.78    10
## [1245] {citrus fruit,                                                                                   
##         sausage}                   => {brown bread}               0.0020       0.18   0.0113  2.78    20
## [1246] {rolls/buns,                                                                                     
##         root vegetables,                                                                                
##         whole milk,                                                                                     
##         yogurt}                    => {sausage}                   0.0012       0.26   0.0047  2.78    12
## [1247] {butter,                                                                                         
##         whipped/sour cream}        => {pork}                      0.0016       0.16   0.0102  2.78    16
## [1248] {herbs,                                                                                          
##         whipped/sour cream}        => {yogurt}                    0.0012       0.39   0.0032  2.77    12
## [1249] {bottled water,                                                                                  
##         rolls/buns,                                                                                     
##         root vegetables}           => {other vegetables}          0.0022       0.54   0.0042  2.77    22
## [1250] {hamburger meat,                                                                                 
##         other vegetables,                                                                               
##         whipped/sour cream}        => {whole milk}                0.0017       0.71   0.0024  2.77    17
## [1251] {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         tropical fruit}            => {yogurt}                    0.0017       0.39   0.0045  2.77    17
## [1252] {beef,                                                                                           
##         shopping bags}             => {citrus fruit}              0.0011       0.23   0.0049  2.77    11
## [1253] {bottled water,                                                                                  
##         chocolate}                 => {yogurt}                    0.0022       0.39   0.0058  2.77    22
## [1254] {onions,                                                                                         
##         whipped/sour cream}        => {fruit/vegetable juice}     0.0010       0.20   0.0051  2.77    10
## [1255] {pip fruit,                                                                                      
##         soda}                      => {tropical fruit}            0.0039       0.29   0.0133  2.76    38
## [1256] {chicken,                                                                                        
##         grapes}                    => {whole milk}                0.0012       0.71   0.0017  2.76    12
## [1257] {frozen vegetables,                                                                              
##         fruit/vegetable juice,                                                                          
##         sausage}                   => {whole milk}                0.0012       0.71   0.0017  2.76    12
## [1258] {bottled beer,                                                                                   
##         citrus fruit,                                                                                   
##         rolls/buns}                => {whole milk}                0.0012       0.71   0.0017  2.76    12
## [1259] {curd,                                                                                           
##         whole milk}                => {yogurt}                    0.0101       0.39   0.0261  2.76    99
## [1260] {brown bread,                                                                                    
##         butter}                    => {pastry}                    0.0014       0.25   0.0058  2.76    14
## [1261] {herbs,                                                                                          
##         other vegetables,                                                                               
##         root vegetables}           => {tropical fruit}            0.0011       0.29   0.0039  2.76    11
## [1262] {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         tropical fruit}            => {whole milk}                0.0032       0.70   0.0045  2.76    31
## [1263] {citrus fruit,                                                                                   
##         frozen vegetables,                                                                              
##         root vegetables}           => {yogurt}                    0.0010       0.38   0.0026  2.76    10
## [1264] {domestic eggs,                                                                                  
##         pip fruit,                                                                                      
##         root vegetables}           => {yogurt}                    0.0010       0.38   0.0026  2.76    10
## [1265] {bottled beer,                                                                                   
##         other vegetables,                                                                               
##         whole milk}                => {coffee}                    0.0012       0.16   0.0076  2.76    12
## [1266] {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         yogurt}                    => {citrus fruit}              0.0013       0.23   0.0058  2.76    13
## [1267] {hygiene articles,                                                                               
##         whole milk}                => {pork}                      0.0020       0.16   0.0128  2.75    20
## [1268] {ham,                                                                                            
##         other vegetables}          => {tropical fruit}            0.0026       0.29   0.0092  2.75    26
## [1269] {pip fruit,                                                                                      
##         pork}                      => {root vegetables}           0.0018       0.30   0.0061  2.75    18
## [1270] {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         rolls/buns}                => {root vegetables}           0.0015       0.30   0.0051  2.75    15
## [1271] {beef,                                                                                           
##         frankfurter}               => {other vegetables}          0.0025       0.53   0.0048  2.75    25
## [1272] {butter,                                                                                         
##         coffee}                    => {whole milk}                0.0034       0.70   0.0048  2.75    33
## [1273] {butter,                                                                                         
##         rolls/buns,                                                                                     
##         yogurt}                    => {citrus fruit}              0.0010       0.23   0.0045  2.75    10
## [1274] {butter milk,                                                                                    
##         curd}                      => {other vegetables}          0.0017       0.53   0.0033  2.75    17
## [1275] {sliced cheese,                                                                                  
##         whole milk}                => {pip fruit}                 0.0022       0.21   0.0108  2.74    22
## [1276] {coffee,                                                                                         
##         pastry}                    => {frankfurter}               0.0011       0.16   0.0069  2.74    11
## [1277] {hard cheese,                                                                                    
##         other vegetables,                                                                               
##         root vegetables}           => {yogurt}                    0.0013       0.38   0.0035  2.74    13
## [1278] {butter,                                                                                         
##         root vegetables,                                                                                
##         whipped/sour cream}        => {yogurt}                    0.0013       0.38   0.0035  2.74    13
## [1279] {coffee,                                                                                         
##         pip fruit,                                                                                      
##         root vegetables}           => {whole milk}                0.0014       0.70   0.0020  2.74    14
## [1280] {frankfurter,                                                                                    
##         sausage,                                                                                        
##         tropical fruit}            => {whole milk}                0.0014       0.70   0.0020  2.74    14
## [1281] {other vegetables,                                                                               
##         whipped/sour cream,                                                                             
##         whole milk}                => {yogurt}                    0.0056       0.38   0.0146  2.74    55
## [1282] {cream cheese,                                                                                   
##         sausage}                   => {yogurt}                    0.0021       0.38   0.0056  2.74    21
## [1283] {ham,                                                                                            
##         tropical fruit}            => {citrus fruit}              0.0012       0.23   0.0054  2.74    12
## [1284] {pip fruit,                                                                                      
##         root vegetables}           => {whipped/sour cream}        0.0031       0.20   0.0156  2.74    30
## [1285] {other vegetables,                                                                               
##         roll products}             => {root vegetables}           0.0014       0.30   0.0048  2.73    14
## [1286] {newspapers,                                                                                     
##         rolls/buns,                                                                                     
##         whole milk}                => {margarine}                 0.0012       0.16   0.0076  2.73    12
## [1287] {hamburger meat,                                                                                 
##         tropical fruit}            => {yogurt}                    0.0016       0.38   0.0043  2.73    16
## [1288] {processed cheese,                                                                               
##         white bread,                                                                                    
##         whole milk}                => {soda}                      0.0010       0.48   0.0021  2.73    10
## [1289] {frankfurter,                                                                                    
##         pastry,                                                                                         
##         whole milk}                => {sausage}                   0.0010       0.26   0.0040  2.73    10
## [1290] {chocolate marshmallow}     => {pork}                      0.0014       0.16   0.0090  2.73    14
## [1291] {chicken,                                                                                        
##         fruit/vegetable juice}     => {other vegetables}          0.0019       0.53   0.0037  2.73    19
## [1292] {napkins,                                                                                        
##         whipped/sour cream}        => {fruit/vegetable juice}     0.0014       0.20   0.0072  2.73    14
## [1293] {hygiene articles,                                                                               
##         tropical fruit}            => {fruit/vegetable juice}     0.0013       0.20   0.0067  2.72    13
## [1294] {butter,                                                                                         
##         whipped/sour cream}        => {yogurt}                    0.0039       0.38   0.0102  2.72    38
## [1295] {chocolate,                                                                                      
##         root vegetables,                                                                                
##         whole milk}                => {tropical fruit}            0.0010       0.29   0.0036  2.72    10
## [1296] {bottled water,                                                                                  
##         margarine,                                                                                      
##         rolls/buns}                => {tropical fruit}            0.0010       0.29   0.0036  2.72    10
## [1297] {root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         whipped/sour cream,                                                                             
##         yogurt}                    => {whole milk}                0.0016       0.70   0.0023  2.72    16
## [1298] {bottled water,                                                                                  
##         pork}                      => {bottled beer}              0.0016       0.22   0.0074  2.72    16
## [1299] {onions,                                                                                         
##         pork}                      => {other vegetables}          0.0020       0.53   0.0039  2.72    20
## [1300] {frozen vegetables,                                                                              
##         root vegetables}           => {other vegetables}          0.0061       0.53   0.0116  2.72    60
## [1301] {bottled beer,                                                                                   
##         pip fruit,                                                                                      
##         tropical fruit}            => {other vegetables}          0.0010       0.53   0.0019  2.72    10
## [1302] {fruit/vegetable juice,                                                                          
##         root vegetables,                                                                                
##         shopping bags}             => {other vegetables}          0.0010       0.53   0.0019  2.72    10
## [1303] {sausage,                                                                                        
##         spread cheese}             => {rolls/buns}                0.0012       0.50   0.0024  2.72    12
## [1304] {waffles,                                                                                        
##         whipped/sour cream,                                                                             
##         yogurt}                    => {rolls/buns}                0.0010       0.50   0.0020  2.72    10
## [1305] {frozen potato products}    => {pork}                      0.0013       0.16   0.0084  2.72    13
## [1306] {beef,                                                                                           
##         yogurt}                    => {pork}                      0.0018       0.16   0.0117  2.71    18
## [1307] {rolls/buns,                                                                                     
##         sausage,                                                                                        
##         tropical fruit}            => {yogurt}                    0.0014       0.38   0.0038  2.71    14
## [1308] {chicken,                                                                                        
##         other vegetables,                                                                               
##         rolls/buns}                => {citrus fruit}              0.0011       0.22   0.0050  2.71    11
## [1309] {brown bread,                                                                                    
##         ham}                       => {whole milk}                0.0018       0.69   0.0026  2.71    18
## [1310] {beef,                                                                                           
##         butter,                                                                                         
##         other vegetables}          => {whole milk}                0.0018       0.69   0.0026  2.71    18
## [1311] {herbs,                                                                                          
##         pork}                      => {other vegetables}          0.0011       0.52   0.0021  2.71    11
## [1312] {frozen vegetables,                                                                              
##         meat}                      => {other vegetables}          0.0011       0.52   0.0021  2.71    11
## [1313] {onions,                                                                                         
##         soda,                                                                                           
##         whole milk}                => {other vegetables}          0.0011       0.52   0.0021  2.71    11
## [1314] {canned beer,                                                                                    
##         soda,                                                                                           
##         yogurt}                    => {other vegetables}          0.0011       0.52   0.0021  2.71    11
## [1315] {root vegetables,                                                                                
##         soda,                                                                                           
##         whole milk}                => {butter}                    0.0012       0.15   0.0081  2.71    12
## [1316] {other vegetables,                                                                               
##         root vegetables,                                                                                
##         soda}                      => {tropical fruit}            0.0023       0.28   0.0082  2.71    23
## [1317] {bottled water,                                                                                  
##         frozen vegetables}         => {yogurt}                    0.0023       0.38   0.0062  2.70    23
## [1318] {root vegetables,                                                                                
##         sausage,                                                                                        
##         whole milk}                => {citrus fruit}              0.0017       0.22   0.0077  2.70    17
## [1319] {frozen vegetables,                                                                              
##         other vegetables,                                                                               
##         root vegetables}           => {tropical fruit}            0.0017       0.28   0.0061  2.70    17
## [1320] {chocolate,                                                                                      
##         whole milk}                => {fruit/vegetable juice}     0.0033       0.20   0.0167  2.70    32
## [1321] {domestic eggs,                                                                                  
##         frankfurter,                                                                                    
##         whole milk}                => {root vegetables}           0.0010       0.29   0.0035  2.70    10
## [1322] {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         tropical fruit}            => {yogurt}                    0.0036       0.38   0.0095  2.70    35
## [1323] {brown bread,                                                                                    
##         oil}                       => {other vegetables}          0.0012       0.52   0.0023  2.70    12
## [1324] {pip fruit,                                                                                      
##         tropical fruit,                                                                                 
##         white bread}               => {other vegetables}          0.0012       0.52   0.0023  2.70    12
## [1325] {pip fruit,                                                                                      
##         yogurt}                    => {root vegetables}           0.0053       0.29   0.0180  2.70    52
## [1326] {butter,                                                                                         
##         fruit/vegetable juice}     => {sausage}                   0.0020       0.25   0.0080  2.69    20
## [1327] {frankfurter,                                                                                    
##         other vegetables,                                                                               
##         whole milk}                => {root vegetables}           0.0022       0.29   0.0076  2.69    22
## [1328] {house keeping products,                                                                         
##         sausage}                   => {whole milk}                0.0011       0.69   0.0016  2.69    11
## [1329] {chicken,                                                                                        
##         pip fruit,                                                                                      
##         root vegetables}           => {whole milk}                0.0011       0.69   0.0016  2.69    11
## [1330] {curd,                                                                                           
##         rolls/buns,                                                                                     
##         soda}                      => {whole milk}                0.0011       0.69   0.0016  2.69    11
## [1331] {frozen vegetables,                                                                              
##         pip fruit,                                                                                      
##         whole milk}                => {bottled water}             0.0011       0.30   0.0038  2.69    11
## [1332] {rolls/buns,                                                                                     
##         sausage,                                                                                        
##         yogurt}                    => {pip fruit}                 0.0012       0.20   0.0060  2.69    12
## [1333] {bottled water,                                                                                  
##         specialty chocolate}       => {tropical fruit}            0.0011       0.28   0.0040  2.69    11
## [1334] {chicken,                                                                                        
##         whole milk,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0011       0.28   0.0040  2.69    11
## [1335] {beef,                                                                                           
##         whipped/sour cream,                                                                             
##         yogurt}                    => {other vegetables}          0.0013       0.52   0.0025  2.69    13
## [1336] {domestic eggs,                                                                                  
##         soda,                                                                                           
##         yogurt}                    => {other vegetables}          0.0013       0.52   0.0025  2.69    13
## [1337] {hard cheese,                                                                                    
##         yogurt}                    => {citrus fruit}              0.0014       0.22   0.0064  2.68    14
## [1338] {beef,                                                                                           
##         root vegetables}           => {citrus fruit}              0.0039       0.22   0.0174  2.68    38
## [1339] {coffee,                                                                                         
##         tropical fruit}            => {margarine}                 0.0011       0.16   0.0071  2.68    11
## [1340] {beef,                                                                                           
##         other vegetables,                                                                               
##         root vegetables}           => {whipped/sour cream}        0.0015       0.19   0.0079  2.68    15
## [1341] {domestic eggs,                                                                                  
##         onions,                                                                                         
##         whole milk}                => {other vegetables}          0.0014       0.52   0.0027  2.68    14
## [1342] {curd,                                                                                           
##         margarine,                                                                                      
##         yogurt}                    => {other vegetables}          0.0014       0.52   0.0027  2.68    14
## [1343] {domestic eggs,                                                                                  
##         white bread,                                                                                    
##         yogurt}                    => {whole milk}                0.0013       0.68   0.0019  2.68    13
## [1344] {citrus fruit,                                                                                   
##         curd,                                                                                           
##         whipped/sour cream}        => {whole milk}                0.0013       0.68   0.0019  2.68    13
## [1345] {sliced cheese,                                                                                  
##         whole milk}                => {domestic eggs}             0.0018       0.17   0.0108  2.68    18
## [1346] {bottled water,                                                                                  
##         pastry,                                                                                         
##         rolls/buns}                => {soda}                      0.0014       0.47   0.0031  2.68    14
## [1347] {margarine,                                                                                      
##         pastry}                    => {yogurt}                    0.0025       0.37   0.0068  2.67    25
## [1348] {frankfurter,                                                                                    
##         frozen meals}              => {other vegetables}          0.0015       0.52   0.0029  2.67    15
## [1349] {pork,                                                                                           
##         yogurt}                    => {whipped/sour cream}        0.0018       0.19   0.0096  2.67    18
## [1350] {grapes,                                                                                         
##         pastry}                    => {shopping bags}             0.0010       0.26   0.0039  2.67    10
## [1351] {frozen potato products,                                                                         
##         yogurt}                    => {whole milk}                0.0015       0.68   0.0022  2.67    15
## [1352] {root vegetables,                                                                                
##         sliced cheese,                                                                                  
##         yogurt}                    => {whole milk}                0.0015       0.68   0.0022  2.67    15
## [1353] {hygiene articles,                                                                               
##         sausage}                   => {yogurt}                    0.0016       0.37   0.0044  2.67    16
## [1354] {other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         soda,                                                                                           
##         whole milk}                => {yogurt}                    0.0016       0.37   0.0044  2.67    16
## [1355] {other vegetables,                                                                               
##         root vegetables,                                                                                
##         yogurt}                    => {citrus fruit}              0.0028       0.22   0.0129  2.66    28
## [1356] {coffee,                                                                                         
##         pastry}                    => {tropical fruit}            0.0019       0.28   0.0069  2.66    19
## [1357] {chicken,                                                                                        
##         rolls/buns,                                                                                     
##         root vegetables}           => {whole milk}                0.0017       0.68   0.0025  2.66    17
## [1358] {brown bread,                                                                                    
##         domestic eggs,                                                                                  
##         other vegetables}          => {whole milk}                0.0017       0.68   0.0025  2.66    17
## [1359] {brown bread,                                                                                    
##         curd}                      => {sausage}                   0.0012       0.25   0.0049  2.66    12
## [1360] {hygiene articles,                                                                               
##         tropical fruit,                                                                                 
##         whole milk}                => {sausage}                   0.0010       0.25   0.0041  2.66    10
## [1361] {shopping bags,                                                                                  
##         whipped/sour cream}        => {fruit/vegetable juice}     0.0015       0.19   0.0079  2.66    15
## [1362] {long life bakery product,                                                                       
##         yogurt}                    => {tropical fruit}            0.0024       0.28   0.0087  2.66    24
## [1363] {newspapers,                                                                                     
##         tropical fruit,                                                                                 
##         whole milk}                => {citrus fruit}              0.0011       0.22   0.0051  2.66    11
## [1364] {coffee,                                                                                         
##         pork}                      => {other vegetables}          0.0018       0.51   0.0036  2.66    18
## [1365] {detergent,                                                                                      
##         frozen vegetables}         => {yogurt}                    0.0010       0.37   0.0027  2.65    10
## [1366] {butter milk,                                                                                    
##         tropical fruit}            => {yogurt}                    0.0020       0.37   0.0055  2.65    20
## [1367] {root vegetables,                                                                                
##         soda}                      => {pork}                      0.0028       0.15   0.0186  2.65    28
## [1368] {grapes,                                                                                         
##         pip fruit}                 => {other vegetables}          0.0019       0.51   0.0038  2.65    19
## [1369] {butter,                                                                                         
##         citrus fruit}              => {root vegetables}           0.0026       0.29   0.0092  2.65    26
## [1370] {ham,                                                                                            
##         whole milk,                                                                                     
##         yogurt}                    => {other vegetables}          0.0020       0.51   0.0040  2.65    20
## [1371] {pork,                                                                                           
##         yogurt}                    => {fruit/vegetable juice}     0.0018       0.19   0.0096  2.65    18
## [1372] {curd,                                                                                           
##         sugar}                     => {whole milk}                0.0023       0.68   0.0035  2.65    23
## [1373] {hygiene articles,                                                                               
##         rolls/buns}                => {whipped/sour cream}        0.0011       0.19   0.0059  2.65    11
## [1374] {brown bread,                                                                                    
##         other vegetables,                                                                               
##         yogurt}                    => {pastry}                    0.0012       0.24   0.0052  2.64    12
## [1375] {frozen vegetables,                                                                              
##         margarine}                 => {pip fruit}                 0.0010       0.20   0.0051  2.64    10
## [1376] {frozen vegetables,                                                                              
##         other vegetables,                                                                               
##         whole milk}                => {pip fruit}                 0.0019       0.20   0.0097  2.64    19
## [1377] {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         root vegetables}           => {whole milk}                0.0055       0.68   0.0081  2.64    54
## [1378] {berries,                                                                                        
##         tropical fruit}            => {root vegetables}           0.0019       0.29   0.0067  2.64    19
## [1379] {domestic eggs,                                                                                  
##         root vegetables}           => {other vegetables}          0.0073       0.51   0.0143  2.64    72
## [1380] {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         soda}                      => {shopping bags}             0.0013       0.26   0.0051  2.64    13
## [1381] {shopping bags,                                                                                  
##         tropical fruit,                                                                                 
##         yogurt}                    => {rolls/buns}                0.0016       0.48   0.0034  2.64    16
## [1382] {beef,                                                                                           
##         frankfurter}               => {tropical fruit}            0.0013       0.28   0.0048  2.64    13
## [1383] {dessert,                                                                                        
##         pastry}                    => {whipped/sour cream}        0.0010       0.19   0.0054  2.63    10
## [1384] {salty snack,                                                                                    
##         tropical fruit}            => {other vegetables}          0.0028       0.51   0.0056  2.63    28
## [1385] {cream cheese,                                                                                   
##         waffles}                   => {yogurt}                    0.0011       0.37   0.0031  2.63    11
## [1386] {chocolate,                                                                                      
##         fruit/vegetable juice,                                                                          
##         yogurt}                    => {soda}                      0.0011       0.46   0.0024  2.63    11
## [1387] {baking powder,                                                                                  
##         other vegetables}          => {domestic eggs}             0.0012       0.17   0.0073  2.63    12
## [1388] {soda,                                                                                           
##         tropical fruit,                                                                                 
##         yogurt}                    => {margarine}                 0.0010       0.15   0.0066  2.63    10
## [1389] {pork,                                                                                           
##         tropical fruit}            => {frankfurter}               0.0013       0.15   0.0085  2.62    13
## [1390] {other vegetables,                                                                               
##         yogurt}                    => {fruit/vegetable juice}     0.0082       0.19   0.0434  2.62    81
## [1391] {hamburger meat,                                                                                 
##         tropical fruit}            => {root vegetables}           0.0012       0.29   0.0043  2.62    12
## [1392] {butter,                                                                                         
##         white bread}               => {root vegetables}           0.0012       0.29   0.0043  2.62    12
## [1393] {butter,                                                                                         
##         pastry}                    => {other vegetables}          0.0039       0.51   0.0076  2.62    38
## [1394] {napkins,                                                                                        
##         whole milk,                                                                                     
##         yogurt}                    => {citrus fruit}              0.0013       0.22   0.0061  2.62    13
## [1395] {other vegetables,                                                                               
##         shopping bags}             => {root vegetables}           0.0066       0.29   0.0232  2.62    65
## [1396] {other vegetables,                                                                               
##         root vegetables,                                                                                
##         yogurt}                    => {fruit/vegetable juice}     0.0024       0.19   0.0129  2.61    24
## [1397] {beverages,                                                                                      
##         rolls/buns}                => {sausage}                   0.0013       0.25   0.0054  2.61    13
## [1398] {chocolate,                                                                                      
##         other vegetables}          => {citrus fruit}              0.0027       0.22   0.0127  2.61    27
## [1399] {coffee,                                                                                         
##         hard cheese}               => {whole milk}                0.0012       0.67   0.0018  2.61    12
## [1400] {chocolate,                                                                                      
##         hamburger meat}            => {whole milk}                0.0016       0.67   0.0024  2.61    16
## [1401] {ham,                                                                                            
##         other vegetables,                                                                               
##         yogurt}                    => {whole milk}                0.0020       0.67   0.0031  2.61    20
## [1402] {fruit/vegetable juice,                                                                          
##         oil,                                                                                            
##         root vegetables}           => {whole milk}                0.0012       0.67   0.0018  2.61    12
## [1403] {other vegetables,                                                                               
##         salty snack,                                                                                    
##         whipped/sour cream}        => {whole milk}                0.0018       0.67   0.0027  2.61    18
## [1404] {root vegetables,                                                                                
##         sugar,                                                                                          
##         yogurt}                    => {whole milk}                0.0014       0.67   0.0021  2.61    14
## [1405] {chicken,                                                                                        
##         napkins,                                                                                        
##         root vegetables}           => {whole milk}                0.0010       0.67   0.0015  2.61    10
## [1406] {sausage,                                                                                        
##         tropical fruit,                                                                                 
##         white bread}               => {whole milk}                0.0014       0.67   0.0021  2.61    14
## [1407] {beef,                                                                                           
##         frankfurter,                                                                                    
##         rolls/buns}                => {whole milk}                0.0012       0.67   0.0018  2.61    12
## [1408] {beef,                                                                                           
##         soda,                                                                                           
##         yogurt}                    => {whole milk}                0.0012       0.67   0.0018  2.61    12
## [1409] {domestic eggs,                                                                                  
##         margarine,                                                                                      
##         sausage}                   => {whole milk}                0.0010       0.67   0.0015  2.61    10
## [1410] {butter,                                                                                         
##         pastry,                                                                                         
##         whipped/sour cream}        => {whole milk}                0.0012       0.67   0.0018  2.61    12
## [1411] {citrus fruit,                                                                                   
##         curd,                                                                                           
##         other vegetables,                                                                               
##         tropical fruit}            => {whole milk}                0.0010       0.67   0.0015  2.61    10
## [1412] {citrus fruit,                                                                                   
##         domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         root vegetables}           => {whole milk}                0.0012       0.67   0.0018  2.61    12
## [1413] {brown bread,                                                                                    
##         yogurt}                    => {frankfurter}               0.0022       0.15   0.0145  2.61    22
## [1414] {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         tropical fruit}            => {frankfurter}               0.0010       0.15   0.0066  2.61    10
## [1415] {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         sausage}                   => {yogurt}                    0.0016       0.36   0.0045  2.61    16
## [1416] {candy,                                                                                          
##         newspapers}                => {soda}                      0.0010       0.45   0.0022  2.61    10
## [1417] {bottled water,                                                                                  
##         rolls/buns,                                                                                     
##         sausage}                   => {shopping bags}             0.0010       0.26   0.0040  2.60    10
## [1418] {chocolate,                                                                                      
##         tropical fruit}            => {pork}                      0.0012       0.15   0.0081  2.60    12
## [1419] {napkins,                                                                                        
##         newspapers,                                                                                     
##         whole milk}                => {rolls/buns}                0.0011       0.48   0.0023  2.60    11
## [1420] {chicken,                                                                                        
##         other vegetables,                                                                               
##         whipped/sour cream,                                                                             
##         whole milk}                => {rolls/buns}                0.0011       0.48   0.0023  2.60    11
## [1421] {rolls/buns,                                                                                     
##         whipped/sour cream,                                                                             
##         whole milk}                => {tropical fruit}            0.0021       0.27   0.0078  2.60    21
## [1422] {canned beer,                                                                                    
##         other vegetables}          => {brown bread}               0.0015       0.17   0.0090  2.60    15
## [1423] {waffles,                                                                                        
##         whole milk}                => {margarine}                 0.0019       0.15   0.0127  2.60    19
## [1424] {brown bread,                                                                                    
##         sausage}                   => {yogurt}                    0.0039       0.36   0.0107  2.59    38
## [1425] {brown bread,                                                                                    
##         dessert}                   => {yogurt}                    0.0017       0.36   0.0048  2.59    17
## [1426] {frankfurter,                                                                                    
##         pork}                      => {newspapers}                0.0012       0.21   0.0059  2.59    12
## [1427] {pastry,                                                                                         
##         sausage,                                                                                        
##         whole milk}                => {citrus fruit}              0.0012       0.21   0.0057  2.59    12
## [1428] {canned beer,                                                                                    
##         soda,                                                                                           
##         yogurt}                    => {rolls/buns}                0.0010       0.48   0.0021  2.59    10
## [1429] {hard cheese,                                                                                    
##         whole milk}                => {margarine}                 0.0015       0.15   0.0101  2.59    15
## [1430] {pastry,                                                                                         
##         tropical fruit,                                                                                 
##         whole milk}                => {margarine}                 0.0010       0.15   0.0067  2.59    10
## [1431] {cream cheese,                                                                                   
##         tropical fruit}            => {root vegetables}           0.0020       0.28   0.0072  2.58    20
## [1432] {roll products,                                                                                  
##         tropical fruit}            => {other vegetables}          0.0010       0.50   0.0020  2.58    10
## [1433] {berries,                                                                                        
##         grapes}                    => {other vegetables}          0.0013       0.50   0.0026  2.58    13
## [1434] {hard cheese,                                                                                    
##         tropical fruit}            => {other vegetables}          0.0020       0.50   0.0041  2.58    20
## [1435] {beef,                                                                                           
##         waffles}                   => {other vegetables}          0.0015       0.50   0.0031  2.58    15
## [1436] {root vegetables,                                                                                
##         white bread}               => {other vegetables}          0.0040       0.50   0.0079  2.58    39
## [1437] {long life bakery product,                                                                       
##         salty snack,                                                                                    
##         whole milk}                => {other vegetables}          0.0010       0.50   0.0020  2.58    10
## [1438] {long life bakery product,                                                                       
##         pip fruit,                                                                                      
##         whole milk}                => {other vegetables}          0.0012       0.50   0.0024  2.58    12
## [1439] {bottled beer,                                                                                   
##         curd,                                                                                           
##         whole milk}                => {other vegetables}          0.0010       0.50   0.0020  2.58    10
## [1440] {butter,                                                                                         
##         napkins,                                                                                        
##         root vegetables}           => {other vegetables}          0.0010       0.50   0.0020  2.58    10
## [1441] {fruit/vegetable juice,                                                                          
##         whipped/sour cream,                                                                             
##         whole milk}                => {other vegetables}          0.0022       0.50   0.0045  2.58    22
## [1442] {pastry,                                                                                         
##         pip fruit,                                                                                      
##         whole milk}                => {other vegetables}          0.0025       0.50   0.0051  2.58    25
## [1443] {other vegetables,                                                                               
##         whipped/sour cream}        => {tropical fruit}            0.0078       0.27   0.0289  2.58    77
## [1444] {frozen meals,                                                                                   
##         tropical fruit}            => {whipped/sour cream}        0.0010       0.19   0.0055  2.58    10
## [1445] {other vegetables,                                                                               
##         sausage,                                                                                        
##         whipped/sour cream}        => {tropical fruit}            0.0013       0.27   0.0049  2.58    13
## [1446] {bottled water,                                                                                  
##         pastry,                                                                                         
##         whole milk}                => {soda}                      0.0018       0.45   0.0041  2.58    18
## [1447] {whipped/sour cream,                                                                             
##         yogurt}                    => {fruit/vegetable juice}     0.0039       0.19   0.0207  2.58    38
## [1448] {butter,                                                                                         
##         frankfurter}               => {pastry}                    0.0011       0.23   0.0049  2.58    11
## [1449] {pip fruit}                 => {tropical fruit}            0.0204       0.27   0.0756  2.57   201
## [1450] {frozen meals,                                                                                   
##         fruit/vegetable juice}     => {yogurt}                    0.0014       0.36   0.0040  2.57    14
## [1451] {candy,                                                                                          
##         margarine}                 => {soda}                      0.0013       0.45   0.0029  2.57    13
## [1452] {butter,                                                                                         
##         coffee}                    => {citrus fruit}              0.0010       0.21   0.0048  2.57    10
## [1453] {pastry,                                                                                         
##         yogurt}                    => {sausage}                   0.0043       0.24   0.0177  2.57    42
## [1454] {bottled water,                                                                                  
##         frankfurter}               => {brown bread}               0.0012       0.17   0.0073  2.57    12
## [1455] {chocolate,                                                                                      
##         fruit/vegetable juice}     => {yogurt}                    0.0024       0.36   0.0068  2.57    24
## [1456] {soda,                                                                                           
##         whole milk,                                                                                     
##         yogurt}                    => {pip fruit}                 0.0020       0.19   0.0105  2.57    20
## [1457] {frozen vegetables,                                                                              
##         tropical fruit}            => {frankfurter}               0.0013       0.15   0.0087  2.56    13
## [1458] {candy,                                                                                          
##         yogurt}                    => {sausage}                   0.0013       0.24   0.0055  2.56    13
## [1459] {hamburger meat,                                                                                 
##         white bread}               => {yogurt}                    0.0010       0.36   0.0028  2.56    10
## [1460] {berries,                                                                                        
##         other vegetables,                                                                               
##         tropical fruit}            => {yogurt}                    0.0010       0.36   0.0028  2.56    10
## [1461] {sliced cheese,                                                                                  
##         whole milk}                => {frankfurter}               0.0016       0.15   0.0108  2.56    16
## [1462] {cream cheese,                                                                                   
##         other vegetables,                                                                               
##         yogurt}                    => {whole milk}                0.0035       0.65   0.0053  2.56    34
## [1463] {domestic eggs,                                                                                  
##         margarine}                 => {tropical fruit}            0.0022       0.27   0.0083  2.56    22
## [1464] {frozen meals,                                                                                   
##         other vegetables}          => {domestic eggs}             0.0012       0.16   0.0075  2.56    12
## [1465] {rolls/buns,                                                                                     
##         soda,                                                                                           
##         whole milk}                => {other vegetables}          0.0044       0.49   0.0088  2.55    43
## [1466] {root vegetables,                                                                                
##         whipped/sour cream}        => {tropical fruit}            0.0046       0.27   0.0171  2.55    45
## [1467] {pastry,                                                                                         
##         tropical fruit,                                                                                 
##         yogurt}                    => {whole milk}                0.0031       0.65   0.0047  2.55    30
## [1468] {frozen meals,                                                                                   
##         tropical fruit}            => {newspapers}                0.0011       0.20   0.0055  2.55    11
## [1469] {fruit/vegetable juice,                                                                          
##         soda}                      => {bottled water}             0.0052       0.28   0.0184  2.55    51
## [1470] {bottled water,                                                                                  
##         specialty bar}             => {soda}                      0.0012       0.44   0.0027  2.55    12
## [1471] {pastry,                                                                                         
##         whole milk,                                                                                     
##         yogurt}                    => {root vegetables}           0.0025       0.28   0.0092  2.55    25
## [1472] {butter milk,                                                                                    
##         whole milk}                => {fruit/vegetable juice}     0.0021       0.18   0.0116  2.55    21
## [1473] {fruit/vegetable juice,                                                                          
##         whole milk}                => {yogurt}                    0.0095       0.35   0.0266  2.54    93
## [1474] {cereals,                                                                                        
##         other vegetables}          => {whole milk}                0.0013       0.65   0.0020  2.54    13
## [1475] {beef,                                                                                           
##         citrus fruit,                                                                                   
##         tropical fruit}            => {whole milk}                0.0013       0.65   0.0020  2.54    13
## [1476] {dessert,                                                                                        
##         root vegetables}           => {citrus fruit}              0.0012       0.21   0.0058  2.54    12
## [1477] {butter,                                                                                         
##         napkins,                                                                                        
##         whole milk}                => {yogurt}                    0.0011       0.35   0.0032  2.54    11
## [1478] {butter milk,                                                                                    
##         yogurt}                    => {pastry}                    0.0019       0.23   0.0085  2.54    19
## [1479] {bottled water,                                                                                  
##         butter}                    => {bottled beer}              0.0018       0.20   0.0089  2.54    18
## [1480] {chocolate,                                                                                      
##         other vegetables}          => {pip fruit}                 0.0024       0.19   0.0127  2.54    24
## [1481] {frozen meals,                                                                                   
##         tropical fruit}            => {whole milk}                0.0036       0.65   0.0055  2.54    35
## [1482] {hygiene articles,                                                                               
##         tropical fruit}            => {whipped/sour cream}        0.0012       0.18   0.0067  2.54    12
## [1483] {curd,                                                                                           
##         pork}                      => {sausage}                   0.0010       0.24   0.0043  2.53    10
## [1484] {domestic eggs,                                                                                  
##         rolls/buns,                                                                                     
##         yogurt}                    => {sausage}                   0.0010       0.24   0.0043  2.53    10
## [1485] {detergent,                                                                                      
##         white bread}               => {whole milk}                0.0011       0.65   0.0017  2.53    11
## [1486] {chicken,                                                                                        
##         curd}                      => {whole milk}                0.0022       0.65   0.0035  2.53    22
## [1487] {chicken,                                                                                        
##         margarine,                                                                                      
##         rolls/buns}                => {whole milk}                0.0011       0.65   0.0017  2.53    11
## [1488] {chocolate,                                                                                      
##         citrus fruit,                                                                                   
##         root vegetables}           => {whole milk}                0.0011       0.65   0.0017  2.53    11
## [1489] {domestic eggs,                                                                                  
##         root vegetables,                                                                                
##         sausage}                   => {whole milk}                0.0011       0.65   0.0017  2.53    11
## [1490] {curd,                                                                                           
##         other vegetables,                                                                               
##         tropical fruit,                                                                                 
##         whipped/sour cream}        => {whole milk}                0.0011       0.65   0.0017  2.53    11
## [1491] {bottled beer,                                                                                   
##         pip fruit}                 => {root vegetables}           0.0016       0.28   0.0059  2.53    16
## [1492] {beef,                                                                                           
##         cat food}                  => {yogurt}                    0.0012       0.35   0.0035  2.53    12
## [1493] {citrus fruit,                                                                                   
##         root vegetables,                                                                                
##         yogurt}                    => {whole milk}                0.0032       0.65   0.0049  2.53    31
## [1494] {frozen meals,                                                                                   
##         yogurt}                    => {brown bread}               0.0010       0.16   0.0062  2.53    10
## [1495] {curd,                                                                                           
##         root vegetables,                                                                                
##         tropical fruit}            => {whole milk}                0.0020       0.65   0.0032  2.52    20
## [1496] {bottled water,                                                                                  
##         shopping bags,                                                                                  
##         yogurt}                    => {rolls/buns}                0.0013       0.46   0.0028  2.52    13
## [1497] {domestic eggs,                                                                                  
##         hamburger meat}            => {root vegetables}           0.0011       0.28   0.0041  2.52    11
## [1498] {butter,                                                                                         
##         other vegetables,                                                                               
##         pip fruit}                 => {root vegetables}           0.0011       0.28   0.0041  2.52    11
## [1499] {other vegetables,                                                                               
##         pastry,                                                                                         
##         whole milk}                => {brown bread}               0.0017       0.16   0.0106  2.52    17
## [1500] {seasonal products,                                                                              
##         whole milk}                => {yogurt}                    0.0013       0.35   0.0038  2.52    13
## [1501] {sliced cheese,                                                                                  
##         whole milk}                => {tropical fruit}            0.0028       0.26   0.0108  2.52    28
## [1502] {domestic eggs,                                                                                  
##         pip fruit,                                                                                      
##         whole milk}                => {tropical fruit}            0.0014       0.26   0.0054  2.52    14
## [1503] {bottled water,                                                                                  
##         frozen vegetables}         => {whipped/sour cream}        0.0011       0.18   0.0062  2.52    11
## [1504] {hygiene articles,                                                                               
##         other vegetables}          => {domestic eggs}             0.0015       0.16   0.0096  2.52    15
## [1505] {cat food,                                                                                       
##         citrus fruit}              => {bottled water}             0.0010       0.28   0.0037  2.51    10
## [1506] {hygiene articles,                                                                               
##         soda}                      => {domestic eggs}             0.0011       0.16   0.0070  2.51    11
## [1507] {other vegetables,                                                                               
##         pastry,                                                                                         
##         rolls/buns}                => {yogurt}                    0.0021       0.35   0.0061  2.51    21
## [1508] {brown bread,                                                                                    
##         butter}                    => {tropical fruit}            0.0015       0.26   0.0058  2.51    15
## [1509] {chocolate,                                                                                      
##         soda,                                                                                           
##         whole milk}                => {newspapers}                0.0010       0.20   0.0051  2.51    10
## [1510] {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         root vegetables}           => {brown bread}               0.0013       0.16   0.0081  2.50    13
## [1511] {domestic eggs,                                                                                  
##         frozen vegetables}         => {sausage}                   0.0012       0.24   0.0052  2.50    12
## [1512] {coffee,                                                                                         
##         other vegetables,                                                                               
##         whole milk}                => {yogurt}                    0.0022       0.35   0.0064  2.50    22
## [1513] {sliced cheese,                                                                                  
##         soda}                      => {rolls/buns}                0.0023       0.46   0.0051  2.50    23
## [1514] {pastry,                                                                                         
##         pork,                                                                                           
##         whole milk}                => {other vegetables}          0.0015       0.48   0.0032  2.50    15
## [1515] {rolls/buns,                                                                                     
##         whipped/sour cream,                                                                             
##         yogurt}                    => {whole milk}                0.0031       0.64   0.0048  2.50    30
## [1516] {beef,                                                                                           
##         root vegetables,                                                                                
##         tropical fruit}            => {rolls/buns}                0.0017       0.46   0.0038  2.50    17
## [1517] {hamburger meat,                                                                                 
##         whipped/sour cream}        => {tropical fruit}            0.0011       0.26   0.0043  2.50    11
## [1518] {shopping bags,                                                                                  
##         soda,                                                                                           
##         yogurt}                    => {tropical fruit}            0.0011       0.26   0.0043  2.50    11
## [1519] {newspapers,                                                                                     
##         yogurt}                    => {whipped/sour cream}        0.0027       0.18   0.0154  2.49    27
## [1520] {hygiene articles,                                                                               
##         root vegetables}           => {pip fruit}                 0.0010       0.19   0.0054  2.49    10
## [1521] {frozen vegetables,                                                                              
##         other vegetables}          => {pip fruit}                 0.0034       0.19   0.0178  2.49    33
## [1522] {frankfurter,                                                                                    
##         other vegetables,                                                                               
##         yogurt}                    => {rolls/buns}                0.0022       0.46   0.0049  2.49    22
## [1523] {bottled beer,                                                                                   
##         ham}                       => {whole milk}                0.0014       0.64   0.0022  2.49    14
## [1524] {beef,                                                                                           
##         citrus fruit,                                                                                   
##         other vegetables}          => {whole milk}                0.0021       0.64   0.0034  2.49    21
## [1525] {detergent,                                                                                      
##         root vegetables,                                                                                
##         whole milk}                => {other vegetables}          0.0013       0.48   0.0027  2.49    13
## [1526] {margarine,                                                                                      
##         pork,                                                                                           
##         whole milk}                => {other vegetables}          0.0013       0.48   0.0027  2.49    13
## [1527] {canned beer,                                                                                    
##         sausage}                   => {brown bread}               0.0010       0.16   0.0063  2.49    10
## [1528] {cat food,                                                                                       
##         root vegetables}           => {tropical fruit}            0.0012       0.26   0.0047  2.49    12
## [1529] {onions,                                                                                         
##         soda}                      => {other vegetables}          0.0025       0.48   0.0053  2.48    25
## [1530] {chocolate,                                                                                      
##         rolls/buns}                => {newspapers}                0.0023       0.20   0.0118  2.48    23
## [1531] {root vegetables,                                                                                
##         white bread}               => {yogurt}                    0.0027       0.35   0.0079  2.48    27
## [1532] {beef,                                                                                           
##         grapes}                    => {other vegetables}          0.0012       0.48   0.0025  2.48    12
## [1533] {pastry,                                                                                         
##         whole milk,                                                                                     
##         yogurt}                    => {whipped/sour cream}        0.0016       0.18   0.0092  2.48    16
## [1534] {waffles,                                                                                        
##         yogurt}                    => {root vegetables}           0.0020       0.27   0.0075  2.48    20
## [1535] {frankfurter,                                                                                    
##         frozen vegetables}         => {tropical fruit}            0.0013       0.26   0.0051  2.48    13
## [1536] {pork,                                                                                           
##         root vegetables,                                                                                
##         whole milk}                => {fruit/vegetable juice}     0.0012       0.18   0.0068  2.48    12
## [1537] {frozen vegetables,                                                                              
##         yogurt}                    => {citrus fruit}              0.0025       0.20   0.0124  2.48    25
## [1538] {ham,                                                                                            
##         pastry}                    => {shopping bags}             0.0010       0.24   0.0042  2.48    10
## [1539] {sausage,                                                                                        
##         whole milk}                => {pip fruit}                 0.0056       0.19   0.0299  2.47    55
## [1540] {coffee,                                                                                         
##         whole milk,                                                                                     
##         yogurt}                    => {pastry}                    0.0011       0.22   0.0051  2.47    11
## [1541] {bottled beer,                                                                                   
##         dessert}                   => {whole milk}                0.0012       0.63   0.0019  2.47    12
## [1542] {grapes,                                                                                         
##         other vegetables,                                                                               
##         pip fruit}                 => {whole milk}                0.0012       0.63   0.0019  2.47    12
## [1543] {brown bread,                                                                                    
##         root vegetables,                                                                                
##         soda}                      => {whole milk}                0.0012       0.63   0.0019  2.47    12
## [1544] {domestic eggs,                                                                                  
##         sausage,                                                                                        
##         whipped/sour cream}        => {whole milk}                0.0012       0.63   0.0019  2.47    12
## [1545] {cream cheese,                                                                                   
##         napkins,                                                                                        
##         whole milk}                => {other vegetables}          0.0011       0.48   0.0023  2.47    11
## [1546] {brown bread,                                                                                    
##         curd,                                                                                           
##         yogurt}                    => {other vegetables}          0.0011       0.48   0.0023  2.47    11
## [1547] {butter,                                                                                         
##         root vegetables,                                                                                
##         sausage}                   => {rolls/buns}                0.0010       0.45   0.0022  2.47    10
## [1548] {other vegetables,                                                                               
##         pastry,                                                                                         
##         soda}                      => {tropical fruit}            0.0014       0.26   0.0055  2.47    14
## [1549] {processed cheese,                                                                               
##         whole milk}                => {sausage}                   0.0016       0.23   0.0070  2.47    16
## [1550] {butter,                                                                                         
##         pastry}                    => {pip fruit}                 0.0014       0.19   0.0076  2.47    14
## [1551] {salty snack,                                                                                    
##         shopping bags}             => {pip fruit}                 0.0011       0.19   0.0060  2.46    11
## [1552] {other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         whole milk,                                                                                     
##         yogurt}                    => {pip fruit}                 0.0011       0.19   0.0060  2.46    11
## [1553] {artif. sweetener}          => {yogurt}                    0.0011       0.34   0.0033  2.46    11
## [1554] {hamburger meat,                                                                                 
##         pork}                      => {yogurt}                    0.0011       0.34   0.0033  2.46    11
## [1555] {hamburger meat,                                                                                 
##         other vegetables}          => {whipped/sour cream}        0.0024       0.18   0.0138  2.46    24
## [1556] {pip fruit,                                                                                      
##         sliced cheese}             => {root vegetables}           0.0011       0.27   0.0042  2.46    11
## [1557] {domestic eggs,                                                                                  
##         hard cheese,                                                                                    
##         whole milk}                => {other vegetables}          0.0010       0.48   0.0021  2.46    10
## [1558] {cream cheese,                                                                                   
##         frankfurter,                                                                                    
##         whole milk}                => {other vegetables}          0.0010       0.48   0.0021  2.46    10
## [1559] {baking powder,                                                                                  
##         rolls/buns}                => {whole milk}                0.0022       0.63   0.0036  2.46    22
## [1560] {bottled water,                                                                                  
##         domestic eggs}             => {fruit/vegetable juice}     0.0016       0.18   0.0092  2.46    16
## [1561] {chocolate,                                                                                      
##         other vegetables,                                                                               
##         tropical fruit}            => {yogurt}                    0.0012       0.34   0.0036  2.46    12
## [1562] {bottled water,                                                                                  
##         shopping bags,                                                                                  
##         yogurt}                    => {soda}                      0.0012       0.43   0.0028  2.46    12
## [1563] {whipped/sour cream,                                                                             
##         whole milk,                                                                                     
##         yogurt}                    => {fruit/vegetable juice}     0.0019       0.18   0.0109  2.46    19
## [1564] {brown bread,                                                                                    
##         soda}                      => {shopping bags}             0.0031       0.24   0.0126  2.46    30
## [1565] {beef,                                                                                           
##         pastry}                    => {fruit/vegetable juice}     0.0011       0.18   0.0063  2.45    11
## [1566] {bottled water,                                                                                  
##         rolls/buns,                                                                                     
##         whole milk}                => {root vegetables}           0.0023       0.27   0.0087  2.45    23
## [1567] {mayonnaise}                => {domestic eggs}             0.0014       0.16   0.0092  2.45    14
## [1568] {other vegetables,                                                                               
##         sausage,                                                                                        
##         whipped/sour cream}        => {bottled water}             0.0013       0.27   0.0049  2.45    13
## [1569] {ham,                                                                                            
##         pastry}                    => {yogurt}                    0.0014       0.34   0.0042  2.45    14
## [1570] {beef,                                                                                           
##         other vegetables,                                                                               
##         rolls/buns}                => {whipped/sour cream}        0.0010       0.18   0.0058  2.45    10
## [1571] {brown bread,                                                                                    
##         pot plants}                => {whole milk}                0.0010       0.62   0.0016  2.45    10
## [1572] {butter,                                                                                         
##         pickled vegetables}        => {whole milk}                0.0010       0.62   0.0016  2.45    10
## [1573] {grapes,                                                                                         
##         other vegetables,                                                                               
##         pork}                      => {whole milk}                0.0010       0.62   0.0016  2.45    10
## [1574] {sausage,                                                                                        
##         sliced cheese,                                                                                  
##         yogurt}                    => {whole milk}                0.0015       0.62   0.0024  2.45    15
## [1575] {chicken,                                                                                        
##         domestic eggs,                                                                                  
##         tropical fruit}            => {whole milk}                0.0010       0.62   0.0016  2.45    10
## [1576] {domestic eggs,                                                                                  
##         frozen vegetables,                                                                              
##         root vegetables}           => {whole milk}                0.0010       0.62   0.0016  2.45    10
## [1577] {margarine,                                                                                      
##         other vegetables,                                                                               
##         pastry}                    => {whole milk}                0.0015       0.62   0.0024  2.45    15
## [1578] {pastry,                                                                                         
##         rolls/buns,                                                                                     
##         whipped/sour cream}        => {whole milk}                0.0015       0.62   0.0024  2.45    15
## [1579] {citrus fruit,                                                                                   
##         fruit/vegetable juice,                                                                          
##         root vegetables,                                                                                
##         tropical fruit}            => {whole milk}                0.0010       0.62   0.0016  2.45    10
## [1580] {sausage,                                                                                        
##         yogurt}                    => {pastry}                    0.0043       0.22   0.0196  2.45    42
## [1581] {margarine,                                                                                      
##         whole milk,                                                                                     
##         yogurt}                    => {pastry}                    0.0015       0.22   0.0070  2.44    15
## [1582] {frozen vegetables,                                                                              
##         whole milk}                => {other vegetables}          0.0097       0.47   0.0204  2.44    95
## [1583] {chocolate,                                                                                      
##         sausage}                   => {pip fruit}                 0.0012       0.18   0.0066  2.44    12
## [1584] {long life bakery product,                                                                       
##         napkins}                   => {yogurt}                    0.0016       0.34   0.0048  2.44    16
## [1585] {frozen meals,                                                                                   
##         whole milk}                => {yogurt}                    0.0034       0.34   0.0099  2.44    33
## [1586] {other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         soda,                                                                                           
##         whole milk}                => {tropical fruit}            0.0011       0.26   0.0044  2.44    11
## [1587] {pip fruit,                                                                                      
##         root vegetables}           => {yogurt}                    0.0053       0.34   0.0156  2.44    52
## [1588] {frankfurter,                                                                                    
##         yogurt}                    => {domestic eggs}             0.0017       0.15   0.0112  2.44    17
## [1589] {root vegetables,                                                                                
##         sausage,                                                                                        
##         whole milk}                => {brown bread}               0.0012       0.16   0.0077  2.43    12
## [1590] {onions,                                                                                         
##         root vegetables,                                                                                
##         whole milk}                => {tropical fruit}            0.0012       0.26   0.0048  2.43    12
## [1591] {butter,                                                                                         
##         domestic eggs}             => {whole milk}                0.0060       0.62   0.0097  2.43    59
## [1592] {pastry,                                                                                         
##         processed cheese}          => {whole milk}                0.0018       0.62   0.0029  2.43    18
## [1593] {long life bakery product,                                                                       
##         whipped/sour cream}        => {fruit/vegetable juice}     0.0010       0.18   0.0058  2.43    10
## [1594] {waffles,                                                                                        
##         whipped/sour cream}        => {whole milk}                0.0032       0.62   0.0051  2.43    31
## [1595] {domestic eggs,                                                                                  
##         shopping bags}             => {brown bread}               0.0014       0.16   0.0090  2.42    14
## [1596] {soda,                                                                                           
##         tropical fruit,                                                                                 
##         yogurt}                    => {domestic eggs}             0.0010       0.15   0.0066  2.42    10
## [1597] {chicken,                                                                                        
##         root vegetables,                                                                                
##         whole milk}                => {tropical fruit}            0.0015       0.25   0.0060  2.42    15
## [1598] {hamburger meat,                                                                                 
##         whipped/sour cream}        => {whole milk}                0.0026       0.62   0.0043  2.42    26
## [1599] {cream cheese,                                                                                   
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         yogurt}                    => {whole milk}                0.0013       0.62   0.0021  2.42    13
## [1600] {brown bread,                                                                                    
##         hamburger meat}            => {other vegetables}          0.0015       0.47   0.0033  2.42    15
## [1601] {whipped/sour cream,                                                                             
##         whole milk}                => {yogurt}                    0.0109       0.34   0.0322  2.42   107
## [1602] {butter,                                                                                         
##         margarine}                 => {sausage}                   0.0015       0.23   0.0067  2.42    15
## [1603] {hard cheese,                                                                                    
##         other vegetables,                                                                               
##         root vegetables}           => {whole milk}                0.0021       0.62   0.0035  2.42    21
## [1604] {rolls/buns,                                                                                     
##         tropical fruit,                                                                                 
##         whipped/sour cream}        => {whole milk}                0.0021       0.62   0.0035  2.42    21
## [1605] {pip fruit,                                                                                      
##         sausage,                                                                                        
##         whole milk}                => {citrus fruit}              0.0011       0.20   0.0056  2.42    11
## [1606] {bottled water,                                                                                  
##         other vegetables,                                                                               
##         yogurt}                    => {citrus fruit}              0.0016       0.20   0.0081  2.42    16
## [1607] {berries,                                                                                        
##         other vegetables,                                                                               
##         yogurt}                    => {root vegetables}           0.0010       0.26   0.0039  2.41    10
## [1608] {dessert,                                                                                        
##         soda}                      => {sausage}                   0.0022       0.23   0.0099  2.41    22
## [1609] {beef,                                                                                           
##         frozen vegetables}         => {other vegetables}          0.0021       0.47   0.0046  2.41    21
## [1610] {newspapers,                                                                                     
##         rolls/buns,                                                                                     
##         sausage}                   => {other vegetables}          0.0014       0.47   0.0031  2.41    14
## [1611] {brown bread,                                                                                    
##         pip fruit,                                                                                      
##         yogurt}                    => {whole milk}                0.0016       0.62   0.0026  2.41    16
## [1612] {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         pip fruit,                                                                                      
##         root vegetables}           => {whole milk}                0.0016       0.62   0.0026  2.41    16
## [1613] {roll products}             => {other vegetables}          0.0048       0.47   0.0103  2.40    47
## [1614] {bottled beer,                                                                                   
##         salty snack}               => {soda}                      0.0013       0.42   0.0032  2.40    13
## [1615] {pastry,                                                                                         
##         rolls/buns,                                                                                     
##         whole milk}                => {root vegetables}           0.0022       0.26   0.0085  2.40    22
## [1616] {cream cheese,                                                                                   
##         yogurt}                    => {brown bread}               0.0019       0.16   0.0124  2.40    19
## [1617] {citrus fruit,                                                                                   
##         napkins,                                                                                        
##         tropical fruit}            => {other vegetables}          0.0013       0.46   0.0028  2.40    13
## [1618] {newspapers,                                                                                     
##         whipped/sour cream,                                                                             
##         whole milk}                => {other vegetables}          0.0013       0.46   0.0028  2.40    13
## [1619] {brown bread,                                                                                    
##         newspapers}                => {pastry}                    0.0016       0.21   0.0076  2.40    16
## [1620] {hygiene articles,                                                                               
##         whole milk}                => {citrus fruit}              0.0025       0.20   0.0128  2.40    25
## [1621] {bottled beer,                                                                                   
##         domestic eggs}             => {root vegetables}           0.0012       0.26   0.0047  2.39    12
## [1622] {beef,                                                                                           
##         newspapers,                                                                                     
##         whole milk}                => {rolls/buns}                0.0011       0.44   0.0025  2.39    11
## [1623] {long life bakery product,                                                                       
##         sausage,                                                                                        
##         yogurt}                    => {whole milk}                0.0011       0.61   0.0018  2.39    11
## [1624] {frozen vegetables,                                                                              
##         pork,                                                                                           
##         root vegetables}           => {whole milk}                0.0011       0.61   0.0018  2.39    11
## [1625] {pastry,                                                                                         
##         sausage,                                                                                        
##         whipped/sour cream}        => {whole milk}                0.0011       0.61   0.0018  2.39    11
## [1626] {canned fish,                                                                                    
##         whole milk}                => {pastry}                    0.0010       0.21   0.0048  2.39    10
## [1627] {napkins,                                                                                        
##         specialty chocolate}       => {soda}                      0.0010       0.42   0.0024  2.39    10
## [1628] {dessert,                                                                                        
##         rolls/buns,                                                                                     
##         whole milk}                => {soda}                      0.0010       0.42   0.0024  2.39    10
## [1629] {pastry,                                                                                         
##         sliced cheese}             => {yogurt}                    0.0012       0.33   0.0037  2.39    12
## [1630] {coffee,                                                                                         
##         oil}                       => {yogurt}                    0.0011       0.33   0.0034  2.39    11
## [1631] {oil,                                                                                            
##         rolls/buns,                                                                                     
##         whole milk}                => {yogurt}                    0.0010       0.33   0.0031  2.39    10
## [1632] {canned beer,                                                                                    
##         rolls/buns,                                                                                     
##         soda}                      => {yogurt}                    0.0010       0.33   0.0031  2.39    10
## [1633] {bottled water,                                                                                  
##         rolls/buns,                                                                                     
##         sausage}                   => {yogurt}                    0.0013       0.33   0.0040  2.39    13
## [1634] {other vegetables,                                                                               
##         whole milk}                => {pip fruit}                 0.0135       0.18   0.0748  2.39   133
## [1635] {long life bakery product,                                                                       
##         whole milk}                => {pip fruit}                 0.0024       0.18   0.0135  2.39    24
## [1636] {red/blush wine,                                                                                 
##         whole milk}                => {other vegetables}          0.0018       0.46   0.0040  2.39    18
## [1637] {newspapers,                                                                                     
##         rolls/buns,                                                                                     
##         whole milk,                                                                                     
##         yogurt}                    => {other vegetables}          0.0012       0.46   0.0026  2.39    12
## [1638] {hamburger meat,                                                                                 
##         yogurt}                    => {whole milk}                0.0040       0.61   0.0065  2.38    39
## [1639] {candy,                                                                                          
##         shopping bags}             => {tropical fruit}            0.0011       0.25   0.0045  2.38    11
## [1640] {hamburger meat,                                                                                 
##         yogurt}                    => {tropical fruit}            0.0016       0.25   0.0065  2.38    16
## [1641] {butter,                                                                                         
##         rolls/buns,                                                                                     
##         yogurt}                    => {tropical fruit}            0.0011       0.25   0.0045  2.38    11
## [1642] {fruit/vegetable juice,                                                                          
##         whipped/sour cream,                                                                             
##         whole milk}                => {tropical fruit}            0.0011       0.25   0.0045  2.38    11
## [1643] {onions,                                                                                         
##         root vegetables,                                                                                
##         yogurt}                    => {whole milk}                0.0014       0.61   0.0023  2.38    14
## [1644] {chocolate,                                                                                      
##         soda,                                                                                           
##         tropical fruit}            => {whole milk}                0.0014       0.61   0.0023  2.38    14
## [1645] {grapes,                                                                                         
##         other vegetables,                                                                               
##         whole milk}                => {bottled water}             0.0010       0.26   0.0039  2.38    10
## [1646] {beef,                                                                                           
##         whipped/sour cream}        => {citrus fruit}              0.0013       0.20   0.0067  2.38    13
## [1647] {chocolate,                                                                                      
##         long life bakery product}  => {pastry}                    0.0011       0.21   0.0053  2.38    11
## [1648] {frozen vegetables,                                                                              
##         margarine}                 => {other vegetables}          0.0023       0.46   0.0051  2.38    23
## [1649] {other vegetables,                                                                               
##         whole milk,                                                                                     
##         yogurt}                    => {domestic eggs}             0.0034       0.15   0.0223  2.37    33
## [1650] {butter,                                                                                         
##         sausage}                   => {root vegetables}           0.0022       0.26   0.0086  2.37    22
## [1651] {napkins,                                                                                        
##         root vegetables}           => {other vegetables}          0.0046       0.46   0.0100  2.37    45
## [1652] {other vegetables,                                                                               
##         root vegetables,                                                                                
##         yogurt}                    => {whole milk}                0.0078       0.61   0.0129  2.37    77
## [1653] {citrus fruit,                                                                                   
##         frozen vegetables}         => {brown bread}               0.0010       0.15   0.0066  2.37    10
## [1654] {fruit/vegetable juice,                                                                          
##         whole milk}                => {pip fruit}                 0.0048       0.18   0.0266  2.37    47
## [1655] {chicken,                                                                                        
##         other vegetables,                                                                               
##         whipped/sour cream}        => {whole milk}                0.0023       0.61   0.0039  2.37    23
## [1656] {bottled water,                                                                                  
##         root vegetables,                                                                                
##         yogurt}                    => {whole milk}                0.0023       0.61   0.0039  2.37    23
## [1657] {butter,                                                                                         
##         curd,                                                                                           
##         whole milk}                => {other vegetables}          0.0022       0.46   0.0049  2.37    22
## [1658] {brown bread,                                                                                    
##         fruit/vegetable juice,                                                                          
##         soda}                      => {other vegetables}          0.0011       0.46   0.0024  2.37    11
## [1659] {domestic eggs,                                                                                  
##         root vegetables}           => {tropical fruit}            0.0036       0.25   0.0143  2.37    35
## [1660] {frankfurter,                                                                                    
##         margarine}                 => {sausage}                   0.0014       0.22   0.0064  2.37    14
## [1661] {onions,                                                                                         
##         root vegetables,                                                                                
##         yogurt}                    => {rolls/buns}                0.0010       0.43   0.0023  2.36    10
## [1662] {pastry,                                                                                         
##         root vegetables,                                                                                
##         sausage}                   => {rolls/buns}                0.0010       0.43   0.0023  2.36    10
## [1663] {frankfurter,                                                                                    
##         pastry}                    => {fruit/vegetable juice}     0.0014       0.17   0.0083  2.36    14
## [1664] {baking powder}             => {citrus fruit}              0.0035       0.20   0.0177  2.36    34
## [1665] {candy,                                                                                          
##         whole milk}                => {pastry}                    0.0017       0.21   0.0082  2.36    17
## [1666] {frankfurter,                                                                                    
##         pip fruit}                 => {whipped/sour cream}        0.0012       0.17   0.0072  2.36    12
## [1667] {soda,                                                                                           
##         tropical fruit,                                                                                 
##         whole milk}                => {whipped/sour cream}        0.0013       0.17   0.0078  2.36    13
## [1668] {beef,                                                                                           
##         rolls/buns,                                                                                     
##         whole milk}                => {yogurt}                    0.0022       0.33   0.0068  2.35    22
## [1669] {butter,                                                                                         
##         root vegetables}           => {bottled water}             0.0034       0.26   0.0129  2.35    33
## [1670] {napkins,                                                                                        
##         newspapers}                => {yogurt}                    0.0020       0.33   0.0062  2.35    20
## [1671] {butter milk,                                                                                    
##         domestic eggs}             => {other vegetables}          0.0010       0.45   0.0022  2.35    10
## [1672] {bottled beer,                                                                                   
##         onions}                    => {other vegetables}          0.0015       0.45   0.0034  2.35    15
## [1673] {brown bread,                                                                                    
##         frankfurter,                                                                                    
##         yogurt}                    => {other vegetables}          0.0010       0.45   0.0022  2.35    10
## [1674] {pip fruit,                                                                                      
##         shopping bags,                                                                                  
##         whole milk}                => {other vegetables}          0.0015       0.45   0.0034  2.35    15
## [1675] {detergent,                                                                                      
##         frankfurter}               => {whole milk}                0.0012       0.60   0.0020  2.35    12
## [1676] {butter,                                                                                         
##         meat}                      => {whole milk}                0.0018       0.60   0.0031  2.35    18
## [1677] {onions,                                                                                         
##         rolls/buns,                                                                                     
##         root vegetables}           => {whole milk}                0.0015       0.60   0.0025  2.35    15
## [1678] {cream cheese,                                                                                   
##         curd,                                                                                           
##         root vegetables}           => {whole milk}                0.0012       0.60   0.0020  2.35    12
## [1679] {bottled beer,                                                                                   
##         fruit/vegetable juice,                                                                          
##         yogurt}                    => {whole milk}                0.0012       0.60   0.0020  2.35    12
## [1680] {margarine,                                                                                      
##         pastry,                                                                                         
##         yogurt}                    => {whole milk}                0.0015       0.60   0.0025  2.35    15
## [1681] {chicken}                   => {whipped/sour cream}        0.0072       0.17   0.0429  2.35    71
## [1682] {citrus fruit,                                                                                   
##         tropical fruit}            => {other vegetables}          0.0090       0.45   0.0199  2.35    89
## [1683] {chicken,                                                                                        
##         sausage}                   => {yogurt}                    0.0017       0.33   0.0053  2.34    17
## [1684] {butter,                                                                                         
##         chocolate}                 => {tropical fruit}            0.0015       0.25   0.0062  2.34    15
## [1685] {newspapers,                                                                                     
##         sausage}                   => {brown bread}               0.0012       0.15   0.0080  2.34    12
## [1686] {butter,                                                                                         
##         frozen vegetables}         => {tropical fruit}            0.0014       0.25   0.0058  2.34    14
## [1687] {chicken,                                                                                        
##         whipped/sour cream}        => {fruit/vegetable juice}     0.0012       0.17   0.0072  2.34    12
## [1688] {frozen dessert}            => {tropical fruit}            0.0026       0.25   0.0108  2.34    26
## [1689] {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         rolls/buns}                => {newspapers}                0.0011       0.19   0.0060  2.34    11
## [1690] {pastry,                                                                                         
##         tropical fruit,                                                                                 
##         whole milk}                => {brown bread}               0.0010       0.15   0.0067  2.34    10
## [1691] {onions,                                                                                         
##         rolls/buns,                                                                                     
##         whole milk}                => {other vegetables}          0.0014       0.45   0.0032  2.33    14
## [1692] {domestic eggs,                                                                                  
##         sausage,                                                                                        
##         soda}                      => {other vegetables}          0.0014       0.45   0.0032  2.33    14
## [1693] {fruit/vegetable juice,                                                                          
##         napkins}                   => {pip fruit}                 0.0012       0.18   0.0069  2.33    12
## [1694] {citrus fruit,                                                                                   
##         soda}                      => {yogurt}                    0.0042       0.33   0.0128  2.33    41
## [1695] {chicken,                                                                                        
##         soda,                                                                                           
##         whole milk}                => {rolls/buns}                0.0015       0.43   0.0036  2.33    15
## [1696] {sausage,                                                                                        
##         shopping bags,                                                                                  
##         soda}                      => {rolls/buns}                0.0024       0.43   0.0057  2.33    24
## [1697] {newspapers,                                                                                     
##         whipped/sour cream}        => {other vegetables}          0.0033       0.45   0.0072  2.33    32
## [1698] {cat food,                                                                                       
##         other vegetables}          => {sausage}                   0.0014       0.22   0.0065  2.33    14
## [1699] {newspapers,                                                                                     
##         whipped/sour cream}        => {root vegetables}           0.0018       0.25   0.0072  2.33    18
## [1700] {beef,                                                                                           
##         napkins}                   => {other vegetables}          0.0018       0.45   0.0041  2.33    18
## [1701] {domestic eggs,                                                                                  
##         oil}                       => {yogurt}                    0.0012       0.32   0.0038  2.32    12
## [1702] {pastry,                                                                                         
##         rolls/buns,                                                                                     
##         root vegetables}           => {yogurt}                    0.0012       0.32   0.0038  2.32    12
## [1703] {butter,                                                                                         
##         fruit/vegetable juice}     => {root vegetables}           0.0020       0.25   0.0080  2.32    20
## [1704] {other vegetables,                                                                               
##         whipped/sour cream,                                                                             
##         whole milk,                                                                                     
##         yogurt}                    => {sausage}                   0.0012       0.22   0.0056  2.32    12
## [1705] {margarine,                                                                                      
##         other vegetables,                                                                               
##         whole milk}                => {bottled beer}              0.0017       0.19   0.0093  2.32    17
## [1706] {butter,                                                                                         
##         frozen meals}              => {whole milk}                0.0016       0.59   0.0027  2.32    16
## [1707] {coffee,                                                                                         
##         pastry}                    => {yogurt}                    0.0022       0.32   0.0069  2.32    22
## [1708] {coffee,                                                                                         
##         other vegetables,                                                                               
##         root vegetables}           => {yogurt}                    0.0011       0.32   0.0035  2.32    11
## [1709] {jam,                                                                                            
##         whole milk}                => {other vegetables}          0.0013       0.45   0.0029  2.32    13
## [1710] {frozen vegetables,                                                                              
##         sausage,                                                                                        
##         whole milk}                => {other vegetables}          0.0013       0.45   0.0029  2.32    13
## [1711] {oil,                                                                                            
##         tropical fruit}            => {sausage}                   0.0010       0.22   0.0047  2.31    10
## [1712] {pork,                                                                                           
##         yogurt}                    => {citrus fruit}              0.0018       0.19   0.0096  2.31    18
## [1713] {beef,                                                                                           
##         pork,                                                                                           
##         rolls/buns}                => {whole milk}                0.0013       0.59   0.0022  2.31    13
## [1714] {domestic eggs,                                                                                  
##         shopping bags,                                                                                  
##         yogurt}                    => {whole milk}                0.0013       0.59   0.0022  2.31    13
## [1715] {chicken,                                                                                        
##         coffee}                    => {other vegetables}          0.0017       0.45   0.0039  2.31    17
## [1716] {root vegetables,                                                                                
##         sausage,                                                                                        
##         whole milk}                => {other vegetables}          0.0035       0.45   0.0077  2.31    34
## [1717] {butter,                                                                                         
##         domestic eggs}             => {tropical fruit}            0.0023       0.24   0.0097  2.31    23
## [1718] {oil,                                                                                            
##         root vegetables,                                                                                
##         whole milk}                => {shopping bags}             0.0010       0.23   0.0045  2.31    10
## [1719] {root vegetables,                                                                                
##         whipped/sour cream}        => {fruit/vegetable juice}     0.0028       0.17   0.0171  2.31    28
## [1720] {butter,                                                                                         
##         whipped/sour cream,                                                                             
##         whole milk}                => {fruit/vegetable juice}     0.0011       0.17   0.0067  2.31    11
## [1721] {brown bread,                                                                                    
##         semi-finished bread}       => {whole milk}                0.0010       0.59   0.0017  2.30    10
## [1722] {hamburger meat,                                                                                 
##         meat}                      => {whole milk}                0.0010       0.59   0.0017  2.30    10
## [1723] {citrus fruit,                                                                                   
##         hard cheese,                                                                                    
##         other vegetables}          => {whole milk}                0.0010       0.59   0.0017  2.30    10
## [1724] {beef,                                                                                           
##         onions,                                                                                         
##         other vegetables}          => {whole milk}                0.0010       0.59   0.0017  2.30    10
## [1725] {frozen vegetables,                                                                              
##         napkins,                                                                                        
##         yogurt}                    => {whole milk}                0.0010       0.59   0.0017  2.30    10
## [1726] {beef,                                                                                           
##         other vegetables,                                                                               
##         yogurt}                    => {whole milk}                0.0031       0.59   0.0052  2.30    30
## [1727] {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         pork,                                                                                           
##         root vegetables}           => {whole milk}                0.0010       0.59   0.0017  2.30    10
## [1728] {sausage,                                                                                        
##         whole milk}                => {tropical fruit}            0.0072       0.24   0.0299  2.30    71
## [1729] {citrus fruit,                                                                                   
##         newspapers,                                                                                     
##         yogurt}                    => {rolls/buns}                0.0011       0.42   0.0026  2.30    11
## [1730] {pastry,                                                                                         
##         rolls/buns,                                                                                     
##         soda}                      => {yogurt}                    0.0017       0.32   0.0054  2.30    17
## [1731] {butter milk,                                                                                    
##         tropical fruit}            => {other vegetables}          0.0024       0.44   0.0055  2.30    24
## [1732] {berries,                                                                                        
##         root vegetables,                                                                                
##         whole milk}                => {other vegetables}          0.0016       0.44   0.0037  2.30    16
## [1733] {beef,                                                                                           
##         citrus fruit}              => {tropical fruit}            0.0020       0.24   0.0084  2.30    20
## [1734] {citrus fruit,                                                                                   
##         pip fruit,                                                                                      
##         whole milk}                => {sausage}                   0.0011       0.22   0.0052  2.30    11
## [1735] {rolls/buns,                                                                                     
##         sliced cheese}             => {yogurt}                    0.0024       0.32   0.0076  2.29    24
## [1736] {bottled water,                                                                                  
##         citrus fruit,                                                                                   
##         other vegetables}          => {yogurt}                    0.0016       0.32   0.0051  2.29    16
## [1737] {other vegetables,                                                                               
##         specialty chocolate}       => {root vegetables}           0.0015       0.25   0.0061  2.29    15
## [1738] {pip fruit,                                                                                      
##         waffles}                   => {root vegetables}           0.0011       0.25   0.0045  2.29    11
## [1739] {long life bakery product,                                                                       
##         whole milk}                => {tropical fruit}            0.0033       0.24   0.0135  2.29    32
## [1740] {newspapers,                                                                                     
##         sausage}                   => {tropical fruit}            0.0019       0.24   0.0080  2.29    19
## [1741] {bottled water,                                                                                  
##         tropical fruit,                                                                                 
##         whole milk}                => {other vegetables}          0.0036       0.44   0.0080  2.29    35
## [1742] {berries,                                                                                        
##         domestic eggs}             => {rolls/buns}                0.0016       0.42   0.0039  2.29    16
## [1743] {salty snack,                                                                                    
##         yogurt}                    => {other vegetables}          0.0027       0.44   0.0062  2.29    27
## [1744] {bottled water,                                                                                  
##         other vegetables,                                                                               
##         sausage}                   => {tropical fruit}            0.0012       0.24   0.0051  2.29    12
## [1745] {brown bread,                                                                                    
##         rolls/buns,                                                                                     
##         whole milk}                => {other vegetables}          0.0023       0.44   0.0053  2.29    23
## [1746] {bottled water,                                                                                  
##         whipped/sour cream}        => {other vegetables}          0.0039       0.44   0.0087  2.28    38
## [1747] {chocolate,                                                                                      
##         other vegetables,                                                                               
##         pip fruit}                 => {whole milk}                0.0014       0.58   0.0024  2.28    14
## [1748] {rolls/buns,                                                                                     
##         sausage,                                                                                        
##         whipped/sour cream}        => {whole milk}                0.0014       0.58   0.0024  2.28    14
## [1749] {canned beer,                                                                                    
##         other vegetables}          => {shopping bags}             0.0020       0.22   0.0090  2.28    20
## [1750] {butter milk,                                                                                    
##         rolls/buns,                                                                                     
##         whole milk}                => {other vegetables}          0.0015       0.44   0.0035  2.28    15
## [1751] {coffee,                                                                                         
##         margarine}                 => {tropical fruit}            0.0011       0.24   0.0047  2.28    11
## [1752] {rolls/buns,                                                                                     
##         sausage,                                                                                        
##         whole milk}                => {tropical fruit}            0.0022       0.24   0.0094  2.28    22
## [1753] {beverages,                                                                                      
##         whole milk}                => {tropical fruit}            0.0016       0.24   0.0068  2.28    16
## [1754] {curd,                                                                                           
##         other vegetables,                                                                               
##         whipped/sour cream}        => {whole milk}                0.0025       0.58   0.0044  2.28    25
## [1755] {domestic eggs,                                                                                  
##         ham}                       => {yogurt}                    0.0013       0.32   0.0042  2.27    13
## [1756] {beef,                                                                                           
##         other vegetables,                                                                               
##         pork}                      => {yogurt}                    0.0013       0.32   0.0042  2.27    13
## [1757] {dessert,                                                                                        
##         rolls/buns}                => {fruit/vegetable juice}     0.0011       0.16   0.0068  2.27    11
## [1758] {other vegetables,                                                                               
##         waffles}                   => {pastry}                    0.0020       0.20   0.0101  2.27    20
## [1759] {fruit/vegetable juice,                                                                          
##         sliced cheese}             => {other vegetables}          0.0018       0.44   0.0042  2.27    18
## [1760] {bottled water,                                                                                  
##         tropical fruit}            => {root vegetables}           0.0046       0.25   0.0185  2.27    45
## [1761] {pickled vegetables,                                                                             
##         whole milk}                => {pip fruit}                 0.0012       0.17   0.0071  2.27    12
## [1762] {margarine,                                                                                      
##         sausage}                   => {pip fruit}                 0.0012       0.17   0.0071  2.27    12
## [1763] {fruit/vegetable juice,                                                                          
##         hard cheese,                                                                                    
##         yogurt}                    => {whole milk}                0.0011       0.58   0.0019  2.27    11
## [1764] {coffee,                                                                                         
##         frankfurter,                                                                                    
##         other vegetables}          => {whole milk}                0.0011       0.58   0.0019  2.27    11
## [1765] {fruit/vegetable juice,                                                                          
##         root vegetables,                                                                                
##         shopping bags}             => {whole milk}                0.0011       0.58   0.0019  2.27    11
## [1766] {other vegetables,                                                                               
##         UHT-milk}                  => {citrus fruit}              0.0015       0.19   0.0081  2.27    15
## [1767] {other vegetables,                                                                               
##         root vegetables,                                                                                
##         soda,                                                                                           
##         yogurt}                    => {rolls/buns}                0.0010       0.42   0.0024  2.27    10
## [1768] {brown bread,                                                                                    
##         canned beer}               => {sausage}                   0.0010       0.21   0.0048  2.26    10
## [1769] {flour,                                                                                          
##         yogurt}                    => {bottled water}             0.0012       0.25   0.0049  2.26    12
## [1770] {cream cheese,                                                                                   
##         fruit/vegetable juice}     => {bottled water}             0.0014       0.25   0.0057  2.26    14
## [1771] {rolls/buns,                                                                                     
##         sausage,                                                                                        
##         yogurt}                    => {tropical fruit}            0.0014       0.24   0.0060  2.26    14
## [1772] {frozen fish,                                                                                    
##         yogurt}                    => {other vegetables}          0.0014       0.44   0.0033  2.26    14
## [1773] {chicken,                                                                                        
##         whipped/sour cream}        => {whole milk}                0.0042       0.58   0.0072  2.26    41
## [1774] {processed cheese,                                                                               
##         sausage}                   => {soda}                      0.0013       0.39   0.0034  2.26    13
## [1775] {bottled water,                                                                                  
##         napkins,                                                                                        
##         tropical fruit}            => {whole milk}                0.0015       0.58   0.0026  2.26    15
## [1776] {other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         whipped/sour cream}        => {sausage}                   0.0014       0.21   0.0067  2.26    14
## [1777] {grapes,                                                                                         
##         other vegetables}          => {yogurt}                    0.0028       0.31   0.0090  2.26    28
## [1778] {whole milk,                                                                                     
##         yogurt}                    => {pip fruit}                 0.0096       0.17   0.0560  2.26    94
## [1779] {berries,                                                                                        
##         napkins}                   => {soda}                      0.0011       0.39   0.0028  2.25    11
## [1780] {dessert,                                                                                        
##         sausage,                                                                                        
##         whole milk}                => {soda}                      0.0011       0.39   0.0028  2.25    11
## [1781] {bottled water,                                                                                  
##         pip fruit}                 => {sausage}                   0.0022       0.21   0.0106  2.25    22
## [1782] {curd,                                                                                           
##         margarine}                 => {other vegetables}          0.0027       0.44   0.0063  2.25    27
## [1783] {domestic eggs,                                                                                  
##         margarine,                                                                                      
##         whole milk}                => {yogurt}                    0.0016       0.31   0.0052  2.25    16
## [1784] {other vegetables,                                                                               
##         soda,                                                                                           
##         tropical fruit}            => {sausage}                   0.0015       0.21   0.0072  2.25    15
## [1785] {citrus fruit,                                                                                   
##         napkins}                   => {pastry}                    0.0015       0.20   0.0076  2.25    15
## [1786] {newspapers,                                                                                     
##         rolls/buns,                                                                                     
##         whole milk}                => {pastry}                    0.0015       0.20   0.0076  2.25    15
## [1787] {mustard,                                                                                        
##         sausage}                   => {other vegetables}          0.0010       0.43   0.0023  2.25    10
## [1788] {pip fruit,                                                                                      
##         processed cheese}          => {other vegetables}          0.0010       0.43   0.0023  2.25    10
## [1789] {bottled water,                                                                                  
##         root vegetables,                                                                                
##         whipped/sour cream}        => {other vegetables}          0.0010       0.43   0.0023  2.25    10
## [1790] {pastry,                                                                                         
##         sausage}                   => {tropical fruit}            0.0029       0.24   0.0125  2.25    29
## [1791] {hard cheese,                                                                                    
##         whole milk}                => {other vegetables}          0.0044       0.43   0.0101  2.24    43
## [1792] {domestic eggs,                                                                                  
##         whole milk,                                                                                     
##         yogurt}                    => {other vegetables}          0.0034       0.43   0.0077  2.24    33
## [1793] {bottled water,                                                                                  
##         domestic eggs}             => {root vegetables}           0.0022       0.24   0.0092  2.24    22
## [1794] {hamburger meat,                                                                                 
##         sausage}                   => {tropical fruit}            0.0012       0.24   0.0052  2.24    12
## [1795] {chocolate,                                                                                      
##         fruit/vegetable juice,                                                                          
##         whole milk}                => {yogurt}                    0.0010       0.31   0.0033  2.24    10
## [1796] {onions,                                                                                         
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk}                => {yogurt}                    0.0010       0.31   0.0033  2.24    10
## [1797] {newspapers,                                                                                     
##         rolls/buns,                                                                                     
##         tropical fruit}            => {root vegetables}           0.0010       0.24   0.0042  2.24    10
## [1798] {newspapers,                                                                                     
##         shopping bags}             => {fruit/vegetable juice}     0.0011       0.16   0.0069  2.24    11
## [1799] {frozen meals,                                                                                   
##         whipped/sour cream}        => {whole milk}                0.0016       0.57   0.0028  2.24    16
## [1800] {hamburger meat,                                                                                 
##         white bread}               => {whole milk}                0.0016       0.57   0.0028  2.24    16
## [1801] {chicken,                                                                                        
##         other vegetables,                                                                               
##         rolls/buns}                => {whole milk}                0.0028       0.57   0.0050  2.24    28
## [1802] {beef,                                                                                           
##         rolls/buns,                                                                                     
##         root vegetables}           => {whole milk}                0.0028       0.57   0.0050  2.24    28
## [1803] {other vegetables,                                                                               
##         pastry,                                                                                         
##         rolls/buns,                                                                                     
##         yogurt}                    => {whole milk}                0.0012       0.57   0.0021  2.24    12
## [1804] {margarine,                                                                                      
##         root vegetables}           => {yogurt}                    0.0035       0.31   0.0111  2.24    34
## [1805] {brown bread,                                                                                    
##         soda,                                                                                           
##         whole milk}                => {shopping bags}             0.0011       0.22   0.0051  2.23    11
## [1806] {margarine,                                                                                      
##         tropical fruit}            => {citrus fruit}              0.0017       0.18   0.0094  2.23    17
## [1807] {brown bread,                                                                                    
##         dessert}                   => {tropical fruit}            0.0011       0.23   0.0048  2.23    11
## [1808] {candy,                                                                                          
##         pastry}                    => {soda}                      0.0014       0.39   0.0037  2.23    14
## [1809] {curd,                                                                                           
##         whipped/sour cream}        => {citrus fruit}              0.0019       0.18   0.0105  2.23    19
## [1810] {brown bread,                                                                                    
##         whole milk,                                                                                     
##         yogurt}                    => {root vegetables}           0.0017       0.24   0.0071  2.23    17
## [1811] {bottled water,                                                                                  
##         citrus fruit,                                                                                   
##         whole milk}                => {yogurt}                    0.0018       0.31   0.0059  2.22    18
## [1812] {butter,                                                                                         
##         curd}                      => {sausage}                   0.0014       0.21   0.0068  2.22    14
## [1813] {rolls/buns,                                                                                     
##         tropical fruit,                                                                                 
##         yogurt}                    => {other vegetables}          0.0038       0.43   0.0087  2.22    37
## [1814] {ham,                                                                                            
##         whole milk}                => {pip fruit}                 0.0019       0.17   0.0115  2.22    19
## [1815] {shopping bags,                                                                                  
##         white bread}               => {tropical fruit}            0.0017       0.23   0.0074  2.22    17
## [1816] {frankfurter,                                                                                    
##         newspapers}                => {rolls/buns}                0.0020       0.41   0.0050  2.22    20
## [1817] {pip fruit,                                                                                      
##         sausage,                                                                                        
##         tropical fruit}            => {whole milk}                0.0017       0.57   0.0031  2.22    17
## [1818] {bottled water,                                                                                  
##         frankfurter}               => {sausage}                   0.0015       0.21   0.0073  2.22    15
## [1819] {citrus fruit,                                                                                   
##         onions}                    => {yogurt}                    0.0017       0.31   0.0056  2.22    17
## [1820] {dishes,                                                                                         
##         napkins}                   => {rolls/buns}                0.0011       0.41   0.0027  2.21    11
## [1821] {hygiene articles,                                                                               
##         napkins,                                                                                        
##         whole milk}                => {other vegetables}          0.0012       0.43   0.0028  2.21    12
## [1822] {napkins,                                                                                        
##         rolls/buns,                                                                                     
##         yogurt}                    => {other vegetables}          0.0015       0.43   0.0036  2.21    15
## [1823] {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         whipped/sour cream}        => {shopping bags}             0.0012       0.22   0.0056  2.21    12
## [1824] {rolls/buns,                                                                                     
##         sliced cheese}             => {fruit/vegetable juice}     0.0012       0.16   0.0076  2.21    12
## [1825] {beef,                                                                                           
##         curd}                      => {whole milk}                0.0026       0.57   0.0047  2.21    26
## [1826] {citrus fruit,                                                                                   
##         napkins,                                                                                        
##         root vegetables}           => {whole milk}                0.0013       0.57   0.0023  2.21    13
## [1827] {butter,                                                                                         
##         citrus fruit,                                                                                   
##         other vegetables}          => {bottled water}             0.0011       0.24   0.0046  2.21    11
## [1828] {dessert,                                                                                        
##         shopping bags}             => {pastry}                    0.0012       0.20   0.0062  2.21    12
## [1829] {soda,                                                                                           
##         whipped/sour cream,                                                                             
##         whole milk}                => {root vegetables}           0.0013       0.24   0.0055  2.21    13
## [1830] {fruit/vegetable juice,                                                                          
##         whole milk,                                                                                     
##         yogurt}                    => {citrus fruit}              0.0017       0.18   0.0095  2.21    17
## [1831] {root vegetables,                                                                                
##         sliced cheese}             => {whole milk}                0.0032       0.56   0.0056  2.21    31
## [1832] {berries,                                                                                        
##         rolls/buns,                                                                                     
##         yogurt}                    => {soda}                      0.0010       0.38   0.0026  2.21    10
## [1833] {citrus fruit,                                                                                   
##         whole milk}                => {other vegetables}          0.0130       0.43   0.0305  2.21   128
## [1834] {cake bar,                                                                                       
##         other vegetables}          => {rolls/buns}                0.0015       0.41   0.0038  2.20    15
## [1835] {pip fruit,                                                                                      
##         rolls/buns,                                                                                     
##         whole milk}                => {other vegetables}          0.0026       0.43   0.0062  2.20    26
## [1836] {other vegetables,                                                                               
##         white bread,                                                                                    
##         whole milk}                => {sausage}                   0.0012       0.21   0.0059  2.20    12
## [1837] {newspapers,                                                                                     
##         tropical fruit,                                                                                 
##         yogurt}                    => {rolls/buns}                0.0017       0.40   0.0043  2.20    17
## [1838] {chocolate,                                                                                      
##         yogurt}                    => {tropical fruit}            0.0021       0.23   0.0093  2.20    21
## [1839] {long life bakery product,                                                                       
##         whipped/sour cream}        => {whole milk}                0.0033       0.56   0.0058  2.20    32
## [1840] {hard cheese,                                                                                    
##         root vegetables}           => {citrus fruit}              0.0010       0.18   0.0056  2.20    10
## [1841] {frozen vegetables,                                                                              
##         pork}                      => {fruit/vegetable juice}     0.0010       0.16   0.0064  2.20    10
## [1842] {frankfurter,                                                                                    
##         rolls/buns,                                                                                     
##         yogurt}                    => {whole milk}                0.0023       0.56   0.0042  2.20    23
## [1843] {domestic eggs,                                                                                  
##         pip fruit}                 => {yogurt}                    0.0026       0.31   0.0086  2.19    26
## [1844] {domestic eggs,                                                                                  
##         sliced cheese}             => {other vegetables}          0.0014       0.42   0.0034  2.19    14
## [1845] {brown bread,                                                                                    
##         root vegetables}           => {whole milk}                0.0057       0.56   0.0102  2.19    56
## [1846] {frankfurter,                                                                                    
##         root vegetables,                                                                                
##         sausage}                   => {whole milk}                0.0014       0.56   0.0025  2.19    14
## [1847] {frozen meals,                                                                                   
##         frozen vegetables}         => {yogurt}                    0.0011       0.31   0.0037  2.19    11
## [1848] {curd,                                                                                           
##         other vegetables,                                                                               
##         rolls/buns}                => {yogurt}                    0.0011       0.31   0.0037  2.19    11
## [1849] {butter,                                                                                         
##         other vegetables,                                                                               
##         whole milk}                => {pastry}                    0.0022       0.19   0.0115  2.19    22
## [1850] {root vegetables,                                                                                
##         whipped/sour cream,                                                                             
##         yogurt}                    => {newspapers}                0.0011       0.17   0.0064  2.19    11
## [1851] {candy,                                                                                          
##         long life bakery product}  => {other vegetables}          0.0011       0.42   0.0026  2.19    11
## [1852] {coffee,                                                                                         
##         pip fruit,                                                                                      
##         whole milk}                => {other vegetables}          0.0011       0.42   0.0026  2.19    11
## [1853] {frozen vegetables,                                                                              
##         pip fruit}                 => {pastry}                    0.0014       0.19   0.0073  2.19    14
## [1854] {processed cheese,                                                                               
##         tropical fruit}            => {soda}                      0.0016       0.38   0.0043  2.18    16
## [1855] {butter,                                                                                         
##         frankfurter}               => {tropical fruit}            0.0011       0.23   0.0049  2.18    11
## [1856] {butter,                                                                                         
##         soda}                      => {bottled water}             0.0021       0.24   0.0088  2.18    21
## [1857] {cat food,                                                                                       
##         root vegetables}           => {yogurt}                    0.0014       0.30   0.0047  2.18    14
## [1858] {soda,                                                                                           
##         sugar}                     => {citrus fruit}              0.0013       0.18   0.0073  2.18    13
## [1859] {bottled water,                                                                                  
##         soda}                      => {bottled beer}              0.0051       0.18   0.0290  2.18    50
## [1860] {newspapers,                                                                                     
##         other vegetables,                                                                               
##         rolls/buns}                => {bottled water}             0.0013       0.24   0.0055  2.18    13
## [1861] {other vegetables,                                                                               
##         whole milk}                => {tropical fruit}            0.0171       0.23   0.0748  2.18   168
## [1862] {newspapers,                                                                                     
##         salty snack}               => {soda}                      0.0011       0.38   0.0029  2.18    11
## [1863] {butter,                                                                                         
##         frozen vegetables,                                                                              
##         other vegetables}          => {rolls/buns}                0.0010       0.40   0.0025  2.17    10
## [1864] {bottled water,                                                                                  
##         margarine,                                                                                      
##         yogurt}                    => {rolls/buns}                0.0014       0.40   0.0036  2.17    14
## [1865] {detergent,                                                                                      
##         oil}                       => {whole milk}                0.0010       0.56   0.0018  2.17    10
## [1866] {coffee,                                                                                         
##         flour}                     => {whole milk}                0.0010       0.56   0.0018  2.17    10
## [1867] {bottled water,                                                                                  
##         grapes,                                                                                         
##         other vegetables}          => {whole milk}                0.0010       0.56   0.0018  2.17    10
## [1868] {butter milk,                                                                                    
##         other vegetables,                                                                               
##         pork}                      => {whole milk}                0.0010       0.56   0.0018  2.17    10
## [1869] {curd,                                                                                           
##         margarine,                                                                                      
##         pip fruit}                 => {whole milk}                0.0010       0.56   0.0018  2.17    10
## [1870] {pork,                                                                                           
##         tropical fruit,                                                                                 
##         yogurt}                    => {whole milk}                0.0015       0.56   0.0027  2.17    15
## [1871] {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         pip fruit,                                                                                      
##         tropical fruit}            => {whole milk}                0.0010       0.56   0.0018  2.17    10
## [1872] {pickled vegetables,                                                                             
##         whole milk}                => {fruit/vegetable juice}     0.0011       0.16   0.0071  2.17    11
## [1873] {domestic eggs,                                                                                  
##         frankfurter}               => {other vegetables}          0.0029       0.42   0.0070  2.17    29
## [1874] {oil,                                                                                            
##         rolls/buns}                => {bottled water}             0.0012       0.24   0.0051  2.17    12
## [1875] {domestic eggs,                                                                                  
##         white bread}               => {pastry}                    0.0011       0.19   0.0058  2.17    11
## [1876] {pastry,                                                                                         
##         whipped/sour cream}        => {whole milk}                0.0042       0.55   0.0075  2.17    41
## [1877] {brown bread,                                                                                    
##         soda,                                                                                           
##         yogurt}                    => {other vegetables}          0.0013       0.42   0.0032  2.17    13
## [1878] {bottled water,                                                                                  
##         salty snack}               => {yogurt}                    0.0013       0.30   0.0044  2.17    13
## [1879] {citrus fruit,                                                                                   
##         white bread}               => {tropical fruit}            0.0010       0.23   0.0045  2.17    10
## [1880] {brown bread,                                                                                    
##         sausage}                   => {other vegetables}          0.0045       0.42   0.0107  2.17    44
## [1881] {sausage,                                                                                        
##         whipped/sour cream}        => {root vegetables}           0.0021       0.24   0.0090  2.16    21
## [1882] {other vegetables,                                                                               
##         sausage}                   => {yogurt}                    0.0081       0.30   0.0269  2.16    80
## [1883] {butter,                                                                                         
##         domestic eggs}             => {citrus fruit}              0.0017       0.18   0.0097  2.16    17
## [1884] {frozen vegetables,                                                                              
##         other vegetables,                                                                               
##         yogurt}                    => {pastry}                    0.0010       0.19   0.0053  2.16    10
## [1885] {rolls/buns,                                                                                     
##         root vegetables,                                                                                
##         tropical fruit}            => {newspapers}                0.0010       0.17   0.0059  2.16    10
## [1886] {hygiene articles,                                                                               
##         soda}                      => {sausage}                   0.0014       0.20   0.0070  2.16    14
## [1887] {margarine,                                                                                      
##         pip fruit}                 => {whipped/sour cream}        0.0013       0.15   0.0085  2.16    13
## [1888] {bottled beer,                                                                                   
##         whole milk,                                                                                     
##         yogurt}                    => {root vegetables}           0.0012       0.24   0.0052  2.16    12
## [1889] {bottled beer,                                                                                   
##         sausage}                   => {fruit/vegetable juice}     0.0012       0.16   0.0078  2.16    12
## [1890] {fruit/vegetable juice,                                                                          
##         white bread}               => {pastry}                    0.0014       0.19   0.0074  2.16    14
## [1891] {instant coffee,                                                                                 
##         soda}                      => {other vegetables}          0.0010       0.42   0.0024  2.15    10
## [1892] {domestic eggs,                                                                                  
##         pickled vegetables}        => {other vegetables}          0.0010       0.42   0.0024  2.15    10
## [1893] {napkins,                                                                                        
##         pastry,                                                                                         
##         soda}                      => {other vegetables}          0.0010       0.42   0.0024  2.15    10
## [1894] {berries,                                                                                        
##         tropical fruit}            => {shopping bags}             0.0014       0.21   0.0067  2.15    14
## [1895] {chicken,                                                                                        
##         citrus fruit,                                                                                   
##         rolls/buns}                => {whole milk}                0.0011       0.55   0.0020  2.15    11
## [1896] {domestic eggs,                                                                                  
##         frozen vegetables,                                                                              
##         other vegetables}          => {whole milk}                0.0011       0.55   0.0020  2.15    11
## [1897] {other vegetables,                                                                               
##         whipped/sour cream,                                                                             
##         yogurt}                    => {whole milk}                0.0056       0.55   0.0102  2.15    55
## [1898] {brown bread,                                                                                    
##         whole milk}                => {tropical fruit}            0.0057       0.23   0.0252  2.15    56
## [1899] {brown bread,                                                                                    
##         other vegetables,                                                                               
##         root vegetables}           => {yogurt}                    0.0012       0.30   0.0041  2.15    12
## [1900] {napkins,                                                                                        
##         whipped/sour cream}        => {whole milk}                0.0040       0.55   0.0072  2.15    39
## [1901] {citrus fruit,                                                                                   
##         sugar}                     => {root vegetables}           0.0011       0.23   0.0048  2.15    11
## [1902] {domestic eggs,                                                                                  
##         rolls/buns,                                                                                     
##         whole milk}                => {other vegetables}          0.0027       0.42   0.0066  2.15    27
## [1903] {rolls/buns,                                                                                     
##         shopping bags}             => {canned beer}               0.0033       0.17   0.0195  2.15    32
## [1904] {butter,                                                                                         
##         root vegetables}           => {yogurt}                    0.0039       0.30   0.0129  2.14    38
## [1905] {sausage,                                                                                        
##         yogurt}                    => {other vegetables}          0.0081       0.41   0.0196  2.14    80
## [1906] {bottled water,                                                                                  
##         newspapers,                                                                                     
##         other vegetables}          => {rolls/buns}                0.0013       0.39   0.0034  2.14    13
## [1907] {coffee,                                                                                         
##         hamburger meat}            => {other vegetables}          0.0012       0.41   0.0029  2.14    12
## [1908] {bottled beer,                                                                                   
##         rolls/buns,                                                                                     
##         soda}                      => {other vegetables}          0.0012       0.41   0.0029  2.14    12
## [1909] {berries,                                                                                        
##         soda}                      => {bottled water}             0.0017       0.24   0.0073  2.14    17
## [1910] {margarine,                                                                                      
##         other vegetables,                                                                               
##         root vegetables}           => {tropical fruit}            0.0013       0.22   0.0059  2.14    13
## [1911] {sweet spreads,                                                                                  
##         yogurt}                    => {whole milk}                0.0012       0.55   0.0022  2.13    12
## [1912] {domestic eggs,                                                                                  
##         sliced cheese}             => {whole milk}                0.0018       0.55   0.0034  2.13    18
## [1913] {margarine,                                                                                      
##         newspapers,                                                                                     
##         other vegetables}          => {whole milk}                0.0012       0.55   0.0022  2.13    12
## [1914] {other vegetables,                                                                               
##         pastry,                                                                                         
##         shopping bags}             => {whole milk}                0.0018       0.55   0.0034  2.13    18
## [1915] {beef,                                                                                           
##         pastry}                    => {pip fruit}                 0.0010       0.16   0.0063  2.13    10
## [1916] {rolls/buns,                                                                                     
##         root vegetables,                                                                                
##         tropical fruit}            => {pastry}                    0.0011       0.19   0.0059  2.13    11
## [1917] {white bread,                                                                                    
##         whole milk}                => {root vegetables}           0.0040       0.23   0.0171  2.13    39
## [1918] {bottled beer,                                                                                   
##         brown bread}               => {bottled water}             0.0012       0.24   0.0052  2.13    12
## [1919] {bottled water,                                                                                  
##         citrus fruit,                                                                                   
##         other vegetables}          => {sausage}                   0.0010       0.20   0.0051  2.13    10
## [1920] {butter,                                                                                         
##         frozen vegetables}         => {whole milk}                0.0032       0.54   0.0058  2.13    31
## [1921] {rolls/buns,                                                                                     
##         soda,                                                                                           
##         whole milk}                => {pip fruit}                 0.0014       0.16   0.0088  2.13    14
## [1922] {other vegetables,                                                                               
##         root vegetables,                                                                                
##         soda}                      => {whole milk}                0.0045       0.54   0.0082  2.13    44
## [1923] {hygiene articles,                                                                               
##         other vegetables}          => {whole milk}                0.0052       0.54   0.0096  2.12    51
## [1924] {frozen meals,                                                                                   
##         other vegetables}          => {citrus fruit}              0.0013       0.18   0.0075  2.12    13
## [1925] {dessert,                                                                                        
##         white bread}               => {other vegetables}          0.0016       0.41   0.0040  2.12    16
## [1926] {canned vegetables}         => {pip fruit}                 0.0017       0.16   0.0108  2.12    17
## [1927] {brown bread,                                                                                    
##         fruit/vegetable juice,                                                                          
##         soda}                      => {whole milk}                0.0013       0.54   0.0024  2.12    13
## [1928] {bottled water,                                                                                  
##         rolls/buns,                                                                                     
##         tropical fruit,                                                                                 
##         yogurt}                    => {whole milk}                0.0013       0.54   0.0024  2.12    13
## [1929] {margarine,                                                                                      
##         pork}                      => {tropical fruit}            0.0014       0.22   0.0064  2.12    14
## [1930] {sausage,                                                                                        
##         sliced cheese}             => {pastry}                    0.0013       0.19   0.0070  2.12    13
## [1931] {rolls/buns,                                                                                     
##         soda,                                                                                           
##         yogurt}                    => {fruit/vegetable juice}     0.0013       0.15   0.0086  2.12    13
## [1932] {butter,                                                                                         
##         sliced cheese}             => {whole milk}                0.0020       0.54   0.0038  2.12    20
## [1933] {bottled water,                                                                                  
##         butter}                    => {other vegetables}          0.0037       0.41   0.0089  2.11    36
## [1934] {fruit/vegetable juice,                                                                          
##         sausage}                   => {whipped/sour cream}        0.0015       0.15   0.0101  2.11    15
## [1935] {root vegetables,                                                                                
##         tropical fruit,                                                                                 
##         whole milk}                => {fruit/vegetable juice}     0.0018       0.15   0.0120  2.11    18
## [1936] {domestic eggs,                                                                                  
##         yogurt}                    => {whole milk}                0.0077       0.54   0.0143  2.11    76
## [1937] {bottled water,                                                                                  
##         margarine,                                                                                      
##         whole milk}                => {rolls/buns}                0.0019       0.39   0.0050  2.11    19
## [1938] {curd,                                                                                           
##         tropical fruit,                                                                                 
##         whole milk}                => {pastry}                    0.0012       0.19   0.0065  2.11    12
## [1939] {bottled beer,                                                                                   
##         whipped/sour cream}        => {whole milk}                0.0021       0.54   0.0040  2.11    21
## [1940] {other vegetables,                                                                               
##         white bread,                                                                                    
##         yogurt}                    => {whole milk}                0.0021       0.54   0.0040  2.11    21
## [1941] {cat food,                                                                                       
##         yogurt}                    => {root vegetables}           0.0014       0.23   0.0062  2.11    14
## [1942] {dessert,                                                                                        
##         ham}                       => {other vegetables}          0.0011       0.41   0.0027  2.11    11
## [1943] {margarine,                                                                                      
##         tropical fruit}            => {fruit/vegetable juice}     0.0014       0.15   0.0094  2.10    14
## [1944] {frankfurter,                                                                                    
##         rolls/buns,                                                                                     
##         whole milk}                => {bottled beer}              0.0010       0.17   0.0060  2.10    10
## [1945] {misc. beverages,                                                                                
##         root vegetables}           => {soda}                      0.0011       0.37   0.0031  2.10    11
## [1946] {newspapers,                                                                                     
##         rolls/buns,                                                                                     
##         sausage}                   => {soda}                      0.0011       0.37   0.0031  2.10    11
## [1947] {bottled water,                                                                                  
##         citrus fruit,                                                                                   
##         tropical fruit}            => {whole milk}                0.0022       0.54   0.0042  2.10    22
## [1948] {mustard}                   => {tropical fruit}            0.0026       0.22   0.0120  2.10    26
## [1949] {other vegetables,                                                                               
##         pork,                                                                                           
##         root vegetables}           => {whole milk}                0.0038       0.54   0.0070  2.10    37
## [1950] {curd,                                                                                           
##         sausage}                   => {pastry}                    0.0014       0.19   0.0076  2.10    14
## [1951] {butter milk,                                                                                    
##         root vegetables}           => {tropical fruit}            0.0011       0.22   0.0051  2.10    11
## [1952] {frozen vegetables,                                                                              
##         rolls/buns,                                                                                     
##         whole milk}                => {tropical fruit}            0.0011       0.22   0.0051  2.10    11
## [1953] {butter,                                                                                         
##         margarine}                 => {fruit/vegetable juice}     0.0010       0.15   0.0067  2.10    10
## [1954] {domestic eggs,                                                                                  
##         napkins}                   => {pastry}                    0.0011       0.19   0.0060  2.10    11
## [1955] {root vegetables,                                                                                
##         soda}                      => {sausage}                   0.0037       0.20   0.0186  2.09    36
## [1956] {sliced cheese}             => {root vegetables}           0.0056       0.23   0.0245  2.09    55
## [1957] {coffee,                                                                                         
##         frankfurter,                                                                                    
##         whole milk}                => {rolls/buns}                0.0010       0.38   0.0026  2.09    10
## [1958] {bottled water,                                                                                  
##         frankfurter,                                                                                    
##         whole milk}                => {rolls/buns}                0.0010       0.38   0.0026  2.09    10
## [1959] {hygiene articles,                                                                               
##         pip fruit}                 => {other vegetables}          0.0019       0.40   0.0048  2.09    19
## [1960] {curd,                                                                                           
##         root vegetables}           => {sausage}                   0.0021       0.20   0.0109  2.09    21
## [1961] {frozen vegetables,                                                                              
##         hygiene articles}          => {whole milk}                0.0016       0.53   0.0031  2.09    16
## [1962] {chocolate,                                                                                      
##         pip fruit}                 => {whole milk}                0.0033       0.53   0.0061  2.09    32
## [1963] {beef,                                                                                           
##         other vegetables,                                                                               
##         yogurt}                    => {sausage}                   0.0010       0.20   0.0052  2.09    10
## [1964] {frankfurter,                                                                                    
##         sausage}                   => {rolls/buns}                0.0039       0.38   0.0101  2.09    38
## [1965] {frankfurter,                                                                                    
##         pork}                      => {citrus fruit}              0.0010       0.17   0.0059  2.08    10
## [1966] {pip fruit,                                                                                      
##         shopping bags}             => {sausage}                   0.0018       0.20   0.0094  2.08    18
## [1967] {other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         yogurt}                    => {fruit/vegetable juice}     0.0017       0.15   0.0115  2.08    17
## [1968] {butter,                                                                                         
##         soda}                      => {sausage}                   0.0017       0.20   0.0088  2.08    17
## [1969] {bottled water,                                                                                  
##         margarine,                                                                                      
##         other vegetables}          => {rolls/buns}                0.0013       0.38   0.0035  2.08    13
## [1970] {curd,                                                                                           
##         other vegetables}          => {sausage}                   0.0034       0.20   0.0172  2.08    33
## [1971] {house keeping products}    => {sausage}                   0.0016       0.20   0.0083  2.08    16
## [1972] {domestic eggs,                                                                                  
##         soda}                      => {bottled water}             0.0028       0.23   0.0124  2.08    28
## [1973] {whipped/sour cream}        => {yogurt}                    0.0207       0.29   0.0717  2.07   204
## [1974] {napkins,                                                                                        
##         root vegetables,                                                                                
##         whole milk}                => {bottled water}             0.0011       0.23   0.0049  2.07    11
## [1975] {other vegetables,                                                                               
##         pork,                                                                                           
##         root vegetables}           => {tropical fruit}            0.0015       0.22   0.0070  2.07    15
## [1976] {pastry,                                                                                         
##         soda,                                                                                           
##         yogurt}                    => {shopping bags}             0.0010       0.20   0.0050  2.07    10
## [1977] {pork,                                                                                           
##         tropical fruit}            => {bottled beer}              0.0014       0.17   0.0085  2.07    14
## [1978] {beef,                                                                                           
##         yogurt}                    => {pip fruit}                 0.0018       0.16   0.0117  2.07    18
## [1979] {spread cheese,                                                                                  
##         yogurt}                    => {other vegetables}          0.0014       0.40   0.0036  2.07    14
## [1980] {detergent,                                                                                      
##         pip fruit}                 => {other vegetables}          0.0010       0.40   0.0025  2.07    10
## [1981] {hamburger meat,                                                                                 
##         pastry,                                                                                         
##         whole milk}                => {other vegetables}          0.0010       0.40   0.0025  2.07    10
## [1982] {curd,                                                                                           
##         pork,                                                                                           
##         whole milk}                => {other vegetables}          0.0010       0.40   0.0025  2.07    10
## [1983] {bottled water,                                                                                  
##         newspapers}                => {yogurt}                    0.0033       0.29   0.0113  2.07    32
## [1984] {pastry,                                                                                         
##         sliced cheese}             => {whole milk}                0.0019       0.53   0.0037  2.07    19
## [1985] {oil,                                                                                            
##         other vegetables}          => {sausage}                   0.0019       0.19   0.0100  2.06    19
## [1986] {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk}                => {bottled water}             0.0013       0.23   0.0058  2.06    13
## [1987] {instant coffee,                                                                                 
##         other vegetables}          => {whole milk}                0.0010       0.53   0.0019  2.06    10
## [1988] {dishes,                                                                                         
##         tropical fruit}            => {whole milk}                0.0010       0.53   0.0019  2.06    10
## [1989] {bottled beer,                                                                                   
##         curd}                      => {whole milk}                0.0020       0.53   0.0039  2.06    20
## [1990] {curd,                                                                                           
##         hygiene articles,                                                                               
##         other vegetables}          => {whole milk}                0.0010       0.53   0.0019  2.06    10
## [1991] {other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         whole milk}                => {citrus fruit}              0.0031       0.17   0.0179  2.06    30
## [1992] {chocolate,                                                                                      
##         tropical fruit,                                                                                 
##         whole milk}                => {soda}                      0.0014       0.36   0.0040  2.06    14
## [1993] {margarine,                                                                                      
##         napkins}                   => {bottled water}             0.0010       0.23   0.0045  2.06    10
## [1994] {rolls/buns,                                                                                     
##         waffles}                   => {pip fruit}                 0.0014       0.16   0.0092  2.06    14
## [1995] {bottled water,                                                                                  
##         domestic eggs,                                                                                  
##         other vegetables}          => {whole milk}                0.0021       0.53   0.0041  2.05    21
## [1996] {brown bread,                                                                                    
##         domestic eggs}             => {soda}                      0.0024       0.36   0.0068  2.05    24
## [1997] {butter,                                                                                         
##         other vegetables}          => {sausage}                   0.0039       0.19   0.0200  2.05    38
## [1998] {other vegetables,                                                                               
##         whole milk,                                                                                     
##         yogurt}                    => {pastry}                    0.0041       0.18   0.0223  2.05    40
## [1999] {dishes,                                                                                         
##         soda}                      => {whole milk}                0.0011       0.52   0.0021  2.05    11
## [2000] {frankfurter,                                                                                    
##         grapes}                    => {whole milk}                0.0011       0.52   0.0021  2.05    11
## [2001] {chicken,                                                                                        
##         tropical fruit,                                                                                 
##         yogurt}                    => {whole milk}                0.0011       0.52   0.0021  2.05    11
## [2002] {beef,                                                                                           
##         curd,                                                                                           
##         other vegetables}          => {whole milk}                0.0011       0.52   0.0021  2.05    11
## [2003] {other vegetables,                                                                               
##         root vegetables,                                                                                
##         shopping bags,                                                                                  
##         yogurt}                    => {whole milk}                0.0011       0.52   0.0021  2.05    11
## [2004] {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         whole milk}                => {bottled beer}              0.0017       0.17   0.0105  2.05    17
## [2005] {meat,                                                                                           
##         other vegetables}          => {yogurt}                    0.0028       0.29   0.0100  2.05    28
## [2006] {domestic eggs,                                                                                  
##         salty snack}               => {yogurt}                    0.0010       0.29   0.0036  2.05    10
## [2007] {newspapers,                                                                                     
##         other vegetables,                                                                               
##         tropical fruit}            => {soda}                      0.0015       0.36   0.0043  2.05    15
## [2008] {onions,                                                                                         
##         yogurt}                    => {pip fruit}                 0.0011       0.15   0.0072  2.05    11
## [2009] {brown bread,                                                                                    
##         rolls/buns,                                                                                     
##         whole milk}                => {sausage}                   0.0010       0.19   0.0053  2.05    10
## [2010] {pastry,                                                                                         
##         rolls/buns,                                                                                     
##         whole milk}                => {pip fruit}                 0.0013       0.15   0.0085  2.05    13
## [2011] {beef,                                                                                           
##         sausage}                   => {pastry}                    0.0010       0.18   0.0056  2.04    10
## [2012] {butter,                                                                                         
##         whipped/sour cream,                                                                             
##         whole milk}                => {pastry}                    0.0012       0.18   0.0067  2.04    12
## [2013] {frozen vegetables,                                                                              
##         tropical fruit,                                                                                 
##         whipped/sour cream}        => {whole milk}                0.0012       0.52   0.0023  2.04    12
## [2014] {domestic eggs,                                                                                  
##         fruit/vegetable juice,                                                                          
##         tropical fruit}            => {whole milk}                0.0012       0.52   0.0023  2.04    12
## [2015] {seasonal products,                                                                              
##         yogurt}                    => {rolls/buns}                0.0012       0.38   0.0033  2.04    12
## [2016] {beef,                                                                                           
##         hygiene articles}          => {rolls/buns}                0.0012       0.38   0.0033  2.04    12
## [2017] {sausage,                                                                                        
##         white bread}               => {other vegetables}          0.0028       0.39   0.0072  2.04    28
## [2018] {chicken,                                                                                        
##         rolls/buns}                => {yogurt}                    0.0027       0.28   0.0097  2.04    27
## [2019] {cooking chocolate}         => {whole milk}                0.0013       0.52   0.0025  2.04    13
## [2020] {butter milk,                                                                                    
##         pip fruit}                 => {whole milk}                0.0026       0.52   0.0051  2.04    26
## [2021] {frankfurter,                                                                                    
##         salty snack}               => {soda}                      0.0011       0.35   0.0032  2.03    11
## [2022] {frozen vegetables,                                                                              
##         whipped/sour cream}        => {pip fruit}                 0.0012       0.15   0.0079  2.03    12
## [2023] {butter,                                                                                         
##         fruit/vegetable juice}     => {whole milk}                0.0042       0.52   0.0080  2.03    41
## [2024] {pip fruit,                                                                                      
##         sausage}                   => {whole milk}                0.0056       0.52   0.0108  2.03    55
## [2025] {other vegetables,                                                                               
##         sausage}                   => {shopping bags}             0.0054       0.20   0.0269  2.03    53
## [2026] {coffee,                                                                                         
##         root vegetables}           => {pastry}                    0.0013       0.18   0.0073  2.03    13
## [2027] {citrus fruit,                                                                                   
##         sugar}                     => {tropical fruit}            0.0010       0.21   0.0048  2.03    10
## [2028] {hygiene articles,                                                                               
##         whole milk}                => {sausage}                   0.0024       0.19   0.0128  2.03    24
## [2029] {domestic eggs,                                                                                  
##         frozen vegetables}         => {other vegetables}          0.0020       0.39   0.0052  2.03    20
## [2030] {baking powder}             => {tropical fruit}            0.0038       0.21   0.0177  2.03    37
## [2031] {pastry,                                                                                         
##         yogurt}                    => {whole milk}                0.0092       0.52   0.0177  2.02    90
## [2032] {coffee,                                                                                         
##         other vegetables,                                                                               
##         rolls/buns}                => {whole milk}                0.0015       0.52   0.0029  2.02    15
## [2033] {other vegetables,                                                                               
##         whipped/sour cream,                                                                             
##         yogurt}                    => {pastry}                    0.0018       0.18   0.0102  2.02    18
## [2034] {brown bread,                                                                                    
##         root vegetables}           => {sausage}                   0.0019       0.19   0.0102  2.02    19
## [2035] {coffee,                                                                                         
##         white bread}               => {whole milk}                0.0016       0.52   0.0032  2.02    16
## [2036] {bottled water,                                                                                  
##         pastry,                                                                                         
##         yogurt}                    => {whole milk}                0.0016       0.52   0.0032  2.02    16
## [2037] {pork,                                                                                           
##         sausage}                   => {whole milk}                0.0034       0.52   0.0065  2.02    33
## [2038] {newspapers,                                                                                     
##         rolls/buns,                                                                                     
##         tropical fruit}            => {other vegetables}          0.0016       0.39   0.0042  2.02    16
## [2039] {bottled water,                                                                                  
##         root vegetables}           => {bottled beer}              0.0025       0.16   0.0157  2.02    25
## [2040] {bottled water,                                                                                  
##         whole milk}                => {yogurt}                    0.0097       0.28   0.0344  2.01    95
## [2041] {bottled beer,                                                                                   
##         frankfurter,                                                                                    
##         whole milk}                => {rolls/buns}                0.0010       0.37   0.0027  2.01    10
## [2042] {soda,                                                                                           
##         tropical fruit,                                                                                 
##         whole milk}                => {other vegetables}          0.0031       0.39   0.0078  2.01    30
## [2043] {beef,                                                                                           
##         other vegetables,                                                                               
##         rolls/buns}                => {yogurt}                    0.0016       0.28   0.0058  2.01    16
## [2044] {soda,                                                                                           
##         sugar}                     => {whole milk}                0.0038       0.51   0.0073  2.01    37
## [2045] {citrus fruit,                                                                                   
##         root vegetables,                                                                                
##         whole milk}                => {sausage}                   0.0017       0.19   0.0092  2.01    17
## [2046] {margarine,                                                                                      
##         sugar}                     => {other vegetables}          0.0021       0.39   0.0055  2.01    21
## [2047] {butter,                                                                                         
##         other vegetables,                                                                               
##         root vegetables}           => {rolls/buns}                0.0024       0.37   0.0066  2.01    24
## [2048] {meat,                                                                                           
##         root vegetables}           => {yogurt}                    0.0014       0.28   0.0051  2.01    14
## [2049] {beef,                                                                                           
##         butter}                    => {tropical fruit}            0.0012       0.21   0.0058  2.01    12
## [2050] {rolls/buns,                                                                                     
##         sugar}                     => {sausage}                   0.0013       0.19   0.0070  2.01    13
## [2051] {pickled vegetables}        => {tropical fruit}            0.0038       0.21   0.0179  2.00    37
## [2052] {beef,                                                                                           
##         whipped/sour cream}        => {pip fruit}                 0.0010       0.15   0.0067  2.00    10
## [2053] {domestic eggs,                                                                                  
##         frozen meals}              => {other vegetables}          0.0012       0.39   0.0032  2.00    12
## [2054] {margarine,                                                                                      
##         newspapers,                                                                                     
##         whole milk}                => {other vegetables}          0.0012       0.39   0.0032  2.00    12
## [2055] {other vegetables,                                                                               
##         sugar,                                                                                          
##         whole milk}                => {tropical fruit}            0.0013       0.21   0.0063  2.00    13
## [2056] {frozen vegetables,                                                                              
##         root vegetables,                                                                                
##         whole milk}                => {yogurt}                    0.0017       0.28   0.0062  2.00    17
## [2057] {frozen meals,                                                                                   
##         soda}                      => {shopping bags}             0.0012       0.20   0.0062  2.00    12
## [2058] {curd,                                                                                           
##         tropical fruit,                                                                                 
##         whole milk}                => {sausage}                   0.0012       0.19   0.0065  2.00    12
## [2059] {butter milk,                                                                                    
##         fruit/vegetable juice}     => {root vegetables}           0.0010       0.22   0.0047  1.99    10
## [2060] {long life bakery product,                                                                       
##         tropical fruit}            => {pastry}                    0.0011       0.18   0.0063  1.99    11
## [2061] {berries,                                                                                        
##         other vegetables,                                                                               
##         root vegetables}           => {rolls/buns}                0.0011       0.37   0.0031  1.99    11
## [2062] {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         pork}                      => {rolls/buns}                0.0011       0.37   0.0031  1.99    11
## [2063] {bottled water,                                                                                  
##         candy}                     => {yogurt}                    0.0010       0.28   0.0037  1.99    10
## [2064] {other vegetables,                                                                               
##         pastry,                                                                                         
##         soda}                      => {yogurt}                    0.0015       0.28   0.0055  1.99    15
## [2065] {pastry,                                                                                         
##         whipped/sour cream,                                                                             
##         whole milk}                => {rolls/buns}                0.0015       0.37   0.0042  1.99    15
## [2066] {margarine,                                                                                      
##         pork}                      => {newspapers}                0.0010       0.16   0.0064  1.99    10
## [2067] {napkins,                                                                                        
##         rolls/buns,                                                                                     
##         whole milk}                => {other vegetables}          0.0020       0.38   0.0053  1.99    20
## [2068] {chocolate,                                                                                      
##         whole milk}                => {pastry}                    0.0029       0.18   0.0167  1.99    29
## [2069] {newspapers,                                                                                     
##         other vegetables,                                                                               
##         root vegetables}           => {sausage}                   0.0011       0.19   0.0060  1.98    11
## [2070] {pastry,                                                                                         
##         rolls/buns}                => {yogurt}                    0.0058       0.28   0.0209  1.98    57
## [2071] {brown bread,                                                                                    
##         fruit/vegetable juice}     => {shopping bags}             0.0016       0.20   0.0083  1.98    16
## [2072] {hamburger meat,                                                                                 
##         rolls/buns}                => {whole milk}                0.0044       0.51   0.0086  1.98    43
## [2073] {beef,                                                                                           
##         root vegetables}           => {newspapers}                0.0027       0.16   0.0174  1.98    27
## [2074] {onions,                                                                                         
##         root vegetables}           => {whole milk}                0.0048       0.51   0.0095  1.98    47
## [2075] {citrus fruit,                                                                                   
##         root vegetables}           => {yogurt}                    0.0049       0.28   0.0177  1.98    48
## [2076] {processed cheese,                                                                               
##         sausage}                   => {rolls/buns}                0.0012       0.36   0.0034  1.98    12
## [2077] {hygiene articles,                                                                               
##         pork}                      => {other vegetables}          0.0013       0.38   0.0035  1.98    13
## [2078] {dessert,                                                                                        
##         yogurt}                    => {sausage}                   0.0018       0.19   0.0099  1.98    18
## [2079] {ham}                       => {tropical fruit}            0.0054       0.21   0.0260  1.97    53
## [2080] {butter,                                                                                         
##         chicken}                   => {pastry}                    0.0010       0.18   0.0058  1.97    10
## [2081] {margarine,                                                                                      
##         pork}                      => {bottled beer}              0.0010       0.16   0.0064  1.97    10
## [2082] {bottled water,                                                                                  
##         rolls/buns,                                                                                     
##         soda}                      => {shopping bags}             0.0013       0.19   0.0068  1.97    13
## [2083] {root vegetables,                                                                                
##         tropical fruit}            => {bottled water}             0.0046       0.22   0.0210  1.97    45
## [2084] {beef,                                                                                           
##         newspapers}                => {tropical fruit}            0.0013       0.21   0.0064  1.97    13
## [2085] {other vegetables,                                                                               
##         shopping bags}             => {tropical fruit}            0.0048       0.21   0.0232  1.96    47
## [2086] {newspapers,                                                                                     
##         rolls/buns,                                                                                     
##         yogurt}                    => {other vegetables}          0.0019       0.38   0.0051  1.96    19
## [2087] {chewing gum,                                                                                    
##         rolls/buns}                => {soda}                      0.0013       0.34   0.0039  1.96    13
## [2088] {citrus fruit}              => {root vegetables}           0.0177       0.21   0.0828  1.96   174
## [2089] {chocolate,                                                                                      
##         waffles}                   => {shopping bags}             0.0011       0.19   0.0058  1.96    11
## [2090] {chocolate,                                                                                      
##         whole milk}                => {root vegetables}           0.0036       0.21   0.0167  1.96    35
## [2091] {curd,                                                                                           
##         semi-finished bread}       => {whole milk}                0.0010       0.50   0.0020  1.96    10
## [2092] {ice cream,                                                                                      
##         whipped/sour cream}        => {whole milk}                0.0013       0.50   0.0026  1.96    13
## [2093] {bottled beer,                                                                                   
##         specialty chocolate}       => {whole milk}                0.0010       0.50   0.0020  1.96    10
## [2094] {margarine,                                                                                      
##         meat}                      => {whole milk}                0.0010       0.50   0.0020  1.96    10
## [2095] {berries,                                                                                        
##         cream cheese}              => {whole milk}                0.0010       0.50   0.0020  1.96    10
## [2096] {frozen vegetables,                                                                              
##         hamburger meat}            => {whole milk}                0.0015       0.50   0.0031  1.96    15
## [2097] {coffee,                                                                                         
##         curd}                      => {whole milk}                0.0016       0.50   0.0033  1.96    16
## [2098] {curd,                                                                                           
##         newspapers}                => {whole milk}                0.0028       0.50   0.0057  1.96    28
## [2099] {hamburger meat,                                                                                 
##         other vegetables,                                                                               
##         pastry}                    => {whole milk}                0.0010       0.50   0.0020  1.96    10
## [2100] {tropical fruit,                                                                                 
##         waffles,                                                                                        
##         yogurt}                    => {whole milk}                0.0013       0.50   0.0026  1.96    13
## [2101] {coffee,                                                                                         
##         other vegetables,                                                                               
##         root vegetables}           => {whole milk}                0.0017       0.50   0.0035  1.96    17
## [2102] {frozen vegetables,                                                                              
##         other vegetables,                                                                               
##         rolls/buns}                => {whole milk}                0.0021       0.50   0.0043  1.96    21
## [2103] {bottled water,                                                                                  
##         brown bread,                                                                                    
##         yogurt}                    => {whole milk}                0.0011       0.50   0.0022  1.96    11
## [2104] {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         soda}                      => {whole milk}                0.0025       0.50   0.0051  1.96    25
## [2105] {bottled water,                                                                                  
##         butter milk}               => {other vegetables}          0.0014       0.38   0.0038  1.96    14
## [2106] {margarine,                                                                                      
##         white bread}               => {other vegetables}          0.0014       0.38   0.0038  1.96    14
## [2107] {pot plants,                                                                                     
##         whole milk}                => {citrus fruit}              0.0011       0.16   0.0069  1.95    11
## [2108] {curd,                                                                                           
##         rolls/buns}                => {citrus fruit}              0.0016       0.16   0.0101  1.95    16
## [2109] {chicken,                                                                                        
##         newspapers}                => {bottled water}             0.0011       0.22   0.0052  1.95    11
## [2110] {cream cheese,                                                                                   
##         pip fruit}                 => {sausage}                   0.0011       0.18   0.0061  1.95    11
## [2111] {butter,                                                                                         
##         chocolate}                 => {other vegetables}          0.0023       0.38   0.0062  1.95    23
## [2112] {coffee,                                                                                         
##         whole milk}                => {yogurt}                    0.0051       0.27   0.0187  1.95    50
## [2113] {coffee,                                                                                         
##         domestic eggs}             => {tropical fruit}            0.0010       0.20   0.0050  1.94    10
## [2114] {other vegetables,                                                                               
##         pastry,                                                                                         
##         whole milk}                => {sausage}                   0.0019       0.18   0.0106  1.94    19
## [2115] {chocolate,                                                                                      
##         pork}                      => {rolls/buns}                0.0015       0.36   0.0043  1.94    15
## [2116] {margarine,                                                                                      
##         soda,                                                                                           
##         yogurt}                    => {rolls/buns}                0.0010       0.36   0.0028  1.94    10
## [2117] {bottled water,                                                                                  
##         pip fruit}                 => {root vegetables}           0.0022       0.21   0.0106  1.94    22
## [2118] {meat,                                                                                           
##         rolls/buns}                => {soda}                      0.0023       0.34   0.0069  1.94    23
## [2119] {hard cheese,                                                                                    
##         soda}                      => {other vegetables}          0.0015       0.38   0.0041  1.94    15
## [2120] {chicken,                                                                                        
##         long life bakery product}  => {other vegetables}          0.0012       0.38   0.0033  1.94    12
## [2121] {fruit/vegetable juice,                                                                          
##         waffles}                   => {yogurt}                    0.0010       0.27   0.0038  1.94    10
## [2122] {napkins,                                                                                        
##         tropical fruit}            => {whole milk}                0.0050       0.49   0.0101  1.94    49
## [2123] {soft cheese,                                                                                    
##         yogurt}                    => {rolls/buns}                0.0021       0.36   0.0060  1.94    21
## [2124] {frankfurter,                                                                                    
##         margarine}                 => {yogurt}                    0.0017       0.27   0.0064  1.93    17
## [2125] {bottled water,                                                                                  
##         chicken}                   => {yogurt}                    0.0014       0.27   0.0053  1.93    14
## [2126] {canned beer,                                                                                    
##         soda}                      => {bottled water}             0.0029       0.21   0.0138  1.93    29
## [2127] {brown bread,                                                                                    
##         domestic eggs}             => {other vegetables}          0.0025       0.37   0.0068  1.93    25
## [2128] {hamburger meat,                                                                                 
##         whole milk}                => {yogurt}                    0.0040       0.27   0.0147  1.93    39
## [2129] {brown bread,                                                                                    
##         tropical fruit}            => {pastry}                    0.0018       0.17   0.0107  1.93    18
## [2130] {rolls/buns,                                                                                     
##         sugar}                     => {citrus fruit}              0.0011       0.16   0.0070  1.93    11
## [2131] {fruit/vegetable juice,                                                                          
##         pip fruit}                 => {sausage}                   0.0017       0.18   0.0096  1.92    17
## [2132] {curd,                                                                                           
##         whole milk}                => {pastry}                    0.0045       0.17   0.0261  1.92    44
## [2133] {frozen vegetables,                                                                              
##         pip fruit}                 => {sausage}                   0.0013       0.18   0.0073  1.92    13
## [2134] {pip fruit,                                                                                      
##         rolls/buns}                => {newspapers}                0.0021       0.15   0.0139  1.92    21
## [2135] {bottled water,                                                                                  
##         frozen vegetables}         => {sausage}                   0.0011       0.18   0.0062  1.92    11
## [2136] {chicken,                                                                                        
##         soda}                      => {pastry}                    0.0014       0.17   0.0083  1.92    14
## [2137] {newspapers,                                                                                     
##         yogurt}                    => {bottled water}             0.0033       0.21   0.0154  1.92    32
## [2138] {butter milk}               => {other vegetables}          0.0104       0.37   0.0280  1.92   102
## [2139] {bathroom cleaner}          => {other vegetables}          0.0010       0.37   0.0027  1.91    10
## [2140] {meat,                                                                                           
##         soda}                      => {other vegetables}          0.0020       0.37   0.0055  1.91    20
## [2141] {curd,                                                                                           
##         other vegetables,                                                                               
##         tropical fruit}            => {bottled water}             0.0011       0.21   0.0053  1.91    11
## [2142] {cream cheese,                                                                                   
##         other vegetables}          => {whole milk}                0.0067       0.49   0.0137  1.91    66
## [2143] {candy,                                                                                          
##         sausage}                   => {soda}                      0.0012       0.33   0.0037  1.91    12
## [2144] {napkins,                                                                                        
##         sugar}                     => {soda}                      0.0011       0.33   0.0034  1.91    11
## [2145] {bottled beer,                                                                                   
##         bottled water,                                                                                  
##         whole milk}                => {yogurt}                    0.0016       0.27   0.0061  1.91    16
## [2146] {pip fruit,                                                                                      
##         sausage,                                                                                        
##         yogurt}                    => {soda}                      0.0013       0.33   0.0040  1.91    13
## [2147] {napkins,                                                                                        
##         soda,                                                                                           
##         whole milk}                => {other vegetables}          0.0017       0.37   0.0047  1.91    17
## [2148] {other vegetables,                                                                               
##         sugar}                     => {pastry}                    0.0018       0.17   0.0108  1.91    18
## [2149] {soda,                                                                                           
##         tropical fruit,                                                                                 
##         whole milk}                => {root vegetables}           0.0016       0.21   0.0078  1.91    16
## [2150] {butter milk,                                                                                    
##         rolls/buns}                => {tropical fruit}            0.0015       0.20   0.0076  1.91    15
## [2151] {fruit/vegetable juice,                                                                          
##         ham}                       => {other vegetables}          0.0014       0.37   0.0039  1.90    14
## [2152] {newspapers,                                                                                     
##         pastry,                                                                                         
##         whole milk}                => {other vegetables}          0.0014       0.37   0.0039  1.90    14
## [2153] {pastry,                                                                                         
##         root vegetables}           => {citrus fruit}              0.0017       0.16   0.0110  1.90    17
## [2154] {meat,                                                                                           
##         whipped/sour cream}        => {whole milk}                0.0017       0.49   0.0036  1.90    17
## [2155] {cat food}                  => {citrus fruit}              0.0037       0.16   0.0233  1.90    36
## [2156] {berries,                                                                                        
##         other vegetables}          => {whole milk}                0.0050       0.49   0.0103  1.90    49
## [2157] {brown bread,                                                                                    
##         long life bakery product}  => {whole milk}                0.0016       0.48   0.0034  1.90    16
## [2158] {meat,                                                                                           
##         rolls/buns}                => {yogurt}                    0.0018       0.26   0.0069  1.90    18
## [2159] {hygiene articles,                                                                               
##         newspapers}                => {other vegetables}          0.0011       0.37   0.0031  1.89    11
## [2160] {long life bakery product,                                                                       
##         soda,                                                                                           
##         whole milk}                => {other vegetables}          0.0011       0.37   0.0031  1.89    11
## [2161] {bottled water,                                                                                  
##         domestic eggs,                                                                                  
##         rolls/buns}                => {whole milk}                0.0015       0.48   0.0032  1.89    15
## [2162] {other vegetables,                                                                               
##         sugar}                     => {yogurt}                    0.0028       0.26   0.0108  1.89    28
## [2163] {frozen dessert,                                                                                 
##         rolls/buns}                => {whole milk}                0.0014       0.48   0.0029  1.89    14
## [2164] {butter,                                                                                         
##         salty snack}               => {whole milk}                0.0014       0.48   0.0029  1.89    14
## [2165] {instant coffee}            => {newspapers}                0.0011       0.15   0.0074  1.89    11
## [2166] {white wine}                => {bottled water}             0.0040       0.21   0.0190  1.89    39
## [2167] {pip fruit,                                                                                      
##         rolls/buns}                => {other vegetables}          0.0051       0.36   0.0139  1.89    50
## [2168] {fruit/vegetable juice,                                                                          
##         tropical fruit,                                                                                 
##         yogurt}                    => {bottled water}             0.0010       0.21   0.0049  1.88    10
## [2169] {beef,                                                                                           
##         newspapers,                                                                                     
##         root vegetables}           => {whole milk}                0.0013       0.48   0.0027  1.88    13
## [2170] {pip fruit,                                                                                      
##         rolls/buns,                                                                                     
##         sausage}                   => {whole milk}                0.0013       0.48   0.0027  1.88    13
## [2171] {curd,                                                                                           
##         tropical fruit}            => {bottled water}             0.0021       0.21   0.0103  1.88    21
## [2172] {cake bar,                                                                                       
##         whole milk}                => {other vegetables}          0.0020       0.36   0.0056  1.88    20
## [2173] {margarine,                                                                                      
##         soda}                      => {newspapers}                0.0015       0.15   0.0102  1.88    15
## [2174] {fruit/vegetable juice,                                                                          
##         pot plants}                => {whole milk}                0.0012       0.48   0.0025  1.88    12
## [2175] {fruit/vegetable juice,                                                                          
##         pip fruit,                                                                                      
##         soda}                      => {whole milk}                0.0012       0.48   0.0025  1.88    12
## [2176] {frozen vegetables,                                                                              
##         soda}                      => {sausage}                   0.0015       0.18   0.0086  1.88    15
## [2177] {dish cleaner}              => {citrus fruit}              0.0016       0.16   0.0105  1.88    16
## [2178] {citrus fruit}              => {yogurt}                    0.0217       0.26   0.0828  1.88   213
## [2179] {beef,                                                                                           
##         sugar}                     => {rolls/buns}                0.0010       0.34   0.0029  1.87    10
## [2180] {domestic eggs,                                                                                  
##         frankfurter,                                                                                    
##         other vegetables}          => {rolls/buns}                0.0010       0.34   0.0029  1.87    10
## [2181] {butter milk,                                                                                    
##         whole milk}                => {pastry}                    0.0019       0.17   0.0116  1.87    19
## [2182] {butter,                                                                                         
##         rolls/buns}                => {pastry}                    0.0022       0.17   0.0134  1.87    22
## [2183] {Instant food products,                                                                          
##         rolls/buns}                => {whole milk}                0.0011       0.48   0.0023  1.87    11
## [2184] {pip fruit,                                                                                      
##         processed cheese}          => {whole milk}                0.0011       0.48   0.0023  1.87    11
## [2185] {frankfurter,                                                                                    
##         whipped/sour cream}        => {rolls/buns}                0.0021       0.34   0.0062  1.87    21
## [2186] {misc. beverages,                                                                                
##         rolls/buns}                => {yogurt}                    0.0012       0.26   0.0047  1.87    12
## [2187] {shopping bags,                                                                                  
##         waffles}                   => {root vegetables}           0.0011       0.20   0.0055  1.87    11
## [2188] {napkins,                                                                                        
##         pork}                      => {tropical fruit}            0.0010       0.20   0.0052  1.87    10
## [2189] {soda,                                                                                           
##         tropical fruit,                                                                                 
##         yogurt}                    => {whole milk}                0.0032       0.48   0.0066  1.87    31
## [2190] {chocolate,                                                                                      
##         dessert}                   => {other vegetables}          0.0013       0.36   0.0037  1.87    13
## [2191] {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         pastry}                    => {soda}                      0.0013       0.33   0.0041  1.86    13
## [2192] {canned vegetables,                                                                              
##         rolls/buns}                => {whole milk}                0.0010       0.48   0.0021  1.86    10
## [2193] {curd,                                                                                           
##         root vegetables,                                                                                
##         sausage}                   => {whole milk}                0.0010       0.48   0.0021  1.86    10
## [2194] {margarine,                                                                                      
##         whole milk}                => {bottled water}             0.0050       0.21   0.0242  1.86    49
## [2195] {pip fruit,                                                                                      
##         soda,                                                                                           
##         tropical fruit}            => {rolls/buns}                0.0013       0.34   0.0039  1.86    13
## [2196] {other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         tropical fruit,                                                                                 
##         yogurt}                    => {soda}                      0.0012       0.32   0.0038  1.86    12
## [2197] {rolls/buns,                                                                                     
##         tropical fruit}            => {pastry}                    0.0041       0.17   0.0246  1.86    40
## [2198] {chicken,                                                                                        
##         soda}                      => {shopping bags}             0.0015       0.18   0.0083  1.86    15
## [2199] {coffee,                                                                                         
##         other vegetables}          => {sausage}                   0.0023       0.17   0.0134  1.85    23
## [2200] {hard cheese,                                                                                    
##         rolls/buns}                => {yogurt}                    0.0015       0.26   0.0059  1.85    15
## [2201] {bottled water,                                                                                  
##         yogurt}                    => {soda}                      0.0074       0.32   0.0230  1.85    73
## [2202] {candy,                                                                                          
##         soda}                      => {pastry}                    0.0014       0.16   0.0086  1.85    14
## [2203] {chocolate,                                                                                      
##         margarine}                 => {soda}                      0.0010       0.32   0.0032  1.85    10
## [2204] {chocolate,                                                                                      
##         newspapers,                                                                                     
##         whole milk}                => {soda}                      0.0010       0.32   0.0032  1.85    10
## [2205] {shopping bags,                                                                                  
##         soda,                                                                                           
##         tropical fruit}            => {whole milk}                0.0017       0.47   0.0037  1.85    17
## [2206] {butter,                                                                                         
##         yogurt}                    => {sausage}                   0.0025       0.17   0.0146  1.85    25
## [2207] {frankfurter,                                                                                    
##         other vegetables}          => {rolls/buns}                0.0056       0.34   0.0165  1.85    55
## [2208] {flour,                                                                                          
##         soda}                      => {other vegetables}          0.0010       0.36   0.0028  1.85    10
## [2209] {bottled water,                                                                                  
##         rolls/buns,                                                                                     
##         yogurt}                    => {other vegetables}          0.0025       0.36   0.0071  1.85    25
## [2210] {cake bar,                                                                                       
##         whole milk}                => {shopping bags}             0.0010       0.18   0.0056  1.85    10
## [2211] {whipped/sour cream,                                                                             
##         white bread}               => {bottled water}             0.0011       0.20   0.0055  1.84    11
## [2212] {cat food}                  => {root vegetables}           0.0047       0.20   0.0233  1.84    46
## [2213] {other vegetables,                                                                               
##         sausage,                                                                                        
##         tropical fruit}            => {bottled water}             0.0012       0.20   0.0060  1.84    12
## [2214] {fruit/vegetable juice,                                                                          
##         other vegetables,                                                                               
##         yogurt}                    => {sausage}                   0.0014       0.17   0.0082  1.84    14
## [2215] {flour,                                                                                          
##         whole milk}                => {tropical fruit}            0.0016       0.19   0.0084  1.84    16
## [2216] {bottled water,                                                                                  
##         yogurt}                    => {sausage}                   0.0040       0.17   0.0230  1.84    39
## [2217] {bottled water,                                                                                  
##         curd}                      => {root vegetables}           0.0012       0.20   0.0061  1.83    12
## [2218] {fruit/vegetable juice,                                                                          
##         soda,                                                                                           
##         yogurt}                    => {root vegetables}           0.0010       0.20   0.0051  1.83    10
## [2219] {frankfurter,                                                                                    
##         waffles}                   => {other vegetables}          0.0011       0.35   0.0032  1.83    11
## [2220] {soda,                                                                                           
##         tropical fruit,                                                                                 
##         whole milk,                                                                                     
##         yogurt}                    => {other vegetables}          0.0011       0.35   0.0032  1.83    11
## [2221] {cream cheese,                                                                                   
##         yogurt}                    => {sausage}                   0.0021       0.17   0.0124  1.83    21
## [2222] {bottled water,                                                                                  
##         frankfurter}               => {soda}                      0.0023       0.32   0.0073  1.83    23
## [2223] {grapes,                                                                                         
##         other vegetables}          => {bottled water}             0.0018       0.20   0.0090  1.83    18
## [2224] {bottled water,                                                                                  
##         yogurt}                    => {other vegetables}          0.0081       0.35   0.0230  1.83    80
## [2225] {meat,                                                                                           
##         newspapers}                => {whole milk}                0.0014       0.47   0.0031  1.83    14
## [2226] {canned beer,                                                                                    
##         margarine}                 => {whole milk}                0.0014       0.47   0.0031  1.83    14
## [2227] {pot plants,                                                                                     
##         whole milk}                => {other vegetables}          0.0024       0.35   0.0069  1.82    24
## [2228] {pastry,                                                                                         
##         sugar}                     => {other vegetables}          0.0018       0.35   0.0052  1.82    18
## [2229] {bottled water,                                                                                  
##         pork}                      => {citrus fruit}              0.0011       0.15   0.0074  1.82    11
## [2230] {citrus fruit,                                                                                   
##         yogurt}                    => {other vegetables}          0.0076       0.35   0.0217  1.82    75
## [2231] {bottled beer,                                                                                   
##         hygiene articles}          => {whole milk}                0.0013       0.46   0.0028  1.82    13
## [2232] {frozen vegetables,                                                                              
##         other vegetables,                                                                               
##         sausage}                   => {whole milk}                0.0013       0.46   0.0028  1.82    13
## [2233] {berries,                                                                                        
##         butter}                    => {other vegetables}          0.0013       0.35   0.0038  1.82    13
## [2234] {pip fruit,                                                                                      
##         soda}                      => {other vegetables}          0.0047       0.35   0.0133  1.81    46
## [2235] {seasonal products}         => {shopping bags}             0.0025       0.18   0.0142  1.81    25
## [2236] {other vegetables,                                                                               
##         spread cheese}             => {rolls/buns}                0.0010       0.33   0.0031  1.81    10
## [2237] {beef,                                                                                           
##         citrus fruit,                                                                                   
##         other vegetables}          => {rolls/buns}                0.0011       0.33   0.0034  1.81    11
## [2238] {bottled beer,                                                                                   
##         margarine,                                                                                      
##         whole milk}                => {rolls/buns}                0.0010       0.33   0.0031  1.81    10
## [2239] {other vegetables,                                                                               
##         processed cheese}          => {whole milk}                0.0025       0.46   0.0055  1.81    25
## [2240] {butter milk,                                                                                    
##         shopping bags}             => {soda}                      0.0012       0.32   0.0039  1.81    12
## [2241] {newspapers,                                                                                     
##         other vegetables,                                                                               
##         yogurt}                    => {bottled water}             0.0011       0.20   0.0056  1.81    11
## [2242] {hard cheese,                                                                                    
##         other vegetables}          => {whole milk}                0.0044       0.46   0.0095  1.81    43
## [2243] {soft cheese}               => {pastry}                    0.0027       0.16   0.0171  1.81    27
## [2244] {meat,                                                                                           
##         yogurt}                    => {whole milk}                0.0024       0.46   0.0053  1.81    24
## [2245] {citrus fruit}              => {other vegetables}          0.0289       0.35   0.0828  1.80   284
## [2246] {shopping bags,                                                                                  
##         sliced cheese}             => {other vegetables}          0.0015       0.35   0.0044  1.80    15
## [2247] {cleaner}                   => {whole milk}                0.0023       0.46   0.0051  1.80    23
## [2248] {ham}                       => {pastry}                    0.0042       0.16   0.0260  1.80    41
## [2249] {sausage,                                                                                        
##         sliced cheese}             => {other vegetables}          0.0024       0.35   0.0070  1.80    24
## [2250] {bottled water,                                                                                  
##         sausage}                   => {rolls/buns}                0.0040       0.33   0.0120  1.80    39
## [2251] {butter milk,                                                                                    
##         sliced cheese}             => {whole milk}                0.0011       0.46   0.0024  1.79    11
## [2252] {ham,                                                                                            
##         other vegetables,                                                                               
##         rolls/buns}                => {whole milk}                0.0011       0.46   0.0024  1.79    11
## [2253] {dishes,                                                                                         
##         whole milk}                => {yogurt}                    0.0013       0.25   0.0053  1.79    13
## [2254] {beverages,                                                                                      
##         pastry}                    => {soda}                      0.0010       0.31   0.0033  1.79    10
## [2255] {pip fruit,                                                                                      
##         shopping bags}             => {yogurt}                    0.0023       0.25   0.0094  1.79    23
## [2256] {rolls/buns,                                                                                     
##         white bread,                                                                                    
##         whole milk}                => {soda}                      0.0010       0.31   0.0033  1.79    10
## [2257] {chicken,                                                                                        
##         yogurt}                    => {rolls/buns}                0.0027       0.33   0.0083  1.79    27
## [2258] {white bread}               => {shopping bags}             0.0074       0.18   0.0421  1.79    73
## [2259] {chicken,                                                                                        
##         margarine}                 => {whole milk}                0.0021       0.46   0.0047  1.79    21
## [2260] {citrus fruit,                                                                                   
##         whipped/sour cream}        => {pastry}                    0.0017       0.16   0.0109  1.79    17
## [2261] {coffee,                                                                                         
##         rolls/buns}                => {root vegetables}           0.0021       0.19   0.0110  1.78    21
## [2262] {soda,                                                                                           
##         whole milk}                => {sausage}                   0.0067       0.17   0.0401  1.78    66
## [2263] {other vegetables,                                                                               
##         pastry,                                                                                         
##         root vegetables}           => {rolls/buns}                0.0019       0.33   0.0059  1.78    19
## [2264] {brown bread,                                                                                    
##         shopping bags}             => {tropical fruit}            0.0017       0.19   0.0093  1.78    17
## [2265] {frozen vegetables,                                                                              
##         semi-finished bread}       => {whole milk}                0.0010       0.45   0.0022  1.78    10
## [2266] {sliced cheese,                                                                                  
##         white bread}               => {whole milk}                0.0010       0.45   0.0022  1.78    10
## [2267] {frozen vegetables,                                                                              
##         fruit/vegetable juice,                                                                          
##         soda}                      => {whole milk}                0.0010       0.45   0.0022  1.78    10
## [2268] {citrus fruit,                                                                                   
##         shopping bags,                                                                                  
##         soda}                      => {whole milk}                0.0010       0.45   0.0022  1.78    10
## [2269] {berries,                                                                                        
##         pork}                      => {other vegetables}          0.0011       0.34   0.0033  1.78    11
## [2270] {rolls/buns,                                                                                     
##         white bread,                                                                                    
##         whole milk}                => {other vegetables}          0.0011       0.34   0.0033  1.78    11
## [2271] {long life bakery product,                                                                       
##         whole milk}                => {pastry}                    0.0021       0.16   0.0135  1.77    21
## [2272] {butter milk,                                                                                    
##         rolls/buns}                => {whole milk}                0.0035       0.45   0.0076  1.77    34
## [2273] {shopping bags,                                                                                  
##         yogurt}                    => {root vegetables}           0.0029       0.19   0.0153  1.77    29
## [2274] {roll products,                                                                                  
##         whole milk}                => {rolls/buns}                0.0015       0.33   0.0047  1.77    15
## [2275] {rolls/buns,                                                                                     
##         yogurt}                    => {whole milk}                0.0156       0.45   0.0344  1.77   153
## [2276] {sausage}                   => {rolls/buns}                0.0306       0.33   0.0940  1.77   301
## [2277] {butter,                                                                                         
##         whole milk}                => {bottled water}             0.0054       0.20   0.0276  1.77    53
## [2278] {chocolate marshmallow}     => {pastry}                    0.0014       0.16   0.0090  1.77    14
## [2279] {herbs,                                                                                          
##         other vegetables,                                                                               
##         whole milk}                => {rolls/buns}                0.0013       0.33   0.0041  1.77    13
## [2280] {Instant food products}     => {other vegetables}          0.0027       0.34   0.0080  1.77    27
## [2281] {liquor (appetizer)}        => {soda}                      0.0024       0.31   0.0079  1.76    24
## [2282] {root vegetables,                                                                                
##         white bread}               => {soda}                      0.0024       0.31   0.0079  1.76    24
## [2283] {root vegetables,                                                                                
##         soda,                                                                                           
##         tropical fruit}            => {rolls/buns}                0.0012       0.32   0.0038  1.76    12
## [2284] {soda,                                                                                           
##         tropical fruit,                                                                                 
##         whole milk}                => {bottled water}             0.0015       0.19   0.0078  1.76    15
## [2285] {bottled beer,                                                                                   
##         butter}                    => {yogurt}                    0.0014       0.25   0.0058  1.76    14
## [2286] {margarine,                                                                                      
##         root vegetables}           => {whole milk}                0.0050       0.45   0.0111  1.76    49
## [2287] {napkins,                                                                                        
##         rolls/buns}                => {sausage}                   0.0019       0.17   0.0117  1.76    19
## [2288] {domestic eggs,                                                                                  
##         pip fruit,                                                                                      
##         whole milk}                => {yogurt}                    0.0013       0.25   0.0054  1.76    13
## [2289] {jam}                       => {other vegetables}          0.0018       0.34   0.0054  1.76    18
## [2290] {candy,                                                                                          
##         tropical fruit}            => {other vegetables}          0.0018       0.34   0.0054  1.76    18
## [2291] {other vegetables,                                                                               
##         root vegetables,                                                                                
##         soda}                      => {shopping bags}             0.0014       0.17   0.0082  1.75    14
## [2292] {newspapers,                                                                                     
##         shopping bags}             => {root vegetables}           0.0013       0.19   0.0069  1.75    13
## [2293] {brown bread,                                                                                    
##         chicken}                   => {soda}                      0.0011       0.31   0.0037  1.75    11
## [2294] {salty snack,                                                                                    
##         shopping bags}             => {other vegetables}          0.0020       0.34   0.0060  1.75    20
## [2295] {onions}                    => {tropical fruit}            0.0057       0.18   0.0310  1.75    56
## [2296] {root vegetables,                                                                                
##         whole milk,                                                                                     
##         yogurt}                    => {rolls/buns}                0.0047       0.32   0.0145  1.75    46
## [2297] {newspapers,                                                                                     
##         shopping bags}             => {other vegetables}          0.0023       0.34   0.0069  1.75    23
## [2298] {shopping bags,                                                                                  
##         soda,                                                                                           
##         whole milk}                => {sausage}                   0.0011       0.16   0.0068  1.75    11
## [2299] {candy,                                                                                          
##         whole milk}                => {rolls/buns}                0.0026       0.32   0.0082  1.75    26
## [2300] {frozen vegetables,                                                                              
##         yogurt}                    => {sausage}                   0.0020       0.16   0.0124  1.74    20
## [2301] {margarine}                 => {yogurt}                    0.0142       0.24   0.0586  1.74   140
## [2302] {candy,                                                                                          
##         rolls/buns}                => {yogurt}                    0.0017       0.24   0.0071  1.74    17
## [2303] {root vegetables,                                                                                
##         shopping bags}             => {tropical fruit}            0.0023       0.18   0.0128  1.74    23
## [2304] {canned vegetables,                                                                              
##         tropical fruit}            => {whole milk}                0.0012       0.44   0.0027  1.74    12
## [2305] {pip fruit,                                                                                      
##         root vegetables}           => {sausage}                   0.0025       0.16   0.0156  1.74    25
## [2306] {other vegetables,                                                                               
##         rolls/buns,                                                                                     
##         soda}                      => {pastry}                    0.0015       0.15   0.0099  1.74    15
## [2307] {bottled water,                                                                                  
##         root vegetables,                                                                                
##         whole milk}                => {rolls/buns}                0.0023       0.32   0.0073  1.74    23
## [2308] {butter,                                                                                         
##         whole milk,                                                                                     
##         yogurt}                    => {sausage}                   0.0015       0.16   0.0094  1.74    15
## [2309] {pastry,                                                                                         
##         white bread}               => {tropical fruit}            0.0010       0.18   0.0056  1.73    10
## [2310] {newspapers,                                                                                     
##         whole milk}                => {yogurt}                    0.0066       0.24   0.0274  1.73    65
## [2311] {butter,                                                                                         
##         rolls/buns,                                                                                     
##         whole milk}                => {pastry}                    0.0010       0.15   0.0066  1.73    10
## [2312] {rolls/buns,                                                                                     
##         yogurt}                    => {other vegetables}          0.0115       0.33   0.0344  1.73   113
## [2313] {brown bread,                                                                                    
##         sausage}                   => {tropical fruit}            0.0019       0.18   0.0107  1.72    19
## [2314] {processed cheese,                                                                               
##         white bread}               => {rolls/buns}                0.0013       0.32   0.0042  1.72    13
## [2315] {chocolate,                                                                                      
##         napkins}                   => {other vegetables}          0.0016       0.33   0.0049  1.72    16
## [2316] {frozen meals,                                                                                   
##         whole milk,                                                                                     
##         yogurt}                    => {other vegetables}          0.0011       0.33   0.0034  1.72    11
## [2317] {frozen vegetables,                                                                              
##         whole milk,                                                                                     
##         yogurt}                    => {rolls/buns}                0.0019       0.32   0.0061  1.72    19
## [2318] {onions}                    => {bottled water}             0.0059       0.19   0.0310  1.72    58
## [2319] {chocolate,                                                                                      
##         tropical fruit}            => {root vegetables}           0.0015       0.19   0.0081  1.72    15
## [2320] {cake bar}                  => {sausage}                   0.0021       0.16   0.0132  1.72    21
## [2321] {newspapers,                                                                                     
##         soda}                      => {pastry}                    0.0022       0.15   0.0146  1.72    22
## [2322] {chicken,                                                                                        
##         pork}                      => {rolls/buns}                0.0018       0.32   0.0058  1.72    18
## [2323] {pastry,                                                                                         
##         sausage}                   => {root vegetables}           0.0023       0.19   0.0125  1.72    23
## [2324] {oil,                                                                                            
##         soda}                      => {yogurt}                    0.0011       0.24   0.0047  1.71    11
## [2325] {other vegetables,                                                                               
##         sliced cheese}             => {shopping bags}             0.0015       0.17   0.0090  1.71    15
## [2326] {pastry,                                                                                         
##         shopping bags}             => {tropical fruit}            0.0021       0.18   0.0119  1.71    21
## [2327] {bottled water,                                                                                  
##         brown bread}               => {sausage}                   0.0013       0.16   0.0082  1.71    13
## [2328] {chicken,                                                                                        
##         pastry}                    => {soda}                      0.0014       0.30   0.0048  1.71    14
## [2329] {cat food,                                                                                       
##         rolls/buns}                => {whole milk}                0.0017       0.44   0.0040  1.71    17
## [2330] {frozen vegetables,                                                                              
##         yogurt}                    => {bottled water}             0.0023       0.19   0.0124  1.71    23
## [2331] {rolls/buns,                                                                                     
##         sausage,                                                                                        
##         tropical fruit}            => {soda}                      0.0011       0.30   0.0038  1.70    11
## [2332] {brown bread,                                                                                    
##         shopping bags}             => {other vegetables}          0.0031       0.33   0.0093  1.70    30
## [2333] {frozen vegetables,                                                                              
##         hard cheese}               => {whole milk}                0.0010       0.43   0.0023  1.70    10
## [2334] {citrus fruit,                                                                                   
##         coffee,                                                                                         
##         other vegetables}          => {whole milk}                0.0010       0.43   0.0023  1.70    10
## [2335] {soda,                                                                                           
##         whole milk}                => {bottled water}             0.0075       0.19   0.0401  1.70    74
## [2336] {long life bakery product,                                                                       
##         yogurt}                    => {pastry}                    0.0013       0.15   0.0087  1.70    13
## [2337] {onions,                                                                                         
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk}                => {rolls/buns}                0.0010       0.31   0.0033  1.70    10
## [2338] {yogurt}                    => {root vegetables}           0.0258       0.19   0.1395  1.70   254
## [2339] {newspapers,                                                                                     
##         root vegetables}           => {sausage}                   0.0018       0.16   0.0115  1.70    18
## [2340] {other vegetables,                                                                               
##         yogurt}                    => {bottled water}             0.0081       0.19   0.0434  1.70    80
## [2341] {detergent,                                                                                      
##         whole milk}                => {sausage}                   0.0014       0.16   0.0089  1.69    14
## [2342] {soda,                                                                                           
##         sugar}                     => {yogurt}                    0.0017       0.24   0.0073  1.69    17
## [2343] {hygiene articles,                                                                               
##         yogurt}                    => {shopping bags}             0.0012       0.17   0.0073  1.69    12
## [2344] {coffee,                                                                                         
##         root vegetables}           => {shopping bags}             0.0012       0.17   0.0073  1.69    12
## [2345] {long life bakery product,                                                                       
##         rolls/buns}                => {soda}                      0.0023       0.29   0.0079  1.69    23
## [2346] {oil,                                                                                            
##         whipped/sour cream}        => {whole milk}                0.0019       0.43   0.0045  1.69    19
## [2347] {newspapers,                                                                                     
##         tropical fruit}            => {whole milk}                0.0051       0.43   0.0118  1.69    50
## [2348] {curd,                                                                                           
##         white bread}               => {soda}                      0.0010       0.29   0.0035  1.69    10
## [2349] {margarine,                                                                                      
##         soda}                      => {rolls/buns}                0.0032       0.31   0.0102  1.69    31
## [2350] {newspapers,                                                                                     
##         yogurt}                    => {whole milk}                0.0066       0.43   0.0154  1.68    65
## [2351] {citrus fruit,                                                                                   
##         soda}                      => {other vegetables}          0.0042       0.33   0.0128  1.68    41
## [2352] {cake bar,                                                                                       
##         whole milk}                => {rolls/buns}                0.0017       0.31   0.0056  1.68    17
## [2353] {domestic eggs,                                                                                  
##         pastry,                                                                                         
##         whole milk}                => {soda}                      0.0012       0.29   0.0042  1.68    12
## [2354] {potato products}           => {whole milk}                0.0012       0.43   0.0028  1.68    12
## [2355] {shopping bags,                                                                                  
##         soda,                                                                                           
##         yogurt}                    => {whole milk}                0.0018       0.43   0.0043  1.68    18
## [2356] {brown bread,                                                                                    
##         coffee}                    => {other vegetables}          0.0012       0.32   0.0038  1.68    12
## [2357] {hamburger meat,                                                                                 
##         root vegetables,                                                                                
##         whole milk}                => {rolls/buns}                0.0012       0.31   0.0040  1.67    12
## [2358] {coffee,                                                                                         
##         root vegetables,                                                                                
##         whole milk}                => {rolls/buns}                0.0012       0.31   0.0040  1.67    12
## [2359] {newspapers,                                                                                     
##         white bread}               => {other vegetables}          0.0011       0.32   0.0035  1.67    11
## [2360] {curd,                                                                                           
##         rolls/buns,                                                                                     
##         yogurt}                    => {other vegetables}          0.0011       0.32   0.0035  1.67    11
## [2361] {domestic eggs,                                                                                  
##         newspapers}                => {whole milk}                0.0029       0.43   0.0069  1.67    29
## [2362] {other vegetables,                                                                               
##         specialty bar}             => {soda}                      0.0016       0.29   0.0056  1.67    16
## [2363] {bottled water,                                                                                  
##         citrus fruit,                                                                                   
##         rolls/buns}                => {other vegetables}          0.0010       0.32   0.0032  1.67    10
## [2364] {shopping bags,                                                                                  
##         sliced cheese}             => {yogurt}                    0.0010       0.23   0.0044  1.67    10
## [2365] {berries,                                                                                        
##         sausage}                   => {rolls/buns}                0.0015       0.31   0.0050  1.66    15
## [2366] {detergent}                 => {tropical fruit}            0.0034       0.17   0.0192  1.66    33
## [2367] {chocolate,                                                                                      
##         dessert}                   => {rolls/buns}                0.0011       0.31   0.0037  1.66    11
## [2368] {berries,                                                                                        
##         root vegetables,                                                                                
##         whole milk}                => {rolls/buns}                0.0011       0.31   0.0037  1.66    11
## [2369] {pasta,                                                                                          
##         root vegetables}           => {soda}                      0.0011       0.29   0.0039  1.66    11
## [2370] {chocolate,                                                                                      
##         coffee}                    => {soda}                      0.0011       0.29   0.0039  1.66    11
## [2371] {bottled beer,                                                                                   
##         frankfurter}               => {other vegetables}          0.0017       0.32   0.0054  1.66    17
## [2372] {processed cheese}          => {whole milk}                0.0070       0.42   0.0166  1.66    69
## [2373] {beef,                                                                                           
##         dessert}                   => {whole milk}                0.0011       0.42   0.0026  1.66    11
## [2374] {margarine,                                                                                      
##         other vegetables,                                                                               
##         soda}                      => {whole milk}                0.0011       0.42   0.0026  1.66    11
## [2375] {chicken,                                                                                        
##         rolls/buns,                                                                                     
##         whole milk}                => {soda}                      0.0015       0.29   0.0053  1.65    15
## [2376] {frankfurter,                                                                                    
##         frozen vegetables}         => {other vegetables}          0.0016       0.32   0.0051  1.65    16
## [2377] {chicken,                                                                                        
##         other vegetables,                                                                               
##         root vegetables}           => {rolls/buns}                0.0017       0.30   0.0057  1.65    17
## [2378] {brown bread,                                                                                    
##         canned beer}               => {other vegetables}          0.0015       0.32   0.0048  1.65    15
## [2379] {hard cheese,                                                                                    
##         napkins}                   => {rolls/buns}                0.0010       0.30   0.0034  1.65    10
## [2380] {berries,                                                                                        
##         whole milk,                                                                                     
##         yogurt}                    => {rolls/buns}                0.0010       0.30   0.0034  1.65    10
## [2381] {butter,                                                                                         
##         whipped/sour cream,                                                                             
##         whole milk}                => {bottled water}             0.0012       0.18   0.0067  1.65    12
## [2382] {napkins,                                                                                        
##         pastry}                    => {whole milk}                0.0029       0.42   0.0070  1.64    29
## [2383] {dessert,                                                                                        
##         sausage}                   => {tropical fruit}            0.0010       0.17   0.0059  1.64    10
## [2384] {roll products,                                                                                  
##         root vegetables}           => {whole milk}                0.0013       0.42   0.0032  1.64    13
## [2385] {newspapers,                                                                                     
##         UHT-milk}                  => {soda}                      0.0012       0.29   0.0043  1.64    12
## [2386] {sausage,                                                                                        
##         waffles}                   => {soda}                      0.0014       0.29   0.0050  1.64    14
## [2387] {other vegetables,                                                                               
##         soda}                      => {rolls/buns}                0.0099       0.30   0.0327  1.64    97
## [2388] {meat,                                                                                           
##         other vegetables}          => {whole milk}                0.0042       0.42   0.0100  1.64    41
## [2389] {rolls/buns,                                                                                     
##         whole milk}                => {other vegetables}          0.0179       0.32   0.0566  1.63   176
## [2390] {pastry,                                                                                         
##         rolls/buns,                                                                                     
##         sausage}                   => {other vegetables}          0.0012       0.32   0.0039  1.63    12
## [2391] {domestic eggs,                                                                                  
##         other vegetables,                                                                               
##         soda}                      => {rolls/buns}                0.0015       0.30   0.0051  1.63    15
## [2392] {other vegetables,                                                                               
##         pastry,                                                                                         
##         whole milk,                                                                                     
##         yogurt}                    => {rolls/buns}                0.0012       0.30   0.0041  1.63    12
## [2393] {domestic eggs,                                                                                  
##         sausage,                                                                                        
##         yogurt}                    => {whole milk}                0.0010       0.42   0.0024  1.63    10
## [2394] {salty snack,                                                                                    
##         whole milk}                => {yogurt}                    0.0025       0.23   0.0112  1.63    25
## [2395] {chocolate,                                                                                      
##         whole milk}                => {rolls/buns}                0.0050       0.30   0.0167  1.62    49
## [2396] {frankfurter,                                                                                    
##         sausage,                                                                                        
##         whole milk}                => {other vegetables}          0.0011       0.31   0.0036  1.62    11
## [2397] {newspapers,                                                                                     
##         rolls/buns,                                                                                     
##         tropical fruit}            => {whole milk}                0.0017       0.41   0.0042  1.62    17
## [2398] {dog food}                  => {yogurt}                    0.0019       0.23   0.0085  1.62    19
## [2399] {bottled water,                                                                                  
##         canned beer,                                                                                    
##         soda}                      => {whole milk}                0.0012       0.41   0.0029  1.62    12
## [2400] {dessert}                   => {tropical fruit}            0.0063       0.17   0.0371  1.62    62
## [2401] {chocolate,                                                                                      
##         cream cheese}              => {rolls/buns}                0.0011       0.30   0.0038  1.62    11
## [2402] {other vegetables,                                                                               
##         pork,                                                                                           
##         root vegetables,                                                                                
##         whole milk}                => {rolls/buns}                0.0011       0.30   0.0038  1.62    11
## [2403] {domestic eggs,                                                                                  
##         flour}                     => {other vegetables}          0.0010       0.31   0.0033  1.62    10
## [2404] {bottled water,                                                                                  
##         rolls/buns}                => {soda}                      0.0068       0.28   0.0242  1.61    67
## [2405] {other vegetables,                                                                               
##         whole milk,                                                                                     
##         yogurt}                    => {bottled water}             0.0040       0.18   0.0223  1.61    39
## [2406] {beverages,                                                                                      
##         yogurt}                    => {rolls/buns}                0.0016       0.30   0.0055  1.61    16
## [2407] {bottled beer,                                                                                   
##         sausage}                   => {tropical fruit}            0.0013       0.17   0.0078  1.61    13
## [2408] {yogurt}                    => {other vegetables}          0.0434       0.31   0.1395  1.61   427
## [2409] {ice cream,                                                                                      
##         whole milk}                => {yogurt}                    0.0013       0.22   0.0059  1.61    13
## [2410] {bottled beer,                                                                                   
##         other vegetables}          => {sausage}                   0.0024       0.15   0.0162  1.61    24
## [2411] {dessert,                                                                                        
##         tropical fruit}            => {bottled water}             0.0011       0.18   0.0063  1.61    11
## [2412] {bottled water,                                                                                  
##         other vegetables}          => {rolls/buns}                0.0073       0.30   0.0248  1.60    72
## [2413] {bottled water,                                                                                  
##         citrus fruit}              => {sausage}                   0.0020       0.15   0.0135  1.60    20
## [2414] {tropical fruit,                                                                                 
##         white bread}               => {soda}                      0.0024       0.28   0.0087  1.60    24
## [2415] {other vegetables,                                                                               
##         root vegetables,                                                                                
##         sausage,                                                                                        
##         whole milk}                => {rolls/buns}                0.0010       0.29   0.0035  1.60    10
## [2416] {beef}                      => {yogurt}                    0.0117       0.22   0.0525  1.60   115
## [2417] {bottled beer,                                                                                   
##         fruit/vegetable juice}     => {root vegetables}           0.0012       0.17   0.0070  1.60    12
## [2418] {margarine,                                                                                      
##         sausage}                   => {shopping bags}             0.0011       0.16   0.0071  1.59    11
## [2419] {hygiene articles}          => {yogurt}                    0.0073       0.22   0.0329  1.59    72
## [2420] {pork,                                                                                           
##         whipped/sour cream}        => {yogurt}                    0.0018       0.22   0.0082  1.59    18
## [2421] {butter milk,                                                                                    
##         other vegetables,                                                                               
##         yogurt}                    => {rolls/buns}                0.0012       0.29   0.0042  1.59    12
## [2422] {pork,                                                                                           
##         root vegetables}           => {shopping bags}             0.0021       0.16   0.0136  1.59    21
## [2423] {newspapers,                                                                                     
##         other vegetables,                                                                               
##         whipped/sour cream}        => {whole milk}                0.0013       0.41   0.0033  1.59    13
## [2424] {cream cheese,                                                                                   
##         whole milk,                                                                                     
##         yogurt}                    => {rolls/buns}                0.0019       0.29   0.0066  1.59    19
## [2425] {sugar,                                                                                          
##         whipped/sour cream}        => {rolls/buns}                0.0014       0.29   0.0049  1.59    14
## [2426] {other vegetables,                                                                               
##         soda,                                                                                           
##         whipped/sour cream}        => {rolls/buns}                0.0014       0.29   0.0049  1.59    14
## [2427] {other vegetables,                                                                               
##         white bread,                                                                                    
##         whole milk}                => {soda}                      0.0016       0.28   0.0059  1.58    16
## [2428] {coffee,                                                                                         
##         pip fruit}                 => {yogurt}                    0.0015       0.22   0.0069  1.58    15
## [2429] {whole milk}                => {tropical fruit}            0.0423       0.17   0.2555  1.58   416
## [2430] {chocolate,                                                                                      
##         shopping bags}             => {soda}                      0.0022       0.28   0.0081  1.58    22
## [2431] {margarine,                                                                                      
##         other vegetables,                                                                               
##         rolls/buns}                => {soda}                      0.0014       0.27   0.0052  1.57    14
## [2432] {butter milk,                                                                                    
##         shopping bags}             => {rolls/buns}                0.0011       0.29   0.0039  1.57    11
## [2433] {beef,                                                                                           
##         pastry}                    => {soda}                      0.0017       0.27   0.0063  1.57    17
## [2434] {newspapers,                                                                                     
##         other vegetables}          => {bottled water}             0.0034       0.17   0.0193  1.57    33
## [2435] {frankfurter,                                                                                    
##         fruit/vegetable juice}     => {rolls/buns}                0.0015       0.29   0.0053  1.57    15
## [2436] {rolls/buns,                                                                                     
##         white bread}               => {yogurt}                    0.0014       0.22   0.0065  1.57    14
## [2437] {cat food,                                                                                       
##         soda}                      => {whole milk}                0.0018       0.40   0.0046  1.57    18
## [2438] {chocolate,                                                                                      
##         salty snack}               => {whole milk}                0.0014       0.40   0.0036  1.57    14
## [2439] {sausage,                                                                                        
##         soda,                                                                                           
##         yogurt}                    => {whole milk}                0.0022       0.40   0.0056  1.57    22
## [2440] {dessert,                                                                                        
##         rolls/buns}                => {tropical fruit}            0.0011       0.16   0.0068  1.56    11
## [2441] {other vegetables,                                                                               
##         tropical fruit}            => {bottled water}             0.0062       0.17   0.0359  1.56    61
## [2442] {bottled water,                                                                                  
##         rolls/buns,                                                                                     
##         whole milk}                => {other vegetables}          0.0026       0.30   0.0087  1.56    26
## [2443] {fruit/vegetable juice,                                                                          
##         yogurt}                    => {soda}                      0.0051       0.27   0.0187  1.56    50
## [2444] {pickled vegetables}        => {whole milk}                0.0071       0.40   0.0179  1.56    70
## [2445] {brown bread,                                                                                    
##         rolls/buns}                => {root vegetables}           0.0021       0.17   0.0126  1.55    21
## [2446] {bottled water,                                                                                  
##         hard cheese}               => {rolls/buns}                0.0010       0.29   0.0036  1.55    10
## [2447] {fruit/vegetable juice,                                                                          
##         tropical fruit,                                                                                 
##         yogurt}                    => {soda}                      0.0013       0.27   0.0049  1.55    13
## [2448] {rolls/buns,                                                                                     
##         root vegetables}           => {bottled water}             0.0042       0.17   0.0243  1.55    41
## [2449] {pickled vegetables,                                                                             
##         yogurt}                    => {soda}                      0.0010       0.27   0.0038  1.55    10
## [2450] {beef,                                                                                           
##         domestic eggs,                                                                                  
##         whole milk}                => {soda}                      0.0010       0.27   0.0038  1.55    10
## [2451] {chocolate marshmallow}     => {soda}                      0.0024       0.27   0.0090  1.55    24
## [2452] {butter milk,                                                                                    
##         other vegetables}          => {rolls/buns}                0.0029       0.28   0.0104  1.55    29
## [2453] {newspapers,                                                                                     
##         whipped/sour cream}        => {whole milk}                0.0028       0.39   0.0072  1.54    28
## [2454] {chocolate,                                                                                      
##         pastry}                    => {yogurt}                    0.0017       0.22   0.0080  1.54    17
## [2455] {other vegetables,                                                                               
##         root vegetables,                                                                                
##         sausage}                   => {soda}                      0.0018       0.27   0.0068  1.54    18
## [2456] {shopping bags,                                                                                  
##         specialty chocolate}       => {other vegetables}          0.0014       0.30   0.0048  1.54    14
## [2457] {margarine,                                                                                      
##         pip fruit,                                                                                      
##         root vegetables}           => {whole milk}                0.0011       0.39   0.0028  1.54    11
## [2458] {bottled water,                                                                                  
##         newspapers}                => {other vegetables}          0.0034       0.30   0.0113  1.54    33
## [2459] {rolls/buns,                                                                                     
##         tropical fruit,                                                                                 
##         yogurt}                    => {soda}                      0.0023       0.27   0.0087  1.53    23
## [2460] {frankfurter,                                                                                    
##         rolls/buns,                                                                                     
##         whole milk}                => {bottled water}             0.0010       0.17   0.0060  1.53    10
## [2461] {pastry,                                                                                         
##         soda}                      => {whole milk}                0.0082       0.39   0.0210  1.53    81
## [2462] {candy,                                                                                          
##         whole milk}                => {tropical fruit}            0.0013       0.16   0.0082  1.53    13
## [2463] {pork,                                                                                           
##         rolls/buns,                                                                                     
##         whole milk}                => {yogurt}                    0.0013       0.21   0.0062  1.53    13
## [2464] {ham,                                                                                            
##         whole milk}                => {shopping bags}             0.0017       0.15   0.0115  1.53    17
## [2465] {newspapers,                                                                                     
##         sausage}                   => {soda}                      0.0021       0.27   0.0080  1.52    21
## [2466] {finished products}         => {soda}                      0.0017       0.27   0.0065  1.52    17
## [2467] {napkins,                                                                                        
##         tropical fruit,                                                                                 
##         whole milk}                => {soda}                      0.0013       0.27   0.0050  1.52    13
## [2468] {detergent,                                                                                      
##         soda}                      => {other vegetables}          0.0010       0.29   0.0035  1.52    10
## [2469] {newspapers,                                                                                     
##         whole milk}                => {rolls/buns}                0.0076       0.28   0.0274  1.52    75
## [2470] {ice cream,                                                                                      
##         shopping bags}             => {whole milk}                0.0012       0.39   0.0032  1.51    12
## [2471] {beverages}                 => {yogurt}                    0.0055       0.21   0.0260  1.51    54
## [2472] {frozen dessert,                                                                                 
##         other vegetables}          => {rolls/buns}                0.0010       0.28   0.0037  1.51    10
## [2473] {frozen vegetables,                                                                              
##         long life bakery product}  => {soda}                      0.0010       0.26   0.0039  1.51    10
## [2474] {frozen vegetables,                                                                              
##         whipped/sour cream,                                                                             
##         whole milk}                => {soda}                      0.0010       0.26   0.0039  1.51    10
## [2475] {dessert,                                                                                        
##         rolls/buns}                => {root vegetables}           0.0011       0.16   0.0068  1.51    11
## [2476] {canned fish,                                                                                    
##         root vegetables}           => {whole milk}                0.0010       0.38   0.0026  1.51    10
## [2477] {chocolate,                                                                                      
##         pastry}                    => {other vegetables}          0.0023       0.29   0.0080  1.50    23
## [2478] {domestic eggs,                                                                                  
##         fruit/vegetable juice,                                                                          
##         whole milk}                => {rolls/buns}                0.0013       0.28   0.0048  1.50    13
## [2479] {root vegetables,                                                                                
##         waffles}                   => {soda}                      0.0017       0.26   0.0066  1.50    17
## [2480] {soda,                                                                                           
##         yogurt}                    => {whole milk}                0.0105       0.38   0.0274  1.50   103
## [2481] {ham,                                                                                            
##         shopping bags}             => {other vegetables}          0.0011       0.29   0.0039  1.50    11
## [2482] {sausage,                                                                                        
##         sliced cheese}             => {soda}                      0.0018       0.26   0.0070  1.50    18
## [2483] {bottled water,                                                                                  
##         fruit/vegetable juice,                                                                          
##         soda}                      => {rolls/buns}                0.0014       0.27   0.0052  1.49    14
## [2484] {newspapers,                                                                                     
##         tropical fruit,                                                                                 
##         whole milk}                => {soda}                      0.0013       0.26   0.0051  1.49    13
## [2485] {salt}                      => {yogurt}                    0.0022       0.21   0.0108  1.49    22
## [2486] {UHT-milk,                                                                                       
##         yogurt}                    => {other vegetables}          0.0021       0.29   0.0074  1.49    21
## [2487] {cream cheese,                                                                                   
##         yogurt}                    => {bottled water}             0.0020       0.16   0.0124  1.48    20
## [2488] {bottled beer,                                                                                   
##         pip fruit}                 => {yogurt}                    0.0012       0.21   0.0059  1.48    12
## [2489] {chicken,                                                                                        
##         hamburger meat}            => {whole milk}                0.0014       0.38   0.0038  1.48    14
## [2490] {soda,                                                                                           
##         specialty chocolate}       => {root vegetables}           0.0010       0.16   0.0063  1.48    10
## [2491] {cling film/bags}           => {other vegetables}          0.0033       0.29   0.0114  1.48    32
## [2492] {candy,                                                                                          
##         whipped/sour cream}        => {other vegetables}          0.0010       0.29   0.0036  1.48    10
## [2493] {sausage,                                                                                        
##         whole milk,                                                                                     
##         yogurt}                    => {bottled water}             0.0014       0.16   0.0087  1.47    14
## [2494] {napkins,                                                                                        
##         root vegetables,                                                                                
##         whole milk}                => {rolls/buns}                0.0013       0.27   0.0049  1.47    13
## [2495] {beef,                                                                                           
##         other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk}                => {soda}                      0.0010       0.26   0.0040  1.47    10
## [2496] {soda,                                                                                           
##         tropical fruit}            => {whole milk}                0.0078       0.38   0.0208  1.47    77
## [2497] {domestic eggs,                                                                                  
##         soda}                      => {yogurt}                    0.0025       0.20   0.0124  1.47    25
## [2498] {sausage,                                                                                        
##         tropical fruit}            => {rolls/buns}                0.0038       0.27   0.0139  1.47    37
## [2499] {shopping bags,                                                                                  
##         sliced cheese}             => {soda}                      0.0011       0.26   0.0044  1.47    11
## [2500] {bottled water,                                                                                  
##         soda,                                                                                           
##         whole milk}                => {other vegetables}          0.0021       0.28   0.0075  1.47    21
## [2501] {tropical fruit,                                                                                 
##         whipped/sour cream,                                                                             
##         whole milk}                => {rolls/buns}                0.0021       0.27   0.0079  1.46    21
## [2502] {coffee,                                                                                         
##         soda}                      => {yogurt}                    0.0020       0.20   0.0100  1.46    20
## [2503] {brown bread,                                                                                    
##         rolls/buns}                => {tropical fruit}            0.0019       0.15   0.0126  1.46    19
## [2504] {sausage}                   => {root vegetables}           0.0149       0.16   0.0940  1.46   147
## [2505] {pastry,                                                                                         
##         shopping bags}             => {other vegetables}          0.0034       0.28   0.0119  1.46    33
## [2506] {onions,                                                                                         
##         other vegetables,                                                                               
##         root vegetables}           => {rolls/buns}                0.0015       0.27   0.0057  1.46    15
## [2507] {shopping bags,                                                                                  
##         sugar}                     => {whole milk}                0.0013       0.37   0.0036  1.45    13
## [2508] {dessert,                                                                                        
##         soda}                      => {whole milk}                0.0037       0.37   0.0099  1.45    36
## [2509] {cat food,                                                                                       
##         newspapers}                => {whole milk}                0.0010       0.37   0.0027  1.45    10
## [2510] {other vegetables,                                                                               
##         waffles}                   => {soda}                      0.0025       0.25   0.0101  1.45    25
## [2511] {berries,                                                                                        
##         other vegetables,                                                                               
##         whole milk}                => {rolls/buns}                0.0013       0.27   0.0050  1.44    13
## [2512] {semi-finished bread}       => {yogurt}                    0.0036       0.20   0.0177  1.44    35
## [2513] {chicken,                                                                                        
##         root vegetables}           => {bottled water}             0.0017       0.16   0.0109  1.44    17
## [2514] {chocolate,                                                                                      
##         root vegetables}           => {bottled water}             0.0010       0.16   0.0064  1.44    10
## [2515] {berries,                                                                                        
##         soda}                      => {rolls/buns}                0.0019       0.26   0.0073  1.43    19
## [2516] {pasta,                                                                                          
##         whole milk}                => {soda}                      0.0015       0.25   0.0061  1.43    15
## [2517] {bottled water,                                                                                  
##         pip fruit}                 => {soda}                      0.0026       0.25   0.0106  1.43    26
## [2518] {brown bread,                                                                                    
##         rolls/buns,                                                                                     
##         whole milk}                => {soda}                      0.0013       0.25   0.0053  1.43    13
## [2519] {sliced cheese,                                                                                  
##         whipped/sour cream}        => {rolls/buns}                0.0010       0.26   0.0039  1.43    10
## [2520] {oil,                                                                                            
##         other vegetables,                                                                               
##         root vegetables}           => {rolls/buns}                0.0010       0.26   0.0039  1.43    10
## [2521] {beef,                                                                                           
##         soda}                      => {rolls/buns}                0.0021       0.26   0.0081  1.43    21
## [2522] {root vegetables,                                                                                
##         soda}                      => {rolls/buns}                0.0049       0.26   0.0186  1.43    48
## [2523] {citrus fruit,                                                                                   
##         white bread}               => {whole milk}                0.0016       0.36   0.0045  1.42    16
## [2524] {citrus fruit,                                                                                   
##         pip fruit,                                                                                      
##         tropical fruit}            => {whole milk}                0.0020       0.36   0.0056  1.42    20
## [2525] {grapes,                                                                                         
##         yogurt}                    => {rolls/buns}                0.0012       0.26   0.0047  1.42    12
## [2526] {bottled beer,                                                                                   
##         domestic eggs}             => {rolls/buns}                0.0012       0.26   0.0047  1.42    12
## [2527] {long life bakery product}  => {whole milk}                0.0135       0.36   0.0374  1.41   133
## [2528] {shopping bags,                                                                                  
##         yogurt}                    => {rolls/buns}                0.0040       0.26   0.0153  1.41    39
## [2529] {domestic eggs,                                                                                  
##         root vegetables}           => {bottled water}             0.0022       0.16   0.0143  1.41    22
## [2530] {salty snack,                                                                                    
##         yogurt}                    => {soda}                      0.0015       0.25   0.0062  1.41    15
## [2531] {other vegetables,                                                                               
##         salty snack}               => {soda}                      0.0026       0.25   0.0108  1.41    26
## [2532] {bottled water,                                                                                  
##         onions}                    => {rolls/buns}                0.0015       0.26   0.0059  1.41    15
## [2533] {pip fruit,                                                                                      
##         shopping bags}             => {whole milk}                0.0034       0.36   0.0094  1.40    33
## [2534] {soda,                                                                                           
##         specialty chocolate}       => {rolls/buns}                0.0016       0.26   0.0063  1.40    16
## [2535] {packaged fruit/vegetables} => {yogurt}                    0.0025       0.20   0.0130  1.40    25
## [2536] {citrus fruit,                                                                                   
##         whole milk,                                                                                     
##         yogurt}                    => {rolls/buns}                0.0026       0.26   0.0103  1.40    26
## [2537] {citrus fruit,                                                                                   
##         waffles}                   => {whole milk}                0.0015       0.36   0.0043  1.40    15
## [2538] {other vegetables,                                                                               
##         whipped/sour cream,                                                                             
##         whole milk}                => {rolls/buns}                0.0038       0.26   0.0146  1.40    37
## [2539] {chicken}                   => {yogurt}                    0.0083       0.19   0.0429  1.39    82
## [2540] {brown bread,                                                                                    
##         yogurt}                    => {bottled water}             0.0022       0.15   0.0145  1.39    22
## [2541] {berries}                   => {whole milk}                0.0118       0.35   0.0332  1.39   116
## [2542] {sugar,                                                                                          
##         tropical fruit}            => {rolls/buns}                0.0012       0.26   0.0048  1.39    12
## [2543] {cream cheese,                                                                                   
##         sausage}                   => {rolls/buns}                0.0014       0.25   0.0056  1.38    14
## [2544] {bottled water,                                                                                  
##         whole milk}                => {rolls/buns}                0.0087       0.25   0.0344  1.38    86
## [2545] {sliced cheese,                                                                                  
##         yogurt}                    => {soda}                      0.0019       0.24   0.0080  1.38    19
## [2546] {fruit/vegetable juice,                                                                          
##         shopping bags}             => {bottled water}             0.0016       0.15   0.0107  1.38    16
## [2547] {canned beer,                                                                                    
##         whole milk}                => {rolls/buns}                0.0022       0.25   0.0088  1.37    22
## [2548] {specialty chocolate,                                                                            
##         whole milk}                => {other vegetables}          0.0021       0.27   0.0080  1.37    21
## [2549] {fruit/vegetable juice,                                                                          
##         sausage}                   => {bottled water}             0.0015       0.15   0.0101  1.37    15
## [2550] {chocolate,                                                                                      
##         frankfurter}               => {whole milk}                0.0014       0.35   0.0041  1.37    14
## [2551] {onions,                                                                                         
##         shopping bags}             => {soda}                      0.0010       0.24   0.0043  1.37    10
## [2552] {margarine,                                                                                      
##         pork}                      => {yogurt}                    0.0012       0.19   0.0064  1.37    12
## [2553] {pot plants,                                                                                     
##         whole milk}                => {rolls/buns}                0.0017       0.25   0.0069  1.36    17
## [2554] {oil,                                                                                            
##         sausage}                   => {rolls/buns}                0.0010       0.25   0.0041  1.36    10
## [2555] {frozen vegetables,                                                                              
##         other vegetables,                                                                               
##         root vegetables}           => {rolls/buns}                0.0015       0.25   0.0061  1.36    15
## [2556] {brown bread,                                                                                    
##         domestic eggs,                                                                                  
##         whole milk}                => {rolls/buns}                0.0010       0.25   0.0041  1.36    10
## [2557] {brown bread,                                                                                    
##         pork}                      => {soda}                      0.0013       0.24   0.0056  1.36    13
## [2558] {bottled water,                                                                                  
##         chicken}                   => {whole milk}                0.0018       0.35   0.0053  1.35    18
## [2559] {newspapers,                                                                                     
##         salty snack}               => {whole milk}                0.0010       0.34   0.0029  1.35    10
## [2560] {other vegetables,                                                                               
##         semi-finished bread}       => {soda}                      0.0012       0.24   0.0052  1.35    12
## [2561] {cream cheese,                                                                                   
##         soda}                      => {whole milk}                0.0023       0.34   0.0068  1.34    23
## [2562] {pip fruit,                                                                                      
##         sugar}                     => {soda}                      0.0011       0.23   0.0048  1.34    11
## [2563] {fruit/vegetable juice,                                                                          
##         newspapers}                => {other vegetables}          0.0021       0.26   0.0082  1.34    21
## [2564] {citrus fruit,                                                                                   
##         grapes}                    => {whole milk}                0.0013       0.34   0.0039  1.34    13
## [2565] {chewing gum,                                                                                    
##         soda}                      => {rolls/buns}                0.0013       0.25   0.0054  1.33    13
## [2566] {chicken,                                                                                        
##         shopping bags}             => {rolls/buns}                0.0012       0.24   0.0050  1.33    12
## [2567] {other vegetables,                                                                               
##         rolls/buns}                => {soda}                      0.0099       0.23   0.0426  1.33    97
## [2568] {packaged fruit/vegetables,                                                                      
##         whole milk}                => {other vegetables}          0.0010       0.26   0.0040  1.33    10
## [2569] {butter}                    => {rolls/buns}                0.0134       0.24   0.0554  1.32   132
## [2570] {bottled water,                                                                                  
##         frozen vegetables}         => {soda}                      0.0014       0.23   0.0062  1.32    14
## [2571] {fruit/vegetable juice,                                                                          
##         whole milk}                => {soda}                      0.0061       0.23   0.0266  1.31    60
## [2572] {pastry}                    => {other vegetables}          0.0226       0.25   0.0890  1.31   222
## [2573] {frozen vegetables,                                                                              
##         other vegetables}          => {rolls/buns}                0.0043       0.24   0.0178  1.30    42
## [2574] {specialty fat}             => {whole milk}                0.0012       0.33   0.0037  1.30    12
## [2575] {fruit/vegetable juice,                                                                          
##         rolls/buns,                                                                                     
##         soda}                      => {whole milk}                0.0013       0.33   0.0040  1.30    13
## [2576] {pickled vegetables}        => {soda}                      0.0041       0.23   0.0179  1.30    40
## [2577] {bottled beer,                                                                                   
##         bottled water}             => {yogurt}                    0.0028       0.18   0.0158  1.29    28
## [2578] {processed cheese,                                                                               
##         tropical fruit}            => {rolls/buns}                0.0010       0.24   0.0043  1.29    10
## [2579] {chocolate}                 => {rolls/buns}                0.0118       0.24   0.0496  1.29   116
## [2580] {coffee,                                                                                         
##         shopping bags}             => {other vegetables}          0.0023       0.25   0.0094  1.29    23
## [2581] {sausage,                                                                                        
##         whole milk}                => {soda}                      0.0067       0.22   0.0299  1.29    66
## [2582] {hard cheese,                                                                                    
##         root vegetables}           => {rolls/buns}                0.0013       0.24   0.0056  1.29    13
## [2583] {bottled beer,                                                                                   
##         brown bread}               => {rolls/buns}                0.0012       0.24   0.0052  1.28    12
## [2584] {brown bread,                                                                                    
##         other vegetables}          => {soda}                      0.0042       0.22   0.0187  1.28    41
## [2585] {butter,                                                                                         
##         citrus fruit,                                                                                   
##         other vegetables}          => {soda}                      0.0010       0.22   0.0046  1.27    10
## [2586] {citrus fruit,                                                                                   
##         other vegetables,                                                                               
##         whole milk}                => {rolls/buns}                0.0031       0.23   0.0130  1.27    30
## [2587] {long life bakery product,                                                                       
##         yogurt}                    => {soda}                      0.0019       0.22   0.0087  1.27    19
## [2588] {pot plants,                                                                                     
##         whole milk}                => {soda}                      0.0015       0.22   0.0069  1.27    15
## [2589] {newspapers,                                                                                     
##         waffles}                   => {other vegetables}          0.0010       0.24   0.0042  1.26    10
## [2590] {cling film/bags}           => {whole milk}                0.0037       0.32   0.0114  1.26    36
## [2591] {citrus fruit,                                                                                   
##         coffee}                    => {yogurt}                    0.0011       0.17   0.0064  1.25    11
## [2592] {other vegetables,                                                                               
##         whipped/sour cream,                                                                             
##         whole milk,                                                                                     
##         yogurt}                    => {soda}                      0.0012       0.22   0.0056  1.25    12
## [2593] {brown bread,                                                                                    
##         yogurt}                    => {soda}                      0.0032       0.22   0.0145  1.24    31
## [2594] {coffee,                                                                                         
##         whipped/sour cream}        => {soda}                      0.0013       0.22   0.0061  1.24    13
## [2595] {dental care}               => {whole milk}                0.0018       0.32   0.0058  1.24    18
## [2596] {detergent,                                                                                      
##         whole milk}                => {rolls/buns}                0.0020       0.23   0.0089  1.24    20
## [2597] {long life bakery product,                                                                       
##         sausage}                   => {rolls/buns}                0.0012       0.23   0.0054  1.23    12
## [2598] {butter milk,                                                                                    
##         yogurt}                    => {soda}                      0.0018       0.21   0.0085  1.23    18
## [2599] {bottled water,                                                                                  
##         newspapers,                                                                                     
##         yogurt}                    => {whole milk}                0.0010       0.31   0.0033  1.22    10
## [2600] {citrus fruit,                                                                                   
##         oil}                       => {rolls/buns}                0.0011       0.22   0.0050  1.22    11
## [2601] {ham,                                                                                            
##         yogurt}                    => {soda}                      0.0014       0.21   0.0067  1.22    14
## [2602] {napkins}                   => {rolls/buns}                0.0117       0.22   0.0524  1.21   115
## [2603] {pastry,                                                                                         
##         shopping bags,                                                                                  
##         whole milk}                => {rolls/buns}                0.0010       0.22   0.0046  1.21    10
## [2604] {female sanitary products}  => {other vegetables}          0.0014       0.23   0.0061  1.21    14
## [2605] {berries,                                                                                        
##         shopping bags}             => {whole milk}                0.0015       0.31   0.0050  1.20    15
## [2606] {butter,                                                                                         
##         domestic eggs,                                                                                  
##         whole milk}                => {rolls/buns}                0.0013       0.22   0.0060  1.20    13
## [2607] {frozen vegetables,                                                                              
##         pip fruit}                 => {soda}                      0.0015       0.21   0.0073  1.19    15
## [2608] {coffee,                                                                                         
##         other vegetables}          => {rolls/buns}                0.0029       0.22   0.0134  1.19    29
## [2609] {curd,                                                                                           
##         tropical fruit,                                                                                 
##         whole milk}                => {rolls/buns}                0.0014       0.22   0.0065  1.19    14
## [2610] {brown bread,                                                                                    
##         citrus fruit}              => {soda}                      0.0017       0.21   0.0083  1.19    17
## [2611] {newspapers,                                                                                     
##         rolls/buns}                => {soda}                      0.0041       0.21   0.0197  1.18    40
## [2612] {frozen vegetables,                                                                              
##         napkins}                   => {rolls/buns}                0.0010       0.22   0.0047  1.18    10
## [2613] {newspapers,                                                                                     
##         pip fruit}                 => {other vegetables}          0.0015       0.23   0.0067  1.17    15
## [2614] {bottled water,                                                                                  
##         butter}                    => {rolls/buns}                0.0019       0.22   0.0089  1.17    19
## [2615] {butter,                                                                                         
##         fruit/vegetable juice}     => {rolls/buns}                0.0017       0.22   0.0080  1.17    17
## [2616] {beverages,                                                                                      
##         yogurt}                    => {soda}                      0.0011       0.20   0.0055  1.17    11
## [2617] {hamburger meat,                                                                                 
##         yogurt}                    => {soda}                      0.0013       0.20   0.0065  1.16    13
## [2618] {pork,                                                                                           
##         soda}                      => {yogurt}                    0.0019       0.16   0.0119  1.16    19
## [2619] {fruit/vegetable juice,                                                                          
##         margarine}                 => {rolls/buns}                0.0013       0.21   0.0062  1.16    13
## [2620] {salty snack}               => {whole milk}                0.0112       0.30   0.0378  1.16   110
## [2621] {candy,                                                                                          
##         soda}                      => {whole milk}                0.0025       0.29   0.0086  1.15    25
## [2622] {curd,                                                                                           
##         tropical fruit,                                                                                 
##         yogurt}                    => {rolls/buns}                0.0011       0.21   0.0053  1.15    11
## [2623] {butter,                                                                                         
##         sausage}                   => {soda}                      0.0017       0.20   0.0086  1.15    17
## [2624] {beef,                                                                                           
##         whole milk,                                                                                     
##         yogurt}                    => {soda}                      0.0012       0.20   0.0061  1.15    12
## [2625] {brown bread,                                                                                    
##         whole milk}                => {rolls/buns}                0.0053       0.21   0.0252  1.14    52
## [2626] {bottled water,                                                                                  
##         other vegetables,                                                                               
##         whole milk}                => {soda}                      0.0021       0.20   0.0108  1.14    21
## [2627] {coffee,                                                                                         
##         other vegetables}          => {soda}                      0.0026       0.20   0.0134  1.13    26
## [2628] {berries,                                                                                        
##         citrus fruit}              => {rolls/buns}                0.0011       0.21   0.0054  1.13    11
## [2629] {hamburger meat,                                                                                 
##         sausage}                   => {soda}                      0.0010       0.20   0.0052  1.12    10
## [2630] {canned fish}               => {soda}                      0.0029       0.20   0.0150  1.12    29
## [2631] {rolls/buns,                                                                                     
##         whipped/sour cream,                                                                             
##         whole milk}                => {soda}                      0.0015       0.19   0.0078  1.12    15
## [2632] {coffee,                                                                                         
##         rolls/buns}                => {soda}                      0.0021       0.19   0.0110  1.12    21
## [2633] {ice cream,                                                                                      
##         soda}                      => {whole milk}                0.0017       0.28   0.0061  1.11    17
## [2634] {canned beer,                                                                                    
##         soda}                      => {yogurt}                    0.0021       0.15   0.0138  1.11    21
## [2635] {citrus fruit,                                                                                   
##         hygiene articles}          => {soda}                      0.0010       0.19   0.0053  1.10    10
## [2636] {citrus fruit}              => {rolls/buns}                0.0168       0.20   0.0828  1.10   165
## [2637] {rolls/buns,                                                                                     
##         UHT-milk}                  => {soda}                      0.0012       0.19   0.0064  1.09    12
## [2638] {napkins,                                                                                        
##         shopping bags}             => {other vegetables}          0.0015       0.21   0.0072  1.09    15
## [2639] {brown bread,                                                                                    
##         whole milk,                                                                                     
##         yogurt}                    => {rolls/buns}                0.0014       0.20   0.0071  1.09    14
## [2640] {curd,                                                                                           
##         pastry}                    => {soda}                      0.0014       0.19   0.0075  1.08    14
## [2641] {spices}                    => {whole milk}                0.0014       0.27   0.0052  1.07    14
## [2642] {cat food,                                                                                       
##         yogurt}                    => {rolls/buns}                0.0012       0.20   0.0062  1.07    12
## [2643] {semi-finished bread}       => {rolls/buns}                0.0035       0.20   0.0177  1.06    34
## [2644] {tropical fruit,                                                                                 
##         whole milk}                => {soda}                      0.0078       0.19   0.0423  1.06    77
## [2645] {other vegetables,                                                                               
##         pip fruit,                                                                                      
##         tropical fruit}            => {rolls/buns}                0.0018       0.19   0.0095  1.05    18
## [2646] {bottled beer,                                                                                   
##         bottled water,                                                                                  
##         whole milk}                => {soda}                      0.0011       0.18   0.0061  1.05    11
## [2647] {pip fruit,                                                                                      
##         root vegetables,                                                                                
##         yogurt}                    => {rolls/buns}                0.0010       0.19   0.0053  1.05    10
## [2648] {other vegetables,                                                                               
##         root vegetables,                                                                                
##         whole milk,                                                                                     
##         yogurt}                    => {soda}                      0.0014       0.18   0.0078  1.04    14
## [2649] {frozen vegetables,                                                                              
##         root vegetables,                                                                                
##         whole milk}                => {soda}                      0.0011       0.18   0.0062  1.03    11
## [2650] {detergent}                 => {soda}                      0.0035       0.18   0.0192  1.03    34
## [2651] {other vegetables,                                                                               
##         pip fruit}                 => {soda}                      0.0047       0.18   0.0261  1.03    46
## [2652] {onions,                                                                                         
##         other vegetables}          => {soda}                      0.0025       0.18   0.0142  1.02    25
## [2653] {whipped/sour cream,                                                                             
##         whole milk,                                                                                     
##         yogurt}                    => {soda}                      0.0019       0.18   0.0109  1.02    19
## [2654] {curd,                                                                                           
##         root vegetables}           => {rolls/buns}                0.0020       0.19   0.0109  1.02    20
## [2655] {dishes}                    => {rolls/buns}                0.0033       0.18   0.0176  1.01    32
## [2656] {newspapers,                                                                                     
##         whole milk}                => {soda}                      0.0048       0.17   0.0274  1.00    47
## [2657] {grapes,                                                                                         
##         tropical fruit}            => {rolls/buns}                0.0011       0.18   0.0061  1.00    11
## [2658] {citrus fruit,                                                                                   
##         tropical fruit}            => {soda}                      0.0035       0.17   0.0199  0.99    34
## [2659] {domestic eggs,                                                                                  
##         whole milk,                                                                                     
##         yogurt}                    => {soda}                      0.0013       0.17   0.0077  0.98    13
## [2660] {root vegetables}           => {soda}                      0.0186       0.17   0.1090  0.98   183
## [2661] {other vegetables}          => {soda}                      0.0327       0.17   0.1935  0.97   322
## [2662] {misc. beverages}           => {whole milk}                0.0070       0.25   0.0284  0.97    69
## [2663] {butter milk,                                                                                    
##         whole milk}                => {soda}                      0.0019       0.17   0.0116  0.96    19
## [2664] {newspapers,                                                                                     
##         pip fruit}                 => {soda}                      0.0011       0.17   0.0067  0.96    11
## [2665] {beef,                                                                                           
##         rolls/buns,                                                                                     
##         whole milk}                => {soda}                      0.0011       0.16   0.0068  0.94    11
## [2666] {flour}                     => {soda}                      0.0028       0.16   0.0174  0.94    28
## [2667] {curd,                                                                                           
##         rolls/buns}                => {soda}                      0.0016       0.16   0.0101  0.93    16
## [2668] {hard cheese,                                                                                    
##         other vegetables}          => {soda}                      0.0015       0.16   0.0095  0.92    15
## [2669] {pot plants}                => {soda}                      0.0027       0.16   0.0173  0.91    27
## [2670] {frankfurter,                                                                                    
##         margarine}                 => {soda}                      0.0010       0.16   0.0064  0.91    10
## [2671] {misc. beverages}           => {rolls/buns}                0.0047       0.16   0.0284  0.90    46
## [2672] {bottled water,                                                                                  
##         frozen vegetables}         => {rolls/buns}                0.0010       0.16   0.0062  0.89    10
## [2673] {soda,                                                                                           
##         UHT-milk}                  => {rolls/buns}                0.0012       0.16   0.0076  0.87    12
## [2674] {detergent,                                                                                      
##         other vegetables}          => {rolls/buns}                0.0010       0.16   0.0064  0.86    10
## [2675] {shopping bags,                                                                                  
##         specialty chocolate}       => {whole milk}                0.0010       0.21   0.0048  0.83    10
## [2676] {other vegetables,                                                                               
##         salty snack}               => {rolls/buns}                0.0016       0.15   0.0108  0.82    16