#1.ASK
#1.0 Business task
#Creating and interpreting high level summaries of the data
#Finding outliers and removing these (if applicable)
#Checking data formats and correcting (if applicable)
#1.1 Stakeholders
#stakeholders include the following
#Category manager
#Quantiuam retail analytics team

#2.PREPARE
#There are two data sets, QVI Transaction data &  QVI Pucrhase data which is public and has been made available by forage
#The link.https://cdn.theforage.com/vinternships/companyassets/32A6DqtsbF7LbKdcq/QVI_transaction_data.xlsx
#The link.https://cdn.theforage.com/vinternships/companyassets/32A6DqtsbF7LbKdcq/QVI_purchase_behaviour.csv
#We will convert qvi transaction data into csv so as to have both sets in csv format
#.Data is organized in csv files

#3.PROCESS
#.For this project I choose RStudio Desktop in order to prepare, process, clean, analyze and create the visualizations.
#Data review involved the following#.Checking column names across all the 12 original files.

#3.1 COLLECT & DATA WRANGLING
#load ggmosaic for creating visualizations of categorical data
#load lubridate for data wrangling
#load ggplot2 for data visualization
#install packages
#tidyverse for data wrangling
#lubridate for dealing with dates
#data.table
#ggplot2 for data visualisation

library(tidyverse)
## -- Attaching packages --------------------------------------- tidyverse 1.3.1 --
## v ggplot2 3.3.5     v purrr   0.3.4
## v tibble  3.1.6     v dplyr   1.0.7
## v tidyr   1.1.4     v stringr 1.4.0
## v readr   2.1.1     v forcats 0.5.1
## -- Conflicts ------------------------------------------ tidyverse_conflicts() --
## x dplyr::filter() masks stats::filter()
## x dplyr::lag()    masks stats::lag()
library(lubridate)
## 
## Attaching package: 'lubridate'
## The following objects are masked from 'package:base':
## 
##     date, intersect, setdiff, union
library(ggplot2)
library(dplyr)
library(data.table)
## 
## Attaching package: 'data.table'
## The following objects are masked from 'package:lubridate':
## 
##     hour, isoweek, mday, minute, month, quarter, second, wday, week,
##     yday, year
## The following objects are masked from 'package:dplyr':
## 
##     between, first, last
## The following object is masked from 'package:purrr':
## 
##     transpose
library(ggmosaic)
## Warning: package 'ggmosaic' was built under R version 4.1.3
#3.1.1.COLLECT  AND READ DATA
#Upload data here
purchase_behaviour<- read_csv("C:/Users/user/Desktop/DATA SETS/QVI_purchase_behaviour.csv")
## Rows: 72637 Columns: 3
## -- Column specification --------------------------------------------------------
## Delimiter: ","
## chr (2): LIFESTAGE, PREMIUM_CUSTOMER
## dbl (1): LYLTY_CARD_NBR
## 
## i Use `spec()` to retrieve the full column specification for this data.
## i Specify the column types or set `show_col_types = FALSE` to quiet this message.
transaction_data<- read_csv("C:/Users/user/Desktop/DATA SETS/QVI_transaction_data.csv")
## Rows: 264836 Columns: 8
## -- Column specification --------------------------------------------------------
## Delimiter: ","
## chr (1): PROD_NAME
## dbl (7): DATE, STORE_NBR, LYLTY_CARD_NBR, TXN_ID, PROD_NBR, PROD_QTY, TOT_SALES
## 
## i Use `spec()` to retrieve the full column specification for this data.
## i Specify the column types or set `show_col_types = FALSE` to quiet this message.
#3.1.1.CONDUCT EXPLORATORY DATA ANALYSIS
colnames(purchase_behaviour)  #List of column names
## [1] "LYLTY_CARD_NBR"   "LIFESTAGE"        "PREMIUM_CUSTOMER"
nrow(purchase_behaviour)  #How many rows are in data frame?
## [1] 72637
dim(purchase_behaviour)  #Dimensions of the data frame?
## [1] 72637     3
head(purchase_behaviour)  #See the first 6 rows of data frame.  Also tail(all_trips)
## # A tibble: 6 x 3
##   LYLTY_CARD_NBR LIFESTAGE              PREMIUM_CUSTOMER
##            <dbl> <chr>                  <chr>           
## 1           1000 YOUNG SINGLES/COUPLES  Premium         
## 2           1002 YOUNG SINGLES/COUPLES  Mainstream      
## 3           1003 YOUNG FAMILIES         Budget          
## 4           1004 OLDER SINGLES/COUPLES  Mainstream      
## 5           1005 MIDAGE SINGLES/COUPLES Mainstream      
## 6           1007 YOUNG SINGLES/COUPLES  Budget
str(purchase_behaviour)  #See list of columns and data types (numeric, character, etc)
## spec_tbl_df [72,637 x 3] (S3: spec_tbl_df/tbl_df/tbl/data.frame)
##  $ LYLTY_CARD_NBR  : num [1:72637] 1000 1002 1003 1004 1005 ...
##  $ LIFESTAGE       : chr [1:72637] "YOUNG SINGLES/COUPLES" "YOUNG SINGLES/COUPLES" "YOUNG FAMILIES" "OLDER SINGLES/COUPLES" ...
##  $ PREMIUM_CUSTOMER: chr [1:72637] "Premium" "Mainstream" "Budget" "Mainstream" ...
##  - attr(*, "spec")=
##   .. cols(
##   ..   LYLTY_CARD_NBR = col_double(),
##   ..   LIFESTAGE = col_character(),
##   ..   PREMIUM_CUSTOMER = col_character()
##   .. )
##  - attr(*, "problems")=<externalptr>
summary(purchase_behaviour)  #Statistical summary of data. Mainly for numerics
##  LYLTY_CARD_NBR     LIFESTAGE         PREMIUM_CUSTOMER  
##  Min.   :   1000   Length:72637       Length:72637      
##  1st Qu.:  66202   Class :character   Class :character  
##  Median : 134040   Mode  :character   Mode  :character  
##  Mean   : 136186                                        
##  3rd Qu.: 203375                                        
##  Max.   :2373711
colnames(transaction_data)  #List of column names
## [1] "DATE"           "STORE_NBR"      "LYLTY_CARD_NBR" "TXN_ID"        
## [5] "PROD_NBR"       "PROD_NAME"      "PROD_QTY"       "TOT_SALES"
nrow(transaction_data)  #How many rows are in data frame?
## [1] 264836
dim(transaction_data)  #Dimensions of the data frame?
## [1] 264836      8
head(transaction_data)  #See the first 6 rows of data frame.  Also tail(all_trips)
## # A tibble: 6 x 8
##    DATE STORE_NBR LYLTY_CARD_NBR TXN_ID PROD_NBR PROD_NAME    PROD_QTY TOT_SALES
##   <dbl>     <dbl>          <dbl>  <dbl>    <dbl> <chr>           <dbl>     <dbl>
## 1 43390         1           1000      1        5 Natural Chi~        2       6  
## 2 43599         1           1307    348       66 CCs Nacho C~        3       6.3
## 3 43605         1           1343    383       61 Smiths Crin~        2       2.9
## 4 43329         2           2373    974       69 Smiths Chip~        5      15  
## 5 43330         2           2426   1038      108 Kettle Tort~        3      13.8
## 6 43604         4           4074   2982       57 Old El Paso~        1       5.1
str(transaction_data)  #See list of columns and data types (numeric, character, etc)
## spec_tbl_df [264,836 x 8] (S3: spec_tbl_df/tbl_df/tbl/data.frame)
##  $ DATE          : num [1:264836] 43390 43599 43605 43329 43330 ...
##  $ STORE_NBR     : num [1:264836] 1 1 1 2 2 4 4 4 5 7 ...
##  $ LYLTY_CARD_NBR: num [1:264836] 1000 1307 1343 2373 2426 ...
##  $ TXN_ID        : num [1:264836] 1 348 383 974 1038 ...
##  $ PROD_NBR      : num [1:264836] 5 66 61 69 108 57 16 24 42 52 ...
##  $ PROD_NAME     : chr [1:264836] "Natural Chip        Compny SeaSalt175g" "CCs Nacho Cheese    175g" "Smiths Crinkle Cut  Chips Chicken 170g" "Smiths Chip Thinly  S/Cream&Onion 175g" ...
##  $ PROD_QTY      : num [1:264836] 2 3 2 5 3 1 1 1 1 2 ...
##  $ TOT_SALES     : num [1:264836] 6 6.3 2.9 15 13.8 5.1 5.7 3.6 3.9 7.2 ...
##  - attr(*, "spec")=
##   .. cols(
##   ..   DATE = col_double(),
##   ..   STORE_NBR = col_double(),
##   ..   LYLTY_CARD_NBR = col_double(),
##   ..   TXN_ID = col_double(),
##   ..   PROD_NBR = col_double(),
##   ..   PROD_NAME = col_character(),
##   ..   PROD_QTY = col_double(),
##   ..   TOT_SALES = col_double()
##   .. )
##  - attr(*, "problems")=<externalptr>
summary(transaction_data)  #Statistical summary of data. Mainly for numerics
##       DATE         STORE_NBR     LYLTY_CARD_NBR        TXN_ID       
##  Min.   :43282   Min.   :  1.0   Min.   :   1000   Min.   :      1  
##  1st Qu.:43373   1st Qu.: 70.0   1st Qu.:  70021   1st Qu.:  67602  
##  Median :43464   Median :130.0   Median : 130358   Median : 135138  
##  Mean   :43464   Mean   :135.1   Mean   : 135550   Mean   : 135158  
##  3rd Qu.:43555   3rd Qu.:203.0   3rd Qu.: 203094   3rd Qu.: 202701  
##  Max.   :43646   Max.   :272.0   Max.   :2373711   Max.   :2415841  
##     PROD_NBR       PROD_NAME            PROD_QTY         TOT_SALES      
##  Min.   :  1.00   Length:264836      Min.   :  1.000   Min.   :  1.500  
##  1st Qu.: 28.00   Class :character   1st Qu.:  2.000   1st Qu.:  5.400  
##  Median : 56.00   Mode  :character   Median :  2.000   Median :  7.400  
##  Mean   : 56.58                      Mean   :  1.907   Mean   :  7.304  
##  3rd Qu.: 85.00                      3rd Qu.:  2.000   3rd Qu.:  9.200  
##  Max.   :114.00                      Max.   :200.000   Max.   :650.000
# STEP 4: CLEAN UP AND ADD DATA TO PREPARE FOR ANALYSIS
# Inspect the two tables 

# There are a few problems we will need to fix:
# (1) The date column in the transaction table is in integer format.Let's change it to date format
transaction_data$DATE<-as.Date(transaction_data$DATE, origin = "1899-12-30")
# (2) check that we are looking at the right products by examining PROD_NAME
summary(transaction_data$PROD_NAME)
##    Length     Class      Mode 
##    264836 character character
# Examine the words in PROD_NAME to see if there are any incorrect entries
# such as products that are not chips
productWords <- data.table(unlist(strsplit(unique(transaction_data$PROD_NAME), "
")))
# use the setnames R function to rename certain column names
setnames(productWords,'V1','words')
#view productwords
productWords
##                                         words
##   1:   Natural Chip        Compny SeaSalt175g
##   2:                 CCs Nacho Cheese    175g
##   3:   Smiths Crinkle Cut  Chips Chicken 170g
##   4:   Smiths Chip Thinly  S/Cream&Onion 175g
##   5: Kettle Tortilla ChpsHny&Jlpno Chili 150g
##  ---                                         
## 110:    Red Rock Deli Chikn&Garlic Aioli 150g
## 111:      RRD SR Slow Rst     Pork Belly 150g
## 112:                 RRD Pc Sea Salt     165g
## 113:       Smith Crinkle Cut   Bolognese 150g
## 114:                 Doritos Salsa Mild  300g
#As we are only interested in words that will tell us if the product is chips or not
#let's remove all words with digits and special characters such as '&' from our set of product words.
#We can do this using `grepl()`
# Removing digits
# Removing special characters
#Removing numbers and extra spaces
#On transaction_data
transaction_data$PROD_NAME = substr(transaction_data$PROD_NAME,1,nchar(transaction_data$PROD_NAME))
transaction_data$PROD_NAME = gsub("\\s+"," ",transaction_data$PROD_NAME)
transaction_data
## # A tibble: 264,836 x 8
##    DATE       STORE_NBR LYLTY_CARD_NBR TXN_ID PROD_NBR PROD_NAME        PROD_QTY
##    <date>         <dbl>          <dbl>  <dbl>    <dbl> <chr>               <dbl>
##  1 2018-10-17         1           1000      1        5 Natural Chip Co~        2
##  2 2019-05-14         1           1307    348       66 CCs Nacho Chees~        3
##  3 2019-05-20         1           1343    383       61 Smiths Crinkle ~        2
##  4 2018-08-17         2           2373    974       69 Smiths Chip Thi~        5
##  5 2018-08-18         2           2426   1038      108 Kettle Tortilla~        3
##  6 2019-05-19         4           4074   2982       57 Old El Paso Sal~        1
##  7 2019-05-16         4           4149   3333       16 Smiths Crinkle ~        1
##  8 2019-05-16         4           4196   3539       24 Grain Waves Swe~        1
##  9 2018-08-20         5           5026   4525       42 Doritos Corn Ch~        1
## 10 2018-08-18         7           7150   6900       52 Grain Waves Sou~        2
## # ... with 264,826 more rows, and 1 more variable: TOT_SALES <dbl>
#and on productWords
productWords$words = substr(productWords$words,1,nchar(productWords$words))
productWords$words = gsub("\\s+"," ",productWords$words)
productWords
##                                         words
##   1:          Natural Chip Compny SeaSalt175g
##   2:                    CCs Nacho Cheese 175g
##   3:    Smiths Crinkle Cut Chips Chicken 170g
##   4:    Smiths Chip Thinly S/Cream&Onion 175g
##   5: Kettle Tortilla ChpsHny&Jlpno Chili 150g
##  ---                                         
## 110:    Red Rock Deli Chikn&Garlic Aioli 150g
## 111:          RRD SR Slow Rst Pork Belly 150g
## 112:                     RRD Pc Sea Salt 165g
## 113:         Smith Crinkle Cut Bolognese 150g
## 114:                  Doritos Salsa Mild 300g
#There are salsa products in the dataset but we are only interested in the chips category, so let's remove these.
#### First use the the grep function to find matches of salsa word within each string
VPN <- productWords %>% pull(words)
grep("salsa", VPN, ignore.case = TRUE, value = TRUE)
## [1] "Old El Paso Salsa Dip Tomato Mild 300g"
## [2] "Red Rock Deli SR Salsa & Mzzrlla 150g" 
## [3] "Smiths Crinkle Cut Tomato Salsa 150g"  
## [4] "Doritos Salsa Medium 300g"             
## [5] "Old El Paso Salsa Dip Chnky Tom Ht300g"
## [6] "Woolworths Mild Salsa 300g"            
## [7] "Old El Paso Salsa Dip Tomato Med 300g" 
## [8] "Woolworths Medium Salsa 300g"          
## [9] "Doritos Salsa Mild 300g"
# took the salsas product number: 57, 64, 39, 101, 65, 35, 59, 76, 41. and deleted all salsa products
# from transaction data

transaction_data = filter(transaction_data, PROD_NBR != 57, PROD_NBR != 64, PROD_NBR != 39,
                          PROD_NBR != 101, PROD_NBR != 65, PROD_NBR != 35, PROD_NBR != 59,
                          PROD_NBR != 76, PROD_NBR != 41)


#### Summarise the data to check for nulls and possible outliers
mean(transaction_data$PROD_QTY)
## [1] 1.908062
min(transaction_data$PROD_QTY)
## [1] 1
max(transaction_data$PROD_QTY)
## [1] 200
#There are no nulls in the columns but product quantity appears to have an outlier
#which we should investigate further. Let's investigate further the case where 200
#packets of chips are bought in one transaction.

#### Filter the dataset to find the outlier
filter(transaction_data,transaction_data$PROD_QTY==200)
## # A tibble: 2 x 8
##   DATE       STORE_NBR LYLTY_CARD_NBR TXN_ID PROD_NBR PROD_NAME         PROD_QTY
##   <date>         <dbl>          <dbl>  <dbl>    <dbl> <chr>                <dbl>
## 1 2018-08-19       226         226000 226201        4 Dorito Corn Chp ~      200
## 2 2019-05-20       226         226000 226210        4 Dorito Corn Chp ~      200
## # ... with 1 more variable: TOT_SALES <dbl>
#There are two transactions where 200 packets of chips are bought in one transaction
#and both of these transactions were by the same customer.
#### Let's see if the customer has had other transactions
filter(purchase_behaviour,LYLTY_CARD_NBR==226000)
## # A tibble: 1 x 3
##   LYLTY_CARD_NBR LIFESTAGE      PREMIUM_CUSTOMER
##            <dbl> <chr>          <chr>           
## 1         226000 OLDER FAMILIES Premium
#The customer is in the older families lifestage  and is a premium customer hence might explain the large purchase

#Now, let's look at the number of transaction lines over time to see
#if there are any obvious data issues such as missing data.

#### Count the number of transactions by date
transaction_by_date<-transaction_data%>% count(DATE)
#There's only 364 rows, meaning only 364 dates which indicates a missing date. Let's
#create a sequence of dates from 1 Jul 2018 to 30 Jun 2019 and use this to create a
#chart of number of transactions over time to find the missing date.
# Create a sequence of dates and join this the count of transactions by date
#create a column of dates that includes every day from 1 Jul 2018 to
#30 Jun 2019, and join it onto the data to fill in the missing day.

date_sequence <- data.frame(c(seq(as.Date("2018-07-01"), as.Date("2019-06-30"), "days")))
setnames(date_sequence, "DATE")
head(date_sequence)
##         DATE
## 1 2018-07-01
## 2 2018-07-02
## 3 2018-07-03
## 4 2018-07-04
## 5 2018-07-05
## 6 2018-07-06
# joining the date sequence onto the transaction-by-date dataframe to fill in the missing date.
transaction_by_date <- merge(x = transaction_by_date, y = date_sequence, by = "DATE", all = TRUE)
head(transaction_by_date)
##         DATE   n
## 1 2018-07-01 663
## 2 2018-07-02 650
## 3 2018-07-03 674
## 4 2018-07-04 669
## 5 2018-07-05 660
## 6 2018-07-06 711
filter(transaction_by_date, DATE >= "2018-12-15" & DATE < "2018-12-31" )
##          DATE   n
## 1  2018-12-15 671
## 2  2018-12-16 709
## 3  2018-12-17 729
## 4  2018-12-18 799
## 5  2018-12-19 839
## 6  2018-12-20 808
## 7  2018-12-21 781
## 8  2018-12-22 840
## 9  2018-12-23 853
## 10 2018-12-24 865
## 11 2018-12-25  NA
## 12 2018-12-26 700
## 13 2018-12-27 690
## 14 2018-12-28 669
## 15 2018-12-29 666
## 16 2018-12-30 686
#### Setting plot themes to format graphs
theme_set(theme_bw())
theme_update(plot.title = element_text(hjust = 0.5))
## Plot transactions over time
ggplot(transaction_by_date, aes(x = DATE, y = n)) +
  geom_line() +
  labs(x = "day", y = "Number of transactions", title = "Transactions over time") +
  scale_x_date(breaks = "1 month") +
  theme(axis.text.x = element_text(angle = 60, vjust = 0.5))

#We can see that there is an increase in purchases in December and a break in late
#December. Let's zoom in on this.
#### Filter to December and look at individual days
ggplot(transaction_by_date[month(transaction_by_date$DATE) == 12, ], aes(x = DATE, y = n)) +
  geom_line(color = "blue", size = 1) +
  labs(x = "Day", y = "Number of transactions", title = "Transactions over time") +
  scale_x_date(breaks = "1 day") +
  theme(axis.text.x = element_text(angle = 60, vjust = 0.5))

#We can see that the increase in sales occurs in the lead-up to Christmas
#and that there are zero sales on Christmas day itself. This is due to shops being closed on Christmas day. 
#Now that we are satisfied that the data no longer has outliers,
#we can move on to creating other features such as brand of chips or pack size from PROD_NAME.
#We will start with pack size.

transaction_data$PACK_SIZE <-parse_number(transaction_data$PROD_NAME)

pack_size_count <- transaction_data %>%
  select(PACK_SIZE) %>%
  count(PACK_SIZE, name = "n") %>%
  arrange(-n)
pack_size_count
## # A tibble: 20 x 2
##    PACK_SIZE     n
##        <dbl> <int>
##  1       175 66390
##  2       150 40203
##  3       134 25102
##  4       110 22387
##  5       170 19983
##  6       165 15297
##  7       330 12540
##  8       380  6418
##  9       270  6285
## 10       210  6272
## 11       200  4473
## 12       135  3257
## 13       250  3169
## 14        90  3008
## 15       190  2995
## 16       160  2970
## 17       220  1564
## 18        70  1507
## 19       180  1468
## 20       125  1454
# plotting a histogram of PACK_SIZE since we know that it is a categorical variable and not a continuous variable even though it is numeric.
options(scipen=999) # turn off scientific notations like 1e+05
# Changing pack size to numeric format
transaction_data$PACK_SIZE <- as.numeric(as.character(transaction_data$PACK_SIZE))

hist(transaction_data$PACK_SIZE, main = "Chip Pack Size Frequency", xlab = "Pack Size (g)",
     ylab = "Frequency", col = "blue")

#Pack sizes created look reasonable. Now to create brands, we can use the first word in PROD_NAME to work out the brand name…

# creating brand by using the first words of the PROD_NAME
transaction_data$BRAND <- str_extract(transaction_data$PROD_NAME, "(\\w+)")
transaction_data$BRAND <- toupper(transaction_data$BRAND)
transaction_data %>%
  select(BRAND) %>%
  count(BRAND, name = "count") %>%
  arrange(BRAND)
## # A tibble: 28 x 2
##    BRAND    count
##    <chr>    <int>
##  1 BURGER    1564
##  2 CCS       4551
##  3 CHEETOS   2927
##  4 CHEEZELS  4603
##  5 COBS      9693
##  6 DORITO    3185
##  7 DORITOS  22041
##  8 FRENCH    1418
##  9 GRAIN     6272
## 10 GRNWVES   1468
## # ... with 18 more rows
#Examining the customer data
#Now that we are happy with the transaction dataset, let’s have a look at the customer dataset.

# Examining customer data
str(purchase_behaviour)
## spec_tbl_df [72,637 x 3] (S3: spec_tbl_df/tbl_df/tbl/data.frame)
##  $ LYLTY_CARD_NBR  : num [1:72637] 1000 1002 1003 1004 1005 ...
##  $ LIFESTAGE       : chr [1:72637] "YOUNG SINGLES/COUPLES" "YOUNG SINGLES/COUPLES" "YOUNG FAMILIES" "OLDER SINGLES/COUPLES" ...
##  $ PREMIUM_CUSTOMER: chr [1:72637] "Premium" "Mainstream" "Budget" "Mainstream" ...
##  - attr(*, "spec")=
##   .. cols(
##   ..   LYLTY_CARD_NBR = col_double(),
##   ..   LIFESTAGE = col_character(),
##   ..   PREMIUM_CUSTOMER = col_character()
##   .. )
##  - attr(*, "problems")=<externalptr>
summary(purchase_behaviour)
##  LYLTY_CARD_NBR     LIFESTAGE         PREMIUM_CUSTOMER  
##  Min.   :   1000   Length:72637       Length:72637      
##  1st Qu.:  66202   Class :character   Class :character  
##  Median : 134040   Mode  :character   Mode  :character  
##  Mean   : 136186                                        
##  3rd Qu.: 203375                                        
##  Max.   :2373711
colSums(is.na(purchase_behaviour)) # looking for missing values
##   LYLTY_CARD_NBR        LIFESTAGE PREMIUM_CUSTOMER 
##                0                0                0
#### Merge transaction data to customer data
data <- merge(transaction_data, purchase_behaviour, all.x = TRUE)

#As the number of rows in `data` is the same as that of `transactionData`, we can be
#sure that no duplicates were created. This is because we created `data` by setting
#`all.x = TRUE` (in other words, a left join) which means take all the rows in
#`transactionData` and find rows with matching values in shared columns and then
#joining the details in these rows to the `x` or the first mentioned table
#Let's also check if some customers were not matched on by checking for nulls.
colSums(is.na(data))
##   LYLTY_CARD_NBR             DATE        STORE_NBR           TXN_ID 
##                0                0                0                0 
##         PROD_NBR        PROD_NAME         PROD_QTY        TOT_SALES 
##                0                0                0                0 
##        PACK_SIZE            BRAND        LIFESTAGE PREMIUM_CUSTOMER 
##                0                0                0                0
#there are no nulls! So all our customers in the transaction data has been
#accounted for in the purchase_behaviour
#we can define some metrics of interest to the client:
#Who spends the most on chips (total sales), describing customers by lifestage and
#how premium their general purchasing behaviour is
#How many customers are in each segment
#How many chips are bought per customer by segment
#What's the average chip price by customer segment
#calculating total sales by LIFESTAGE and PREMIUM_CUSTOMER and
#plotting the split by these segments to describe which customer segment contribute most to chip sales.

# Total sales by LIFESTAGE and PREMIUM_CUSTOMER
total_sales <-data%>%
group_by(LIFESTAGE, PREMIUM_CUSTOMER)%>%
summarise(NUMBER_OF_SALES = n(), TOTAL_SALES = sum(TOT_SALES))%>%
arrange(LIFESTAGE, PREMIUM_CUSTOMER)
## `summarise()` has grouped output by 'LIFESTAGE'. You can override using the `.groups` argument.
#VIEW TOTAL SALES
total_sales
## # A tibble: 21 x 4
## # Groups:   LIFESTAGE [7]
##    LIFESTAGE              PREMIUM_CUSTOMER NUMBER_OF_SALES TOTAL_SALES
##    <chr>                  <chr>                      <int>       <dbl>
##  1 MIDAGE SINGLES/COUPLES Budget                      4691      33346.
##  2 MIDAGE SINGLES/COUPLES Mainstream                 11095      84734.
##  3 MIDAGE SINGLES/COUPLES Premium                     7612      54444.
##  4 NEW FAMILIES           Budget                      2824      20607.
##  5 NEW FAMILIES           Mainstream                  2185      15980.
##  6 NEW FAMILIES           Premium                     1488      10761.
##  7 OLDER FAMILIES         Budget                     21514     156864.
##  8 OLDER FAMILIES         Mainstream                 13241      96414.
##  9 OLDER FAMILIES         Premium                    10405      76543.
## 10 OLDER SINGLES/COUPLES  Budget                     17172     127834.
## # ... with 11 more rows
# Number of customers on each life stage
number_of_customers <- data %>%
  group_by(LIFESTAGE, PREMIUM_CUSTOMER) %>%
  summarise(CUSTOMER_COUNT = uniqueN(LYLTY_CARD_NBR)) %>%
  arrange(-CUSTOMER_COUNT)
## `summarise()` has grouped output by 'LIFESTAGE'. You can override using the `.groups` argument.
#view number of customers
number_of_customers
## # A tibble: 21 x 3
## # Groups:   LIFESTAGE [7]
##    LIFESTAGE             PREMIUM_CUSTOMER CUSTOMER_COUNT
##    <chr>                 <chr>                     <int>
##  1 YOUNG SINGLES/COUPLES Mainstream                 7917
##  2 RETIREES              Mainstream                 6358
##  3 OLDER SINGLES/COUPLES Mainstream                 4858
##  4 OLDER SINGLES/COUPLES Budget                     4849
##  5 OLDER SINGLES/COUPLES Premium                    4682
##  6 OLDER FAMILIES        Budget                     4611
##  7 RETIREES              Budget                     4385
##  8 YOUNG FAMILIES        Budget                     3953
##  9 RETIREES              Premium                    3812
## 10 YOUNG SINGLES/COUPLES Budget                     3647
## # ... with 11 more rows
p <- ggplot(data = number_of_customers) +
  geom_mosaic(aes(weight = number_of_customers, x = product(PREMIUM_CUSTOMER, LIFESTAGE), fill = PREMIUM_CUSTOMER)) +
  labs(x = "Lifestage", y = "Premium customer flag", title = "Proportion of customers") +
  theme(axis.text.x = element_text(angle = 90, vjust = 0.5))
#### Plot and label with proportion of customers

#### Average number of units per customer by LIFESTAGE and PREMIUM_CUSTOMER
avg_units <- data%>%
  group_by(LIFESTAGE,PREMIUM_CUSTOMER)%>%
  summarise(AVG=sum(PROD_QTY)/uniqueN(LYLTY_CARD_NBR))%>%
  arrange(-AVG)
## `summarise()` has grouped output by 'LIFESTAGE'. You can override using the `.groups` argument.
ggplot(data = avg_units, aes(weight = AVG, x = LIFESTAGE, fill = PREMIUM_CUSTOMER)) +
  geom_bar(position = position_dodge()) +
  labs(x = "Lifestage", y = "Avg units per transaction", title = "Units per customer") +
  theme(axis.text.x = element_text(angle = 90, vjust = 0.5))

#Older families and young families in general buy more chips per customer

#Let's also investigate the average price per unit chips bought for each customer segment
#as this is also a driver of total sales.

#### Average price per unit by LIFESTAGE and PREMIUM_CUSTOMER
avg_price <- data%>%
  group_by(LIFESTAGE,PREMIUM_CUSTOMER)%>%
summarise(AVG = sum(TOT_SALES)/sum(PROD_QTY))%>%
arrange(-AVG)
## `summarise()` has grouped output by 'LIFESTAGE'. You can override using the `.groups` argument.
#### Create plot
ggplot(data = avg_price, aes(weight = AVG, x = LIFESTAGE, fill = PREMIUM_CUSTOMER)) +
  geom_bar(position = position_dodge()) +
  labs(x = "Lifestage", y = "Avg price per unit", title = "Price per unit") +
  theme(axis.text.x = element_text(angle = 90, vjust = 0.5))

#Mainstream midage and young singles and couples are more willing to pay more per packet of chips compared
#to their budget and premium counterparts.
#This may be due to premium shoppers being more likely to buy healthy snacks and when they buy chips,
#this is mainly for entertainment purposes rather than their own consumption. This is also supported by there
#being fewer premium midage and young singles and couples buying chips compared to their mainstream counterparts.

#As the difference in average price per unit is not large, we can check if this difference
# is statistically significant. To do so, I will perform an independent t-test between mainstream vs premium midage
# young singles and couplesto see if thedifference is significant.Our data will yield revelant results
# about the statistical significance of the price diference. we have all the data which uses ordinal scale
#as measurement applied to the data, if we plot price data it result on a normal distribution,
#we can rely on the results with reasonable assurance

avg_price_unit <- data%>%
  group_by(PROD_NAME)%>%
summarise(price=sum(TOT_SALES/PROD_QTY))

#Plot histogram
          
hist(avg_price_unit$price, main = "Histogram of the price per unit",
xlab = "Price", border = "black", col = "deepskyblue3") 

#Deep dive into specific customer segments for insights
#We might want to target customer segments that contribute the most to sales to retain them or further increase sales. Let's look at Mainstream - young singles/couples. For instance, let's find out if they tend to buy a particular brand of chips.
data
##      LYLTY_CARD_NBR       DATE STORE_NBR TXN_ID PROD_NBR
## 1              1000 2018-10-17         1      1        5
## 2              1002 2018-09-16         1      2       58
## 3              1003 2019-03-08         1      4      106
## 4              1003 2019-03-07         1      3       52
## 5              1004 2018-11-02         1      5       96
## 6              1005 2018-12-28         1      6       86
## 7              1007 2018-12-04         1      7       49
## 8              1007 2018-12-05         1      8       10
## 9              1009 2018-11-20         1      9       20
## 10             1010 2018-09-09         1     10       51
## 11             1011 2018-12-01         1     14       49
## 12             1011 2018-12-19         1     15        1
## 13             1011 2018-07-29         1     12       84
## 14             1012 2019-06-19         1     17        3
## 15             1012 2019-03-15         1     16       20
## 16             1013 2019-03-07         1     19       91
## 17             1013 2019-03-04         1     18       93
## 18             1016 2019-04-19         1     20       74
## 19             1016 2019-06-09         1     21       63
## 20             1018 2018-11-28         1     23       97
## 21             1018 2018-09-03         1     22        3
## 22             1018 2019-06-20         1     24       38
## 23             1019 2019-01-27         1     25       84
## 24             1020 2018-08-16         1     26       19
## 25             1020 2018-10-02         1     27        7
## 26             1020 2019-05-02         1     28       84
## 27             1022 2018-10-24         1     29        3
## 28             1023 2019-05-27         1     30       53
## 29             1024 2019-02-20         1     31        5
## 30             1025 2018-11-21         1     32       69
## 31             1026 2018-12-08         1     33       91
## 32             1027 2018-07-06         1     34       38
## 33             1027 2018-08-13         1     35       16
## 34             1030 2019-06-23         1     37       10
## 35             1034 2019-03-29         1     39       80
## 36             1034 2019-03-24         1     38       75
## 37             1038 2018-12-07         1     41       53
## 38             1039 2018-10-30         1     42       12
## 39             1042 2018-07-21         1     45       94
## 40             1042 2019-03-07         1     47      105
## 41             1042 2019-02-12         1     46       63
## 42             1042 2019-04-23         1     48       37
## 43             1043 2019-02-16         1     49       40
## 44             1044 2019-06-30         1     50       45
## 45             1046 2019-02-13         1     51      112
## 46             1048 2018-08-02         1     52        1
## 47             1048 2019-01-24         1     54       38
## 48             1048 2018-09-09         1     53       30
## 49             1050 2019-04-13         1     55      111
## 50             1051 2018-09-25         1     56        8
## 51             1052 2018-09-05         1     57       44
## 52             1053 2018-08-07         1     58       47
## 53             1053 2019-04-19         1     59        3
## 54             1054 2018-11-24         1     60      114
## 55             1054 2019-02-05         1     61       73
## 56             1055 2018-07-08         1     62       43
## 57             1056 2019-05-31         1     63       93
## 58             1057 2019-02-24         1     66       36
## 59             1057 2018-07-06         1     64       23
## 60             1060 2019-04-01         1     68       15
## 61             1060 2018-10-01         1     67       70
## 62             1060 2019-05-06         1     69       47
## 63             1061 2019-04-25         1     70       44
## 64             1062 2019-02-10         1     72       67
## 65             1062 2018-11-23         1     71       92
## 66             1064 2019-02-06         1     73       87
## 67             1064 2019-02-22         1     74       19
## 68             1065 2018-09-11         1     75       38
## 69             1065 2018-09-24         1     76       84
## 70             1067 2018-10-27         1     78       95
## 71             1068 2018-07-21         1     79       73
## 72             1068 2019-01-10         1     80       95
## 73             1071 2019-01-19         1     82       60
## 74             1072 2018-07-27         1     84       73
## 75             1072 2019-04-04         1     85       95
## 76             1074 2019-01-18         1     86      107
## 77             1076 2019-05-16         1     87      107
## 78             1077 2019-05-16         1     88       60
## 79             1080 2019-02-28         1     90       83
## 80             1080 2019-06-18         1     91       79
## 81             1080 2018-11-30         1     89      111
## 82             1081 2019-03-19         1     94        8
## 83             1081 2019-02-27         1     93       96
## 84             1081 2018-09-27         1     92       17
## 85             1086 2019-02-13         1     97       75
## 86             1087 2018-07-25         1     98       90
## 87             1087 2019-04-10         1     99      106
## 88             1088 2018-09-18         1    100       87
## 89             1089 2019-03-23         1    102       97
## 90             1090 2019-04-27         1    103        6
## 91             1091 2019-02-05         1    104       66
## 92             1093 2018-12-26         1    105       55
## 93             1094 2019-03-24         1    107        9
## 94             1094 2018-10-21         1    106       53
## 95             1094 2019-04-10         1    108       99
## 96             1095 2019-01-10         1    109       79
## 97             1096 2018-07-02         1    110       68
## 98             1097 2018-11-27         1    111       29
## 99             1097 2019-01-24         1    112      102
## 100            1097 2019-05-05         1    113       55
## 101            1099 2018-10-10         1    114       30
## 102            1099 2019-02-25         1    115      105
## 103            1101 2018-07-17         1    116        6
## 104            1102 2018-07-20         1    117       54
## 105            1103 2019-03-06         1    118       73
## 106            1104 2018-09-11         1    119       50
## 107            1104 2019-05-22         1    121       14
## 108            1104 2019-05-13         1    120       87
## 109            1104 2019-05-23         1    122      112
## 110            1105 2019-03-28         1    123       66
## 111            1107 2018-07-09         1    125       61
## 112            1108 2019-04-23         1    126       43
## 113            1109 2018-12-17         1    127      100
## 114            1111 2018-10-04         1    128       66
## 115            1113 2019-03-26         1    129       30
## 116            1114 2018-08-26         1    130      113
## 117            1114 2018-09-19         1    132       48
## 118            1115 2019-04-10         1    134       12
## 119            1116 2019-04-17         1    138       11
## 120            1116 2019-02-26         1    137       14
## 121            1116 2018-09-20         1    135       68
## 122            1118 2018-08-25         1    141       53
## 123            1118 2019-05-07         1    142       58
## 124            1118 2018-07-14         1    140      105
## 125            1120 2018-09-23         1    143       47
## 126            1121 2018-09-04         1    144       27
## 127            1121 2019-05-12         1    145       45
## 128            1122 2018-08-08         1    146       99
## 129            1123 2019-02-04         1    147      110
## 130            1124 2019-06-27         1    150      106
## 131            1125 2018-11-12         1    151        8
## 132            1127 2019-04-24         1    152       56
## 133            1133 2019-03-15         1    153       48
## 134            1134 2019-01-12         1    155       79
## 135            1134 2018-10-01         1    154      100
## 136            1134 2019-05-26         1    156       90
## 137            1136 2019-02-02         1    157       66
## 138            1139 2019-04-05         1    159       83
## 139            1139 2019-06-25         1    160      112
## 140            1140 2018-07-09         1    161       51
## 141            1141 2018-12-03         1    163       31
## 142            1141 2018-09-07         1    162       33
## 143            1142 2018-09-03         1    164       74
## 144            1142 2019-04-22         1    165       54
## 145            1146 2018-11-24         1    168       91
## 146            1146 2019-03-10         1    169       21
## 147            1146 2019-05-24         1    170       33
## 148            1147 2018-08-11         1    171      102
## 149            1149 2019-05-01         1    172       19
## 150            1150 2018-12-04         1    174       19
## 151            1150 2019-04-14         1    176        5
## 152            1150 2019-02-23         1    175       23
## 153            1155 2018-07-16         1    178       53
## 154            1156 2018-09-16         1    180       62
## 155            1158 2019-02-08         1    181       54
## 156            1159 2018-09-18         1    182      109
## 157            1159 2019-05-05         1    185       24
## 158            1159 2019-05-02         1    184       20
## 159            1159 2018-12-15         1    183       14
## 160            1161 2018-09-02         1    186       26
## 161            1163 2019-02-07         1    189       12
## 162            1163 2018-08-17         1    188       46
## 163            1164 2019-03-02         1    191       10
## 164            1164 2019-01-07         1    190      104
## 165            1165 2019-05-17         1    192       12
## 166            1168 2019-03-10         1    193       74
## 167            1169 2019-01-18         1    195       86
## 168            1169 2018-08-05         1    194       11
## 169            1172 2018-10-25         1    198       80
## 170            1173 2018-08-26         1    199       54
## 171            1173 2018-09-15         1    200       80
## 172            1173 2018-12-20         1    201      106
## 173            1174 2018-10-08         1    203       49
## 174            1174 2019-02-15         1    204       18
## 175            1177 2019-06-18         1    205       99
## 176            1178 2018-10-21         1    206      112
## 177            1179 2018-12-24         1    209      100
## 178            1179 2018-12-20         1    208       89
## 179            1179 2019-05-27         1    210       77
## 180            1181 2018-09-18         1    211       21
## 181            1182 2018-09-13         1    212       26
## 182            1182 2018-12-17         1    213       37
## 183            1183 2018-08-22         1    214        6
## 184            1183 2018-12-12         1    215       38
## 185            1184 2018-11-25         1    216        2
## 186            1186 2018-11-23         1    218       83
## 187            1186 2018-10-31         1    217       55
## 188            1187 2018-08-08         1    219       13
## 189            1188 2018-07-29         1    221       96
## 190            1188 2018-07-13         1    220       46
## 191            1189 2019-02-03         1    224       13
## 192            1189 2018-09-10         1    223       67
## 193            1190 2019-05-22         1    225      114
## 194            1191 2019-06-17         1    226       23
## 195            1192 2019-03-11         1    228       67
## 196            1192 2018-09-05         1    227       53
## 197            1193 2019-04-10         1    229       71
## 198            1196 2018-09-05         1    230       32
## 199            1197 2019-05-12         1    231       23
## 200            1199 2018-10-31         1    233      105
## 201            1201 2018-09-13         1    234       45
## 202            1202 2019-02-11         1    236       23
## 203            1202 2019-01-23         1    235       32
## 204            1203 2018-08-24         1    237       23
## 205            1205 2019-02-28         1    239       44
## 206            1205 2019-01-04         1    238       87
## 207            1206 2019-02-12         1    242       17
## 208            1206 2019-01-26         1    241       23
## 209            1206 2018-07-17         1    240       48
## 210            1209 2018-08-10         1    243       13
## 211            1210 2018-07-18         1    244       48
## 212            1211 2019-01-01         1    245       30
## 213            1212 2019-01-27         1    246       72
## 214            1216 2018-07-28         1    248       91
## 215            1218 2019-06-13         1    249        2
## 216            1219 2019-04-30         1    250        4
## 217            1223 2018-12-16         1    252       56
## 218            1223 2018-08-10         1    251        6
## 219            1224 2019-03-27         1    255       61
## 220            1224 2018-11-25         1    254       75
## 221            1224 2018-09-01         1    253        1
## 222            1225 2018-09-21         1    256       27
## 223            1226 2018-10-09         1    257        3
## 224            1228 2018-08-04         1    258       79
## 225            1228 2018-09-08         1    259       71
## 226            1229 2018-11-08         1    260      100
## 227            1229 2018-12-27         1    261      109
## 228            1229 2019-02-02         1    262        7
## 229            1232 2019-04-13         1    265       79
## 230            1232 2019-03-29         1    264       14
## 231            1233 2018-07-01         1    266      110
## 232            1233 2019-01-11         1    268       51
## 233            1233 2018-12-03         1    267       32
## 234            1235 2019-06-21         1    269       29
## 235            1236 2018-09-29         1    270       42
## 236            1238 2018-10-07         1    271       25
## 237            1239 2019-03-29         1    272      109
## 238            1240 2019-01-11         1    273       31
## 239            1240 2019-04-24         1    275       56
## 240            1240 2019-02-17         1    274       43
## 241            1241 2018-09-30         1    276       40
## 242            1241 2019-03-04         1    277      110
## 243            1242 2018-12-18         1    278       55
## 244            1242 2019-06-02         1    279      110
## 245            1243 2019-04-07         1    280      102
## 246            1244 2019-06-30         1    281       75
## 247            1246 2018-07-14         1    282       49
## 248            1247 2019-01-02         1    284       10
## 249            1247 2018-09-18         1    283       90
## 250            1248 2019-05-28         1    285      107
## 251            1250 2019-03-09         1    286       61
## 252            1254 2018-10-08         1    287      108
## 253            1254 2019-02-02         1    288      105
## 254            1256 2018-07-21         1    289       90
## 255            1256 2019-03-30         1    290       21
## 256            1256 2019-05-31         1    291      102
## 257            1257 2018-07-25         1    292       42
## 258            1257 2019-04-14         1    293       32
## 259            1259 2018-07-30         1    294        4
## 260            1262 2019-01-16         1    295      112
## 261            1262 2019-06-09         1    297       15
## 262            1262 2019-05-11         1    296       80
## 263            1263 2019-03-11         1    300       14
## 264            1263 2018-12-06         1    299       68
## 265            1263 2018-10-17         1    298       93
## 266            1266 2019-01-08         1    302       87
## 267            1267 2019-02-02         1    303       99
## 268            1270 2018-08-17         1    304       17
## 269            1270 2018-11-29         1    305       86
## 270            1272 2019-06-22         1    306       45
## 271            1273 2018-10-15         1    307       62
## 272            1274 2019-04-10         1    308      104
## 273            1275 2019-02-01         1    309       71
## 274            1276 2019-05-22         1    310      103
## 275            1277 2018-11-19         1    311       78
## 276            1277 2019-05-31         1    312       94
## 277            1278 2018-08-29         1    313       63
## 278            1278 2018-11-30         1    315      113
## 279            1278 2018-10-15         1    314        2
## 280            1280 2018-10-25         1    317       89
## 281            1280 2018-08-29         1    316       79
## 282            1281 2019-03-19         1    318       13
## 283            1282 2018-08-16         1    319       67
## 284            1283 2018-07-29         1    320       21
## 285            1284 2018-08-07         1    321       80
## 286            1285 2019-01-18         1    322       14
## 287            1286 2019-03-02         1    324       11
## 288            1286 2019-02-22         1    323       94
## 289            1287 2018-09-24         1    325       15
## 290            1288 2018-09-16         1    326       70
## 291            1288 2018-11-10         1    328       68
## 292            1288 2018-09-23         1    327       66
## 293            1289 2019-05-14         1    329       96
## 294            1290 2018-12-19         1    330       68
## 295            1291 2018-07-08         1    331       79
## 296            1291 2018-07-23         1    332       95
## 297            1291 2018-08-14         1    333       27
## 298            1291 2018-10-14         1    334       96
## 299            1292 2018-08-22         1    335       54
## 300            1293 2018-07-04         1    336       46
## 301            1294 2018-08-09         1    337       79
## 302            1297 2019-05-24         1    338       93
## 303            1298 2019-01-16         1    339        8
## 304            1298 2019-02-23         1    340       21
## 305            1303 2019-01-25         1    342       22
## 306            1305 2018-09-24         1    343       20
## 307            1305 2019-02-22         1    344        7
## 308            1306 2019-03-08         1    345       90
## 309            1307 2019-05-14         1    348       66
## 310            1307 2018-11-10         1    346       96
## 311            1307 2019-03-09         1    347       54
## 312            1308 2018-09-06         1    349       89
## 313            1310 2018-11-13         1    350       43
## 314            1312 2018-08-01         1    351       69
## 315            1313 2019-06-27         1    355       40
## 316            1313 2018-11-27         1    352       86
## 317            1313 2019-05-28         1    354       85
## 318            1313 2019-05-13         1    353       90
## 319            1314 2019-02-13         1    357        5
## 320            1314 2018-11-17         1    356       72
## 321            1317 2018-10-06         1    358       47
## 322            1318 2018-07-22         1    359       88
## 323            1318 2018-09-02         1    361       98
## 324            1318 2019-04-04         1    362       24
## 325            1320 2019-04-16         1    364       60
## 326            1320 2018-11-17         1    363       81
## 327            1324 2018-07-15         1    365       72
## 328            1326 2018-11-26         1    367       93
## 329            1326 2018-11-11         1    366       44
## 330            1327 2018-12-01         1    368       89
## 331            1330 2018-07-26         1    370       77
## 332            1330 2018-08-14         1    371       68
## 333            1330 2018-12-18         1    372       92
## 334            1333 2018-09-23         1    373       50
## 335            1335 2018-11-23         1    375       25
## 336            1335 2018-08-06         1    374       94
## 337            1336 2019-06-27         1    377       61
## 338            1336 2018-08-01         1    376      103
## 339            1337 2019-02-06         1    378       82
## 340            1338 2019-02-18         1    379       67
## 341            1339 2019-01-04         1    380       13
## 342            1341 2018-08-01         1    381      110
## 343            1342 2019-05-13         1    382       47
## 344            1343 2019-05-20         1    383       61
## 345            1345 2018-09-18         1    384       26
## 346            1345 2018-12-21         1    385       12
## 347            1346 2019-05-07         1    388        9
## 348            1346 2018-09-04         1    386       77
## 349            1346 2019-02-18         1    387      106
## 350            1347 2018-12-05         1    389        8
## 351            1348 2018-11-01         1    390       28
## 352            1348 2019-03-13         1    391       48
## 353            1349 2019-04-21         1    393       61
## 354            1349 2019-03-25         1    392       18
## 355            1350 2019-04-07         1    396        2
## 356            1350 2018-07-26         1    394       91
## 357            1352 2018-07-11         1    398      108
## 358            1353 2018-12-11         1    400       49
## 359            1353 2018-07-09         1    399       36
## 360            1354 2019-06-14         1    402       72
## 361            1356 2019-05-29         1    404       13
## 362            1357 2018-09-16         1    405      113
## 363            1357 2019-01-09         1    406       26
## 364            1357 2019-05-25         1    407       94
## 365            1358 2018-12-02         1    408       40
## 366            1359 2018-12-20         1    409       53
## 367            1360 2019-06-01         1    412       17
## 368            1360 2018-09-29         1    410       16
## 369            1360 2019-02-20         1    411       31
## 370            1361 2019-05-08         1    413      109
## 371            1362 2018-11-04         1    414       46
## 372            1363 2019-06-04         1    415       75
## 373            1364 2018-09-03         1    416       44
## 374            1364 2019-05-05         1    418       78
## 375            1365 2019-03-02         1    420       11
## 376            1365 2019-01-29         1    419      113
## 377            1366 2018-07-03         1    421       27
## 378            1367 2019-05-20         1    424        7
## 379            1367 2019-04-21         1    422       82
## 380            1367 2019-04-24         1    423       51
## 381            1369 2019-03-27         1    426       12
## 382            1369 2019-04-14         1    427        6
## 383            1369 2018-11-05         1    425       31
## 384            1373 2018-09-21         1    429       84
## 385            1374 2018-10-27         1    431       21
## 386            1374 2018-10-22         1    430        9
## 387            1375 2018-08-14         1    432       98
## 388            1376 2018-12-26         1    434       66
## 389            1376 2018-11-30         1    433       66
## 390            1376 2019-04-02         1    435       25
## 391            1377 2018-10-15         1    437      105
## 392            1377 2018-09-05         1    436       84
## 393            1378 2018-11-06         1    438       90
## 394            1380 2018-08-03         1    440       74
## 395            1380 2018-09-27         1    441       71
## 396            1380 2019-06-26         1    442       85
## 397            1383 2018-08-01         1    443       89
## 398            1383 2018-11-16         1    444       25
## 399            1384 2018-07-02         1    445      106
## 400            1385 2018-08-10         1    446       22
## 401            1385 2018-10-05         1    447       22
## 402            1386 2019-03-22         1    448       54
## 403            1390 2018-09-06         1    449       94
## 404            1392 2019-06-15         1    451       79
## 405            1392 2019-02-08         1    450      111
## 406            1394 2018-12-29         1    452       74
## 407            1395 2019-04-06         1    453       61
## 408            1396 2019-02-06         1    454      103
## 409            1397 2018-11-10         1    455       95
## 410            1399 2018-11-29         1    456       27
## 411            1400 2018-10-17         1    459       52
## 412            1400 2018-09-18         1    458       25
## 413            1401 2019-05-30         1    460       27
## 414            1401 2019-06-07         1    461      110
## 415            1402 2018-07-11         1    462       47
## 416            1402 2019-06-30         1    464       17
## 417            1402 2018-09-02         1    463       48
## 418            1403 2018-11-08         1    465       67
## 419            1403 2019-06-19         1    466       24
## 420            1404 2018-08-15         1    467       21
## 421            1406 2018-10-24         1    468       25
## 422            1406 2019-06-19         1    469       27
## 423            1407 2018-12-28         1    470       32
## 424            1408 2019-06-23         1    471       21
## 425            1409 2019-01-04         1    472       71
## 426            1409 2019-05-07         1    473       84
## 427            1410 2018-12-24         1    474       37
## 428            1411 2018-07-30         1    475       12
## 429            1411 2018-11-05         1    477       36
## 430            1411 2018-10-18         1    476       92
## 431            1411 2019-03-04         1    478       30
## 432            1412 2018-07-29         1    479       58
## 433            1413 2019-04-20         1    481       48
## 434            1413 2018-10-14         1    480       85
## 435            1414 2018-07-02         1    482       42
## 436            1414 2019-04-13         1    484       95
## 437            1414 2018-10-15         1    483      111
## 438            1415 2019-03-01         1    485       44
## 439            1417 2018-08-12         1    486      103
## 440            1417 2018-09-02         1    487       70
## 441            1418 2018-11-01         1    488        3
## 442            1419 2018-10-10         1    490       24
## 443            1419 2018-09-13         1    489        9
## 444            1419 2018-11-07         1    491       23
## 445            1420 2019-03-16         1    492       40
## 446            1421 2019-06-10         1    493      107
## 447            1423 2019-02-15         1    496       48
## 448            1423 2018-07-30         1    495       33
## 449            1423 2019-04-05         1    497       60
## 450            1424 2019-05-18         1    498       55
## 451            1425 2018-07-24         1    499       17
## 452            1429 2018-09-25         1    500       30
## 453            1430 2018-09-27         1    501       77
## 454            1431 2018-10-02         1    503       17
## 455            1433 2019-06-09         1    504      103
## 456            1434 2018-10-01         1    505       96
## 457            1434 2018-11-08         1    506       30
## 458            1436 2018-08-28         1    507       49
## 459            1437 2018-12-03         1    508       21
## 460            1438 2018-11-01         1    509       24
## 461            1439 2019-03-07         1    510       74
## 462            1440 2018-07-08         1    511        8
## 463            1443 2019-06-13         1    513       82
## 464            1443 2019-01-12         1    512       45
## 465            1444 2018-08-24         1    514       79
## 466            1444 2019-06-25         1    516       72
## 467            1444 2019-02-09         1    515      107
## 468            1446 2019-06-20         1    517       99
## 469            1446 2019-06-20         1    517        9
## 470            1448 2018-09-17         1    518       47
## 471            1448 2019-01-25         1    519       52
## 472            1450 2018-11-08         1    521       25
## 473            1451 2019-06-27         1    523       79
## 474            1451 2019-02-18         1    522       20
## 475            1452 2018-11-14         1    524       25
## 476            1452 2019-01-10         1    525        7
## 477            1453 2019-06-20         1    526       12
## 478            1454 2019-03-17         1    527       71
## 479            1455 2018-12-01         1    529       36
## 480            1455 2018-10-26         1    528       70
## 481            1455 2019-04-23         1    530       34
## 482            1456 2019-05-07         1    533       63
## 483            1456 2019-03-17         1    531       90
## 484            1456 2019-03-30         1    532       77
## 485            1457 2019-04-24         1    535       13
## 486            1457 2018-09-06         1    534      106
## 487            1459 2019-05-10         1    537       30
## 488            1459 2019-06-29         1    538       90
## 489            1459 2019-02-11         1    536       17
## 490            1460 2018-08-14         1    539       19
## 491            1460 2019-03-26         1    540       80
## 492            1461 2019-05-14         1    542       96
## 493            1462 2018-07-09         1    543      110
## 494            1464 2018-12-04         1    545       50
## 495            1464 2019-02-21         1    546       88
## 496            1465 2019-03-24         1    547       85
## 497            1467 2018-09-01         1    548       82
## 498            1468 2019-03-10         1    549       26
## 499            1470 2019-06-18         1    552       56
## 500            1470 2018-09-01         1    550       36
## 501            1470 2019-01-31         1    551       79
## 502            1471 2018-07-28         1    553       47
## 503            1473 2019-02-06         1    555      111
## 504            1473 2018-12-31         1    554       70
## 505            1474 2019-01-12         1    556       72
## 506            1475 2019-03-11         1    557       23
## 507            1477 2019-02-13         1    559       63
## 508            1477 2019-01-26         1    558      113
## 509            1478 2019-02-10         1    560        4
## 510            1480 2019-04-24         1    562      114
## 511            1480 2019-03-09         1    561       56
## 512            1482 2018-10-15         1    564       33
## 513            1482 2018-07-01         1    563        8
## 514            1484 2018-12-09         1    565       25
## 515            1484 2019-06-13         1    566       24
## 516            1485 2018-11-30         1    567      106
## 517            1487 2019-01-13         1    570       68
## 518            1487 2018-11-17         1    569       94
## 519            1488 2018-10-06         1    572      114
## 520            1489 2019-05-17         1    574       94
## 521            1489 2019-02-18         1    573       91
## 522            1490 2018-11-14         1    576       14
## 523            1490 2018-10-06         1    575       93
## 524            1491 2019-04-21         1    577      113
## 525            1494 2018-12-17         1    579       55
## 526            1495 2019-01-03         1    580      107
## 527            1501 2019-05-27         1    585       74
## 528            1501 2019-02-25         1    583       82
## 529            1501 2019-02-24         1    582        8
## 530            1501 2019-05-21         1    584       63
## 531            1501 2018-08-07         1    581        5
## 532            1502 2018-08-18         1    587       13
## 533            1502 2018-07-25         1    586       99
## 534            1504 2019-06-26         1    589       11
## 535            1504 2018-07-08         1    588       21
## 536            2000 2019-03-21         2    591       45
## 537            2000 2019-05-12         2    592       62
## 538            2000 2019-03-06         2    590       47
## 539            2001 2018-12-18         2    593       62
## 540            2002 2018-10-20         2    594        5
## 541            2003 2019-04-05         2    595       33
## 542            2004 2018-09-28         2    596      112
## 543            2004 2019-05-26         2    597       97
## 544            2006 2018-08-17         2    598       36
## 545            2006 2019-03-24         2    599       63
## 546            2008 2018-09-04         2    600       29
## 547            2008 2019-04-09         2    601       40
## 548            2010 2018-10-04         2    602       33
## 549            2012 2019-04-13         2    603       78
## 550            2013 2018-12-12         2    604       43
## 551            2015 2019-04-22         2    605       22
## 552            2017 2019-06-01         2    607       43
## 553            2017 2018-12-15         2    606      105
## 554            2018 2019-04-20         2    608        1
## 555            2019 2019-06-03         2    609       69
## 556            2020 2019-03-25         2    610       25
## 557            2022 2019-05-28         2    612       30
## 558            2022 2018-09-15         2    611       92
## 559            2023 2019-02-03         2    613       60
## 560            2024 2018-12-19         2    615       88
## 561            2025 2018-09-04         2    616      112
## 562            2025 2018-11-16         2    617       75
## 563            2026 2018-07-31         2    618       99
## 564            2026 2019-01-02         2    619       50
## 565            2026 2019-05-01         2    620       26
## 566            2027 2018-08-05         2    621       30
## 567            2027 2019-01-31         2    622      112
## 568            2030 2019-05-13         2    624       84
## 569            2030 2019-04-02         2    623       23
## 570            2032 2018-11-09         2    625        4
## 571            2034 2018-12-20         2    628      104
## 572            2034 2018-12-20         2    628       95
## 573            2034 2018-07-13         2    627      109
## 574            2035 2019-06-19         2    629       75
## 575            2036 2019-06-15         2    630       18
## 576            2038 2018-10-20         2    631       13
## 577            2040 2019-06-25         2    632        9
## 578            2041 2018-10-05         2    633       96
## 579            2042 2018-10-13         2    635       17
## 580            2042 2018-07-03         2    634      105
## 581            2042 2019-04-13         2    636       52
## 582            2043 2019-03-21         2    638       25
## 583            2044 2019-06-22         2    640       28
## 584            2045 2019-06-17         2    641        6
## 585            2047 2018-07-17         2    642      107
## 586            2047 2019-04-05         2    643        6
## 587            2048 2018-10-27         2    644       27
## 588            2048 2019-01-18         2    645      102
## 589            2049 2019-02-06         2    646       98
## 590            2050 2019-03-28         2    650       53
## 591            2050 2018-08-06         2    647      102
## 592            2050 2018-08-20         2    648      112
## 593            2051 2018-12-21         2    652       51
## 594            2051 2018-07-03         2    651       38
## 595            2052 2018-07-16         2    653       16
## 596            2053 2019-05-21         2    654       79
## 597            2055 2019-03-25         2    655      112
## 598            2056 2018-10-07         2    656       26
## 599            2058 2019-01-13         2    657        2
## 600            2059 2019-04-11         2    658       68
## 601            2060 2018-08-25         2    659       16
## 602            2060 2018-10-19         2    660        4
## 603            2060 2019-05-31         2    661       21
## 604            2069 2019-01-09         2    663       56
## 605            2071 2018-11-28         2    664      111
## 606            2074 2019-01-02         2    665       21
## 607            2080 2019-05-07         2    667      114
## 608            2080 2019-03-24         2    666       36
## 609            2081 2018-12-29         2    668       26
## 610            2082 2018-12-12         2    669        7
## 611            2083 2018-08-26         2    670       71
## 612            2084 2018-09-03         2    672       24
## 613            2084 2018-08-27         2    671        9
## 614            2084 2018-10-26         2    674       96
## 615            2084 2018-10-23         2    673        3
## 616            2086 2019-03-08         2    676       40
## 617            2086 2018-11-13         2    675       79
## 618            2088 2019-06-28         2    677       85
## 619            2089 2019-06-07         2    679       24
## 620            2089 2018-12-09         2    678       87
## 621            2090 2019-03-21         2    681       30
## 622            2090 2019-02-10         2    680        8
## 623            2091 2019-03-27         2    683       46
## 624            2091 2018-12-11         2    682       85
## 625            2093 2018-10-02         2    684       21
## 626            2093 2019-01-19         2    685       26
## 627            2095 2019-02-03         2    686        9
## 628            2096 2018-10-26         2    687       17
## 629            2096 2018-11-17         2    688       89
## 630            2097 2018-08-13         2    689       90
## 631            2098 2019-06-12         2    691       97
## 632            2098 2019-04-28         2    690       13
## 633            2100 2018-08-01         2    692       93
## 634            2101 2019-03-27         2    693       98
## 635            2103 2019-05-16         2    695       47
## 636            2103 2019-06-02         2    696       71
## 637            2104 2018-11-20         2    697       93
## 638            2105 2018-10-26         2    698        8
## 639            2106 2018-09-23         2    699       66
## 640            2106 2018-12-07         2    701       24
## 641            2106 2019-03-17         2    702       77
## 642            2106 2019-05-08         2    703       67
## 643            2106 2018-11-11         2    700       54
## 644            2107 2018-12-28         2    705      105
## 645            2107 2018-10-17         2    704       63
## 646            2107 2019-05-08         2    706      113
## 647            2113 2019-06-05         2    709       94
## 648            2114 2019-05-27         2    710       74
## 649            2116 2018-12-07         2    711        1
## 650            2117 2018-07-01         2    712       73
## 651            2119 2019-03-08         2    713       83
## 652            2119 2019-04-22         2    714       24
## 653            2120 2018-10-02         2    715       68
## 654            2121 2019-05-10         2    716       33
## 655            2122 2019-04-13         2    717       31
## 656            2123 2019-02-05         2    719       81
## 657            2125 2019-05-19         2    721       42
## 658            2125 2018-11-19         2    720      105
## 659            2129 2019-04-14         2    723       90
## 660            2130 2018-12-20         2    724        5
## 661            2131 2018-07-07         2    725       19
## 662            2133 2018-10-01         2    728       79
## 663            2133 2018-09-19         2    727       97
## 664            2135 2019-06-16         2    729       89
## 665            2136 2018-11-12         2    730       54
## 666            2139 2018-07-12         2    732       37
## 667            2139 2019-05-26         2    733        7
## 668            2143 2019-04-30         2    735       93
## 669            2144 2018-08-18         2    737      110
## 670            2144 2019-05-15         2    738       50
## 671            2144 2018-08-13         2    736       19
## 672            2146 2018-11-02         2    739       44
## 673            2147 2019-03-28         2    741        2
## 674            2148 2018-09-23         2    742       11
## 675            2149 2019-05-06         2    743       78
## 676            2150 2019-03-04         2    744      113
## 677            2153 2018-11-09         2    746       18
## 678            2153 2018-11-27         2    747       75
## 679            2154 2019-03-27         2    750       71
## 680            2154 2018-07-22         2    749       94
## 681            2154 2018-07-04         2    748       19
## 682            2155 2019-05-20         2    753       46
## 683            2155 2019-03-05         2    752       62
## 684            2161 2019-03-06         2    754      108
## 685            2163 2018-12-28         2    755       86
## 686            2163 2019-01-11         2    756       29
## 687            2163 2019-03-30         2    757       29
## 688            2164 2018-11-13         2    758      108
## 689            2166 2018-12-01         2    759       29
## 690            2166 2018-12-24         2    760       77
## 691            2167 2019-05-14         2    762       43
## 692            2167 2019-01-14         2    761       27
## 693            2168 2019-01-10         2    764       47
## 694            2168 2018-07-05         2    763       38
## 695            2169 2018-12-13         2    765       69
## 696            2170 2018-09-18         2    766       88
## 697            2172 2018-07-10         2    768      110
## 698            2173 2019-05-04         2    770       24
## 699            2173 2019-03-18         2    769       97
## 700            2175 2019-01-28         2    771      113
## 701            2176 2018-07-22         2    772        6
## 702            2176 2018-11-04         2    773      100
## 703            2178 2018-08-18         2    774       13
## 704            2180 2019-01-29         2    775      111
## 705            2181 2019-06-24         2    780       42
## 706            2181 2019-04-17         2    778       31
## 707            2181 2018-10-04         2    776       82
## 708            2181 2019-06-19         2    779       61
## 709            2182 2019-01-26         2    781       91
## 710            2183 2019-03-16         2    782       37
## 711            2184 2019-01-02         2    784      110
## 712            2184 2018-07-29         2    783       14
## 713            2185 2019-01-07         2    785      113
## 714            2186 2019-02-16         2    787       78
## 715            2186 2019-02-15         2    786       30
## 716            2188 2019-05-26         2    789       89
## 717            2190 2019-03-10         2    791      112
## 718            2190 2018-08-05         2    790       20
## 719            2191 2018-08-06         2    792       32
## 720            2194 2018-07-20         2    793       21
## 721            2196 2018-08-27         2    794       95
## 722            2198 2018-11-20         2    795       34
## 723            2198 2019-03-28         2    796       66
## 724            2199 2018-09-05         2    797       98
## 725            2199 2019-06-01         2    798       95
## 726            2200 2019-04-03         2    799       80
## 727            2202 2019-03-09         2    803       81
## 728            2202 2019-05-13         2    804       49
## 729            2202 2018-09-12         2    800       82
## 730            2202 2018-12-03         2    802      110
## 731            2202 2018-11-04         2    801       53
## 732            2203 2018-09-23         2    805       28
## 733            2205 2019-01-13         2    808       18
## 734            2205 2018-07-12         2    807       72
## 735            2210 2018-12-11         2    810       13
## 736            2210 2018-11-13         2    809       19
## 737            2211 2018-07-02         2    811        1
## 738            2214 2018-09-15         2    812       26
## 739            2216 2018-08-24         2    813      114
## 740            2216 2019-02-16         2    814       43
## 741            2217 2019-06-29         2    816       84
## 742            2217 2018-09-03         2    815       16
## 743            2218 2019-01-20         2    817        5
## 744            2219 2018-12-27         2    818       25
## 745            2220 2019-04-20         2    820       48
## 746            2220 2019-01-29         2    819       93
## 747            2222 2019-03-26         2    821       49
## 748            2224 2018-12-26         2    823        9
## 749            2225 2018-07-05         2    824       82
## 750            2225 2019-05-06         2    826       94
## 751            2225 2018-11-03         2    825       60
## 752            2226 2019-06-15         2    828       94
## 753            2226 2018-10-23         2    827       98
## 754            2227 2018-12-30         2    829       23
## 755            2230 2019-01-09         2    831      102
## 756            2230 2018-07-09         2    830       14
## 757            2230 2019-03-28         2    832       86
## 758            2231 2019-04-05         2    833       17
## 759            2232 2019-06-21         2    834       89
## 760            2233 2019-02-17         2    835       90
## 761            2236 2019-05-19         2    838       94
## 762            2236 2019-05-27         2    839       19
## 763            2236 2019-02-24         2    837       12
## 764            2237 2018-10-06         2    840      112
## 765            2237 2019-04-18         2    841       94
## 766            2237 2019-06-27         2    842      104
## 767            2238 2018-09-11         2    843       14
## 768            2238 2019-05-24         2    845       77
## 769            2238 2018-09-17         2    844       73
## 770            2240 2019-01-17         2    846       28
## 771            2242 2019-04-05         2    849        1
## 772            2242 2018-07-03         2    847       21
## 773            2242 2018-09-14         2    848        6
## 774            2244 2018-10-30         2    852        3
## 775            2244 2018-07-12         2    851       52
## 776            2244 2018-07-10         2    850       90
## 777            2245 2018-08-22         2    853       92
## 778            2246 2019-06-05         2    854       58
## 779            2247 2019-06-15         2    856       46
## 780            2247 2018-08-02         2    855       99
## 781            2248 2019-04-09         2    857       31
## 782            2250 2019-01-07         2    858       21
## 783            2250 2019-01-12         2    859        5
## 784            2250 2019-04-30         2    861       27
## 785            2250 2019-02-22         2    860       14
## 786            2253 2019-04-08         2    862       19
## 787            2254 2019-02-24         2    863        4
## 788            2255 2018-11-14         2    864        3
## 789            2256 2018-12-14         2    866       55
## 790            2256 2019-05-02         2    867       24
## 791            2257 2019-02-19         2    870       19
## 792            2257 2018-11-21         2    868       89
## 793            2257 2019-02-12         2    869        2
## 794            2258 2019-01-18         2    871       74
## 795            2259 2019-01-14         2    872       12
## 796            2260 2019-02-11         2    873      110
## 797            2260 2019-04-16         2    874       95
## 798            2260 2019-05-12         2    875      108
## 799            2262 2019-03-22         2    876        9
## 800            2265 2018-07-31         2    877       66
## 801            2270 2018-11-23         2    879       66
## 802            2270 2019-03-30         2    880       66
## 803            2270 2018-08-30         2    878       66
## 804            2270 2019-06-24         2    881       84
## 805            2273 2018-10-27         2    883       45
## 806            2273 2018-10-29         2    884       52
## 807            2274 2019-03-24         2    886       68
## 808            2274 2019-05-07         2    887       69
## 809            2274 2018-11-10         2    885       23
## 810            2277 2019-01-28         2    888       63
## 811            2278 2019-01-18         2    889       50
## 812            2279 2019-06-02         2    891      100
## 813            2279 2018-07-07         2    890       13
## 814            2279 2019-06-28         2    892       18
## 815            2280 2018-10-10         2    893        8
## 816            2281 2019-05-27         2    894       95
## 817            2283 2018-07-01         2    895      108
## 818            2285 2019-04-16         2    896      102
## 819            2286 2019-06-29         2    897       40
## 820            2287 2018-08-04         2    898      114
## 821            2288 2018-07-04         2    899       68
## 822            2288 2019-06-29         2    900       46
## 823            2292 2019-04-13         2    901       74
## 824            2294 2018-07-05         2    902       20
## 825            2295 2019-01-06         2    903       29
## 826            2302 2018-10-12         2    905       51
## 827            2302 2019-01-07         2    906       12
## 828            2303 2018-11-13         2    907       83
## 829            2305 2019-02-23         2    910      102
## 830            2309 2018-11-03         2    911       82
## 831            2309 2019-05-12         2    912       92
## 832            2310 2018-11-08         2    913       82
## 833            2311 2018-08-28         2    915        2
## 834            2311 2019-01-01         2    917       29
## 835            2311 2019-01-21         2    918      104
## 836            2311 2018-08-25         2    914       27
## 837            2311 2018-09-02         2    916        5
## 838            2313 2019-06-24         2    919      108
## 839            2315 2019-04-06         2    920       78
## 840            2319 2019-05-17         2    922       81
## 841            2319 2018-10-24         2    921       29
## 842            2320 2019-06-03         2    924       63
## 843            2320 2019-05-10         2    923       40
## 844            2323 2019-04-19         2    925      110
## 845            2324 2018-10-17         2    927       71
## 846            2324 2018-07-31         2    926       55
## 847            2326 2018-08-04         2    928       88
## 848            2326 2018-11-05         2    929       50
## 849            2327 2019-05-31         2    930        7
## 850            2328 2019-04-22         2    931      112
## 851            2330 2018-09-29         2    932       51
## 852            2331 2018-12-12         2    933      100
## 853            2332 2018-10-06         2    934       15
## 854            2335 2019-03-25         2    936       20
## 855            2339 2019-01-19         2    937       86
## 856            2340 2019-01-20         2    939       42
## 857            2342 2019-06-15         2    940       72
## 858            2344 2018-10-19         2    941       42
## 859            2345 2019-05-06         2    943       77
## 860            2345 2019-06-15         2    944       12
## 861            2345 2019-01-17         2    942      106
## 862            2346 2019-02-09         2    946       30
## 863            2347 2018-08-05         2    947       11
## 864            2348 2018-12-28         2    948       28
## 865            2349 2019-04-23         2    950       82
## 866            2353 2019-01-11         2    952       17
## 867            2353 2018-10-10         2    951        2
## 868            2354 2018-08-12         2    953        3
## 869            2354 2018-08-29         2    954      113
## 870            2356 2018-08-31         2    955      109
## 871            2356 2019-03-03         2    956       96
## 872            2358 2019-02-04         2    958       72
## 873            2361 2019-04-06         2    960        3
## 874            2361 2019-04-26         2    961       96
## 875            2362 2018-09-01         2    962        9
## 876            2363 2019-01-24         2    963       91
## 877            2364 2019-04-20         2    965        1
## 878            2364 2018-12-01         2    964      100
## 879            2365 2018-07-15         2    966       54
## 880            2367 2018-12-07         2    967       70
## 881            2368 2018-09-02         2    968       43
## 882            2369 2019-03-04         2    970       14
## 883            2370 2019-02-15         2    971       74
## 884            2372 2018-10-10         2    973        9
## 885            2373 2018-08-17         2    974       69
## 886            2375 2018-09-07         2    975       28
## 887            2375 2018-10-22         2    976       55
## 888            2376 2019-02-17         2    979       40
## 889            2376 2018-10-27         2    977       22
## 890            2376 2019-06-11         2    980       91
## 891            2377 2019-03-11         2    981        7
## 892            2378 2018-07-07         2    982       87
## 893            2380 2018-09-12         2    983       36
## 894            2380 2019-02-18         2    985      104
## 895            2380 2019-02-01         2    984       40
## 896            2381 2018-11-06         2    986       48
## 897            2382 2018-08-05         2    987       25
## 898            2383 2018-11-13         2    989       16
## 899            2384 2019-03-19         2    991      104
## 900            2384 2019-02-06         2    990       15
## 901            2385 2019-05-18         2    995        6
## 902            2385 2018-09-22         2    992       44
## 903            2385 2019-01-03         2    994        1
## 904            2386 2019-04-11         2    997       68
## 905            2386 2019-01-09         2    996       56
## 906            2387 2019-01-16         2    998      112
## 907            2389 2019-03-05         2    999       18
## 908            2394 2018-10-14         2   1001       37
## 909            2395 2018-07-24         2   1002       69
## 910            2396 2019-03-30         2   1004        9
## 911            2398 2018-10-07         2   1006      102
## 912            2398 2019-05-07         2   1007        9
## 913            2399 2018-10-07         2   1008       25
## 914            2400 2019-04-22         2   1009        4
## 915            2401 2018-09-09         2   1011       26
## 916            2401 2018-08-14         2   1010       28
## 917            2402 2018-09-11         2   1013       68
## 918            2402 2018-11-04         2   1014      110
## 919            2402 2018-07-14         2   1012       96
## 920            2404 2019-02-12         2   1016       38
## 921            2404 2019-03-05         2   1017       96
## 922            2404 2018-09-24         2   1015       68
## 923            2409 2019-04-04         2   1018       38
## 924            2410 2019-01-08         2   1019       97
## 925            2411 2019-05-27         2   1022       99
## 926            2411 2018-10-05         2   1020      106
## 927            2411 2019-04-19         2   1021      113
## 928            2412 2018-10-25         2   1023       97
## 929            2413 2018-07-25         2   1024       22
## 930            2413 2019-05-10         2   1025       61
## 931            2414 2019-01-12         2   1026        2
## 932            2415 2019-05-31         2   1028       82
## 933            2415 2018-10-14         2   1027       30
## 934            2417 2018-08-09         2   1029        3
## 935            2417 2019-06-08         2   1032        1
## 936            2417 2019-02-01         2   1031        6
## 937            2418 2019-05-20         2   1033        9
## 938            2419 2019-05-22         2   1034       55
## 939            2421 2019-05-11         2   1035       25
## 940            2425 2019-06-14         2   1037       74
## 941            2425 2019-04-27         2   1036       58
## 942            2426 2018-08-18         2   1038      108
## 943            2427 2019-04-02         2   1040       36
## 944            2427 2019-01-16         2   1039       72
## 945            2428 2018-11-04         2   1041       23
## 946            2428 2018-12-07         2   1042       33
## 947            2429 2019-04-14         2   1044       20
## 948            2429 2019-04-22         2   1045       40
## 949            2429 2018-11-06         2   1043       66
## 950            2429 2019-06-24         2   1046       89
## 951            2430 2018-09-24         2   1047       44
## 952            2431 2019-04-30         2   1048       47
## 953            2433 2019-01-19         2   1049       58
## 954            2434 2019-05-10         2   1050      113
## 955            2437 2018-07-04         2   1051       32
## 956            2437 2018-08-15         2   1052       43
## 957            2438 2019-03-30         2   1054       96
## 958            2438 2018-09-26         2   1053       16
## 959            2439 2018-08-30         2   1055       98
## 960            2441 2018-08-30         2   1056       27
## 961            2444 2019-02-23         2   1057       99
## 962            2447 2018-09-15         2   1060       68
## 963            2447 2018-07-04         2   1059      106
## 964            2448 2018-09-21         2   1061       25
## 965            2450 2018-12-21         2   1063       88
## 966            2450 2018-12-11         2   1062       48
## 967            2450 2019-04-16         2   1064       85
## 968            2450 2019-05-23         2   1065      110
## 969            2451 2019-02-04         2   1067       23
## 970            2451 2019-06-15         2   1068       14
## 971            2451 2018-11-19         2   1066       74
## 972            2454 2018-12-17         2   1071       34
## 973            2456 2018-09-25         2   1073      112
## 974            2457 2019-02-05         2   1074       77
## 975            2458 2018-10-23         2   1075       14
## 976            2460 2019-02-28         2   1076       77
## 977            2466 2018-11-18         2   1077       88
## 978            2467 2018-11-05         2   1078       82
## 979            2468 2019-06-20         2   1079       24
## 980            2469 2018-10-02         2   1080       70
## 981            2470 2018-08-20         2   1081       26
## 982            2471 2018-08-24         2   1083       10
## 983            2472 2018-08-04         2   1084       51
## 984            2477 2018-08-18         2   1085       60
## 985            2477 2018-09-20         2   1086       42
## 986            2478 2018-10-05         2   1087       60
## 987            2478 2019-03-07         2   1088       20
## 988            2480 2019-06-15         2   1091       67
## 989            2480 2019-02-18         2   1090       92
## 990            2481 2019-04-08         2   1092      106
## 991            2482 2019-01-18         2   1093       86
## 992            2482 2019-02-27         2   1094      104
## 993            2484 2019-03-10         2   1096       70
## 994            2489 2018-07-27         2   1098       36
## 995            2489 2018-12-13         2   1099       88
## 996            2491 2019-05-21         2   1101       89
## 997            2491 2019-05-19         2   1100       10
## 998            2492 2019-04-27         2   1103       10
## 999            2492 2018-12-26         2   1102       55
## 1000           2494 2018-07-21         2   1105       48
## 1001           3000 2018-09-17         3   1107       16
## 1002           3000 2018-08-25         3   1106       20
## 1003           3001 2018-07-06         3   1108       93
## 1004           3001 2019-02-10         3   1111       87
## 1005           3001 2019-05-28         3   1112       60
## 1006           3001 2019-01-17         3   1110      108
## 1007           3001 2018-07-24         3   1109       15
## 1008           3002 2018-08-11         3   1114       34
## 1009           3002 2018-07-15         3   1113       33
## 1010           3002 2019-02-23         3   1116      112
## 1011           3002 2019-06-14         3   1118       30
## 1012           3003 2018-10-21         3   1119       15
## 1013           3003 2019-01-26         3   1123       34
## 1014           3003 2018-11-15         3   1120       68
## 1015           3003 2018-12-11         3   1121       75
## 1016           3003 2018-12-23         3   1122       34
## 1017           3004 2019-06-04         3   1127        7
## 1018           3004 2019-05-30         3   1126       81
## 1019           3004 2019-04-06         3   1125       51
## 1020           3004 2019-06-18         3   1128       68
## 1021           3004 2018-10-26         3   1124        4
## 1022           3005 2019-02-11         3   1133       15
## 1023           3005 2018-07-28         3   1131      112
## 1024           3005 2018-07-26         3   1130       25
## 1025           3005 2018-07-11         3   1129       25
## 1026           3005 2019-06-16         3   1134       42
## 1027           3006 2019-06-25         3   1136       78
## 1028           3006 2018-08-09         3   1135      113
## 1029           3007 2018-07-02         3   1137       23
## 1030           3007 2018-10-07         3   1138       23
## 1031           3007 2019-04-02         3   1140       33
## 1032           3007 2019-06-24         3   1141      102
## 1033           3007 2018-10-26         3   1139       24
## 1034           3008 2018-08-26         3   1142       15
## 1035           3008 2019-05-06         3   1144       60
## 1036           3008 2018-08-26         3   1142       33
## 1037           3009 2019-05-14         3   1146       77
## 1038           3009 2019-03-19         3   1145      104
## 1039           3010 2019-05-29         3   1147       16
## 1040           3011 2019-06-21         3   1151       26
## 1041           3011 2018-09-13         3   1149       44
## 1042           3011 2018-09-12         3   1148       63
## 1043           3011 2018-11-27         3   1150       16
## 1044           3012 2018-09-22         3   1152       23
## 1045           3012 2018-12-02         3   1153      112
## 1046           3012 2019-01-06         3   1154       34
## 1047           3012 2019-01-17         3   1155       62
## 1048           3013 2018-08-18         3   1156       15
## 1049           3013 2018-12-04         3   1157       31
## 1050           3014 2018-07-29         3   1159       23
## 1051           3014 2018-10-25         3   1160       51
## 1052           3014 2018-11-13         3   1161       25
## 1053           3014 2019-01-09         3   1162       15
## 1054           3014 2019-01-09         3   1162       25
## 1055           3014 2019-01-09         3   1162        4
## 1056           3014 2018-07-04         3   1158      102
## 1057           3015 2019-05-14         3   1168       78
## 1058           3015 2018-11-03         3   1165        4
## 1059           3015 2018-11-15         3   1166       52
## 1060           3015 2018-09-10         3   1163      112
## 1061           3015 2018-10-07         3   1164       60
## 1062           3015 2018-12-07         3   1167        9
## 1063           3016 2019-02-11         3   1170       15
## 1064           3016 2019-05-11         3   1171       68
## 1065           3016 2018-11-06         3   1169       74
## 1066           3017 2018-10-29         3   1172       50
## 1067           3017 2019-05-11         3   1173       20
## 1068           3018 2019-06-18         3   1176       14
## 1069           3018 2018-08-07         3   1174       40
## 1070           3019 2018-12-18         3   1178      114
## 1071           3019 2019-06-03         3   1180       16
## 1072           3019 2018-10-05         3   1177       99
## 1073           3019 2019-03-12         3   1179      114
## 1074           3020 2018-07-08         3   1181       28
## 1075           3020 2018-11-01         3   1183       99
## 1076           3020 2019-06-17         3   1184       90
## 1077           3020 2018-08-16         3   1182       74
## 1078           3022 2019-04-08         3   1192        7
## 1079           3022 2019-03-29         3   1191        9
## 1080           3022 2018-10-25         3   1187       89
## 1081           3022 2018-11-29         3   1188       74
## 1082           3022 2019-06-28         3   1193       78
## 1083           3022 2019-01-04         3   1189       44
## 1084           3022 2018-07-03         3   1185      102
## 1085           3022 2018-10-14         3   1186       88
## 1086           3022 2019-02-07         3   1190      108
## 1087           3023 2018-10-28         3   1194       71
## 1088           3023 2019-04-24         3   1196       78
## 1089           3023 2019-02-04         3   1195       88
## 1090           3024 2018-08-15         3   1198       81
## 1091           3024 2018-07-18         3   1197       17
## 1092           3024 2019-02-25         3   1201      109
## 1093           3024 2019-06-28         3   1202      108
## 1094           3025 2019-05-20         3   1207       99
## 1095           3025 2018-12-26         3   1205      102
## 1096           3025 2018-10-13         3   1204      114
## 1097           3025 2019-01-08         3   1206       71
## 1098           3025 2018-09-20         3   1203       24
## 1099           3026 2018-12-04         3   1210       42
## 1100           3026 2018-07-20         3   1208       34
## 1101           3027 2018-09-30         3   1211       15
## 1102           3027 2018-11-21         3   1212       51
## 1103           3027 2019-01-14         3   1213      113
## 1104           3028 2019-06-04         3   1216      113
## 1105           3028 2018-09-06         3   1214       90
## 1106           3028 2018-11-15         3   1215       44
## 1107           3028 2019-06-28         3   1217       52
## 1108           3030 2019-01-11         3   1219       34
## 1109           3030 2019-02-03         3   1220       44
## 1110           3030 2019-05-23         3   1221       75
## 1111           3031 2019-05-15         3   1227       14
## 1112           3031 2018-11-14         3   1224       44
## 1113           3031 2019-06-14         3   1228        4
## 1114           3031 2019-01-16         3   1225        4
## 1115           3031 2019-03-11         3   1226       78
## 1116           3031 2018-07-29         3   1223      102
## 1117           3032 2018-12-20         3   1231       77
## 1118           3032 2018-10-24         3   1230        4
## 1119           3032 2018-10-05         3   1229      104
## 1120           3033 2018-08-16         3   1233       68
## 1121           3033 2018-08-15         3   1232       78
## 1122           3033 2019-03-10         3   1235       46
## 1123           3033 2018-08-20         3   1234       89
## 1124           3033 2019-03-11         3   1236       78
## 1125           3034 2019-05-07         3   1238      112
## 1126           3034 2018-11-01         3   1237        4
## 1127           3035 2019-05-13         3   1242       71
## 1128           3035 2018-12-13         3   1241        9
## 1129           3035 2018-07-17         3   1239       17
## 1130           3035 2018-08-07         3   1240        4
## 1131           3036 2018-08-15         3   1243       63
## 1132           3036 2018-12-30         3   1247       15
## 1133           3036 2018-09-28         3   1244       15
## 1134           3036 2018-10-16         3   1245      104
## 1135           3036 2018-12-10         3   1246       15
## 1136           3036 2019-02-18         3   1248       70
## 1137           3036 2019-06-27         3   1249      113
## 1138           3037 2018-11-11         3   1250       87
## 1139           3038 2018-11-29         3   1252       40
## 1140           3038 2019-04-11         3   1255       89
## 1141           3038 2019-01-03         3   1254       44
## 1142           3039 2018-10-06         3   1257       36
## 1143           3039 2018-09-13         3   1256       46
## 1144           3040 2018-08-15         3   1258      113
## 1145           3040 2019-04-28         3   1261      113
## 1146           3040 2018-10-03         3   1259        3
## 1147           3040 2019-04-16         3   1260       26
## 1148           3041 2018-11-05         3   1262       63
## 1149           3041 2019-05-21         3   1264       46
## 1150           3041 2019-02-27         3   1263       71
## 1151           3042 2018-07-07         3   1265       46
## 1152           3042 2018-10-22         3   1266        7
## 1153           3042 2019-02-09         3   1267       36
## 1154           3043 2018-09-03         3   1270       36
## 1155           3043 2019-04-10         3   1272       71
## 1156           3043 2018-08-21         3   1268       88
## 1157           3043 2019-02-11         3   1271       99
## 1158           3043 2018-08-27         3   1269       24
## 1159           3044 2019-04-29         3   1280      102
## 1160           3044 2018-09-07         3   1275       14
## 1161           3044 2018-08-13         3   1274       30
## 1162           3044 2018-07-07         3   1273       31
## 1163           3044 2019-01-10         3   1279       51
## 1164           3044 2018-11-25         3   1276       33
## 1165           3045 2018-08-27         3   1284        7
## 1166           3045 2018-07-21         3   1283      102
## 1167           3045 2018-07-06         3   1281        4
## 1168           3045 2018-09-09         3   1285       87
## 1169           3045 2018-07-20         3   1282       47
## 1170           3046 2019-03-23         3   1288      102
## 1171           3046 2018-07-30         3   1286       23
## 1172           3046 2018-12-08         3   1287        3
## 1173           3047 2019-05-16         3   1292       25
## 1174           3047 2019-01-23         3   1291       15
## 1175           3047 2019-01-20         3   1290       51
## 1176           3048 2018-12-30         3   1296       89
## 1177           3048 2018-12-28         3   1295      108
## 1178           3048 2018-12-15         3   1294       93
## 1179           3048 2019-04-12         3   1297      109
## 1180           3048 2018-08-09         3   1293      102
## 1181           3049 2018-11-17         3   1300       81
## 1182           3049 2018-07-04         3   1298       68
## 1183           3049 2018-08-03         3   1299       44
## 1184           3049 2019-01-06         3   1301       77
## 1185           3050 2019-02-26         3   1303       71
## 1186           3050 2019-03-30         3   1304       60
## 1187           3050 2018-07-08         3   1302       30
## 1188           3051 2019-04-27         3   1307       71
## 1189           3051 2019-04-06         3   1306      104
## 1190           3051 2018-09-02         3   1305       36
## 1191           3052 2018-12-20         3   1311       89
## 1192           3052 2018-07-03         3   1308       17
## 1193           3052 2018-07-13         3   1309       62
## 1194           3052 2018-10-08         3   1310       89
## 1195           3053 2018-08-24         3   1312      112
## 1196           3053 2019-06-28         3   1313       87
## 1197           3054 2018-08-15         3   1316       30
## 1198           3054 2019-03-02         3   1320       42
## 1199           3054 2018-07-26         3   1315      114
## 1200           3054 2018-08-27         3   1317      114
## 1201           3054 2018-10-06         3   1318       15
## 1202           3054 2019-01-01         3   1319       20
## 1203           3054 2018-07-01         3   1314       81
## 1204           3055 2019-01-09         3   1326        4
## 1205           3055 2019-06-24         3   1328      113
## 1206           3055 2018-12-22         3   1325       33
## 1207           3055 2018-10-18         3   1321       75
## 1208           3055 2018-10-19         3   1322       14
## 1209           3055 2018-11-07         3   1323       25
## 1210           3055 2018-11-28         3   1324        3
## 1211           3055 2019-05-16         3   1327      108
## 1212           3056 2018-11-20         3   1331       60
## 1213           3056 2018-10-18         3   1330       93
## 1214           3056 2019-05-21         3   1335       50
## 1215           3056 2018-10-03         3   1329      102
## 1216           3056 2019-01-29         3   1333        2
## 1217           3056 2019-03-15         3   1334       89
## 1218           3056 2019-01-21         3   1332       50
## 1219           3057 2019-06-27         3   1339       31
## 1220           3057 2018-12-06         3   1336       81
## 1221           3057 2019-01-10         3   1337       42
## 1222           3057 2019-02-27         3   1338       74
## 1223           3058 2018-07-26         3   1341      108
## 1224           3058 2018-08-10         3   1342       51
## 1225           3058 2018-12-15         3   1344       70
## 1226           3058 2018-07-04         3   1340       36
## 1227           3058 2018-10-05         3   1343      102
## 1228           3059 2019-06-30         3   1346       52
## 1229           3059 2018-09-30         3   1345       50
## 1230           3060 2018-12-07         3   1349       34
## 1231           3060 2018-08-29         3   1348        3
## 1232           3060 2019-02-16         3   1350        7
## 1233           3060 2018-08-05         3   1347       33
## 1234           3060 2019-04-15         3   1352        7
## 1235           3060 2019-03-10         3   1351       90
## 1236           3061 2019-04-19         3   1358       17
## 1237           3061 2018-09-09         3   1355       52
## 1238           3061 2019-02-27         3   1357       15
## 1239           3061 2019-02-06         3   1356       49
## 1240           3061 2018-08-08         3   1353       32
## 1241           3061 2018-08-27         3   1354       63
## 1242           3062 2018-08-09         3   1360       26
## 1243           3062 2018-09-04         3   1361       31
## 1244           3062 2019-03-10         3   1362       89
## 1245           3062 2018-07-24         3   1359       30
## 1246           3063 2018-07-07         3   1363        3
## 1247           3063 2019-03-09         3   1364      102
## 1248           3063 2019-05-21         3   1365       50
## 1249           3064 2018-10-04         3   1366       30
## 1250           3064 2019-02-02         3   1367       16
## 1251           3065 2018-09-08         3   1368      109
## 1252           3065 2019-01-27         3   1371       47
## 1253           3065 2018-12-28         3   1370       30
## 1254           3065 2018-10-04         3   1369        9
## 1255           3066 2018-07-02         3   1372       90
## 1256           3066 2018-09-11         3   1375       68
## 1257           3066 2018-08-06         3   1374       17
## 1258           3066 2019-06-14         3   1376       74
## 1259           3066 2018-07-31         3   1373       46
## 1260           3067 2019-05-20         3   1379       81
## 1261           3067 2018-08-17         3   1377       89
## 1262           3067 2018-11-16         3   1378       87
## 1263           3068 2019-06-21         3   1384       47
## 1264           3068 2018-07-04         3   1380       30
## 1265           3068 2019-06-09         3   1383       62
## 1266           3068 2018-08-16         3   1381       24
## 1267           3068 2019-01-26         3   1382       24
## 1268           3069 2019-04-02         3   1388       42
## 1269           3069 2018-11-27         3   1387       46
## 1270           3069 2019-06-26         3   1389       74
## 1271           3069 2018-10-09         3   1386       60
## 1272           3069 2018-07-03         3   1385       15
## 1273           3070 2018-09-21         3   1391       88
## 1274           3070 2018-12-23         3   1393       24
## 1275           3070 2018-10-24         3   1392       15
## 1276           3070 2018-09-08         3   1390       40
## 1277           3071 2019-01-24         3   1395       34
## 1278           3071 2018-12-09         3   1394       47
## 1279           3071 2019-05-25         3   1396       36
## 1280           3072 2019-06-29         3   1401       70
## 1281           3072 2018-10-09         3   1398       51
## 1282           3072 2019-03-09         3   1400       36
## 1283           3072 2018-08-01         3   1397       87
## 1284           3073 2019-06-25         3   1405       89
## 1285           3073 2019-03-26         3   1404       70
## 1286           3073 2018-07-22         3   1402       49
## 1287           3073 2018-08-29         3   1403       77
## 1288           3074 2018-12-28         3   1408       24
## 1289           3074 2018-09-05         3   1406        3
## 1290           3075 2019-04-05         3   1410       23
## 1291           3076 2018-12-08         3   1412       90
## 1292           3076 2019-05-10         3   1413       33
## 1293           3077 2019-05-10         3   1418       99
## 1294           3077 2019-05-31         3   1419      113
## 1295           3077 2019-02-05         3   1416       90
## 1296           3077 2018-11-16         3   1414        3
## 1297           3077 2019-02-09         3   1417       49
## 1298           3078 2018-11-14         3   1425       44
## 1299           3078 2018-09-13         3   1422       74
## 1300           3078 2018-11-01         3   1424       14
## 1301           3078 2018-09-10         3   1421       40
## 1302           3078 2019-03-04         3   1427       46
## 1303           3078 2018-07-17         3   1420       31
## 1304           3078 2018-10-23         3   1423       44
## 1305           3078 2018-12-19         3   1426       81
## 1306           3079 2019-05-31         3   1431       31
## 1307           3079 2018-11-19         3   1430      112
## 1308           3079 2018-10-11         3   1429       47
## 1309           3079 2019-06-25         3   1433       71
## 1310           3079 2018-07-29         3   1428      108
## 1311           3079 2019-06-24         3   1432       75
## 1312           3080 2019-03-27         3   1436        4
## 1313           3080 2018-12-23         3   1435       70
## 1314           3080 2018-08-04         3   1434       78
## 1315           3081 2018-11-05         3   1438      104
## 1316           3081 2018-08-01         3   1437        4
## 1317           3081 2019-04-25         3   1440        3
## 1318           3081 2019-04-29         3   1441       87
## 1319           3081 2019-01-09         3   1439       52
## 1320           3082 2018-12-28         3   1443        9
## 1321           3082 2019-03-02         3   1445       17
## 1322           3082 2019-02-01         3   1444        3
## 1323           3083 2018-07-12         3   1446       24
## 1324           3084 2018-09-29         3   1447       62
## 1325           3085 2019-05-22         3   1454       40
## 1326           3085 2018-10-14         3   1451       75
## 1327           3085 2018-12-28         3   1453       32
## 1328           3085 2018-10-07         3   1450        2
## 1329           3085 2018-10-31         3   1452       17
## 1330           3086 2018-07-26         3   1455       81
## 1331           3086 2018-11-09         3   1457       23
## 1332           3086 2018-09-27         3   1456       49
## 1333           3086 2019-02-27         3   1458       52
## 1334           3086 2019-03-01         3   1459       74
## 1335           3087 2019-02-02         3   1461       44
## 1336           3087 2018-08-14         3   1460       62
## 1337           3088 2018-08-17         3   1462       89
## 1338           3088 2019-01-04         3   1466       88
## 1339           3088 2019-03-05         3   1469      112
## 1340           3088 2018-09-02         3   1463       75
## 1341           3088 2018-09-24         3   1464       50
## 1342           3088 2019-01-17         3   1467      113
## 1343           3088 2019-03-04         3   1468       17
## 1344           3088 2018-12-09         3   1465      113
## 1345           3089 2018-12-28         3   1472      112
## 1346           3089 2018-10-08         3   1471       25
## 1347           3089 2018-07-31         3   1470        3
## 1348           3089 2019-02-15         3   1473       62
## 1349           3090 2018-10-23         3   1475        3
## 1350           3090 2018-11-14         3   1476      113
## 1351           3090 2018-07-25         3   1474      109
## 1352           3091 2018-07-06         3   1477       52
## 1353           3091 2018-12-11         3   1479       30
## 1354           3091 2018-08-04         3   1478       89
## 1355           3091 2019-04-29         3   1481       62
## 1356           3091 2019-02-24         3   1480       99
## 1357           3092 2019-06-22         3   1485       24
## 1358           3092 2019-02-15         3   1484       20
## 1359           3092 2019-06-27         3   1486       42
## 1360           3092 2018-09-01         3   1482       26
## 1361           3092 2018-11-16         3   1483      112
## 1362           3093 2019-04-23         3   1490       31
## 1363           3093 2019-06-01         3   1492       44
## 1364           3093 2018-09-05         3   1488        2
## 1365           3093 2018-08-06         3   1487        9
## 1366           3093 2019-03-29         3   1489       87
## 1367           3093 2019-05-10         3   1491       44
## 1368           3094 2018-12-09         3   1493       31
## 1369           3095 2019-06-25         3   1498       34
## 1370           3095 2019-05-17         3   1497      108
## 1371           3095 2019-04-26         3   1496      102
## 1372           3095 2019-06-25         3   1498       32
## 1373           3095 2018-12-29         3   1494       26
## 1374           3095 2019-03-21         3   1495       15
## 1375           3096 2019-02-26         3   1501       99
## 1376           3096 2018-08-25         3   1499       20
## 1377           3096 2019-04-03         3   1502       24
## 1378           3097 2019-03-16         3   1506       87
## 1379           3097 2019-04-11         3   1508        2
## 1380           3097 2018-12-26         3   1505       87
## 1381           3097 2019-03-17         3   1507       52
## 1382           3097 2018-10-27         3   1504      114
## 1383           3098 2018-12-14         3   1509       68
## 1384           3099 2019-06-02         3   1511       51
## 1385           3100 2018-09-30         3   1512       36
## 1386           3100 2018-12-20         3   1513      109
## 1387           3101 2018-09-24         3   1514       32
## 1388           3101 2019-01-13         3   1517      112
## 1389           3101 2018-10-31         3   1515       63
## 1390           3101 2019-03-02         3   1518       40
## 1391           3101 2018-12-28         3   1516       14
## 1392           3101 2019-04-14         3   1521       24
## 1393           3101 2019-04-05         3   1520       32
## 1394           3101 2019-06-14         3   1522       15
## 1395           3101 2019-03-28         3   1519       14
## 1396           3102 2018-08-14         3   1523       36
## 1397           3102 2018-10-16         3   1524       52
## 1398           3103 2019-01-20         3   1527      112
## 1399           3103 2019-01-17         3   1525       89
## 1400           3103 2019-04-15         3   1528       14
## 1401           3103 2019-01-19         3   1526       71
## 1402           3104 2019-01-22         3   1530      113
## 1403           3104 2019-03-11         3   1531       20
## 1404           3104 2019-01-08         3   1529       50
## 1405           3104 2019-06-23         3   1532       17
## 1406           3105 2018-09-28         3   1534       81
## 1407           3105 2019-04-21         3   1537       51
## 1408           3105 2018-10-09         3   1535        7
## 1409           3105 2018-08-13         3   1533       49
## 1410           3106 2018-10-03         3   1539       52
## 1411           3106 2019-06-12         3   1541       68
## 1412           3106 2018-08-04         3   1538       28
## 1413           3106 2018-11-17         3   1540       20
## 1414           3107 2019-01-17         3   1543       78
## 1415           3107 2018-08-23         3   1542       68
## 1416           3108 2018-11-12         3   1545       60
## 1417           3108 2019-06-27         3   1547        7
## 1418           3108 2018-08-23         3   1544       62
## 1419           3108 2019-01-06         3   1546       23
## 1420           3109 2019-03-09         3   1548       23
## 1421           3110 2018-09-21         3   1549       51
## 1422           3110 2019-05-22         3   1552       32
## 1423           3110 2019-05-26         3   1553       36
## 1424           3110 2018-11-25         3   1550      109
## 1425           3110 2019-03-26         3   1551       99
## 1426           3111 2019-02-25         3   1554       32
## 1427           3112 2019-05-23         3   1555       14
## 1428           3113 2018-10-04         3   1556       30
## 1429           3113 2019-01-09         3   1557       77
## 1430           3114 2019-03-05         3   1561       32
## 1431           3114 2018-11-13         3   1560       31
## 1432           3114 2018-10-26         3   1559       81
## 1433           3114 2019-06-15         3   1562      114
## 1434           3114 2018-10-03         3   1558       30
## 1435           3115 2018-09-14         3   1563       93
## 1436           3116 2019-04-22         3   1566        4
## 1437           3116 2019-01-17         3   1565       42
## 1438           3116 2018-09-02         3   1564       93
## 1439           3117 2019-04-26         3   1570       23
## 1440           3117 2019-02-19         3   1569       78
## 1441           3117 2018-07-21         3   1567       36
## 1442           3117 2018-08-18         3   1568        4
## 1443           3118 2018-12-26         3   1572       34
## 1444           3118 2019-04-19         3   1573       87
## 1445           3118 2019-05-18         3   1574       62
## 1446           3119 2019-04-14         3   1577       50
## 1447           3119 2019-05-16         3   1578      102
## 1448           3119 2019-02-18         3   1575      108
## 1449           3119 2019-04-11         3   1576       28
## 1450           3120 2019-02-22         3   1581       62
## 1451           3120 2018-08-15         3   1580       33
## 1452           3120 2019-03-09         3   1582        3
## 1453           3120 2019-06-16         3   1583       31
## 1454           3120 2018-07-11         3   1579      102
## 1455           3121 2019-05-13         3   1587       63
## 1456           3121 2019-02-04         3   1586       36
## 1457           3121 2018-07-10         3   1584       93
## 1458           3122 2019-03-02         3   1588       44
## 1459           3123 2018-08-14         3   1589       30
## 1460           3123 2018-12-28         3   1594      104
## 1461           3123 2018-09-20         3   1590       15
## 1462           3123 2018-10-12         3   1591      104
## 1463           3123 2019-02-14         3   1596      113
## 1464           3123 2019-02-11         3   1595       49
## 1465           3124 2019-05-13         3   1599       90
## 1466           3124 2019-02-18         3   1598        7
## 1467           3125 2018-12-21         3   1603       32
## 1468           3125 2019-06-08         3   1604       28
## 1469           3125 2018-07-25         3   1600       34
## 1470           3125 2018-08-13         3   1601       36
## 1471           3125 2018-11-09         3   1602        2
## 1472           3126 2018-09-16         3   1606       30
## 1473           3126 2018-07-07         3   1605       17
## 1474           3126 2019-06-21         3   1608       36
## 1475           3126 2019-01-23         3   1607       77
## 1476           3127 2018-11-21         3   1613       47
## 1477           3127 2018-07-19         3   1609      102
## 1478           3127 2018-08-01         3   1610       16
## 1479           3127 2018-09-13         3   1612       30
## 1480           3127 2019-03-31         3   1615       90
## 1481           3127 2018-12-10         3   1614       33
## 1482           3127 2018-08-22         3   1611       71
## 1483           3127 2019-06-08         3   1616       33
## 1484           3128 2019-03-28         3   1619      109
## 1485           3128 2019-05-10         3   1621       52
## 1486           3128 2018-08-05         3   1617       36
## 1487           3128 2019-03-07         3   1618       68
## 1488           3128 2019-04-21         3   1620       40
## 1489           3129 2018-09-11         3   1622       60
## 1490           3129 2018-09-25         3   1623      104
## 1491           3129 2019-04-29         3   1625       23
## 1492           3129 2018-11-23         3   1624        7
## 1493           3129 2019-05-30         3   1627      109
## 1494           3129 2019-05-23         3   1626       20
## 1495           3129 2019-06-25         3   1628      113
## 1496           3130 2018-08-11         3   1629       16
## 1497           3130 2019-03-08         3   1630       25
## 1498           3130 2019-05-20         3   1631       15
## 1499           3131 2019-04-10         3   1634       30
## 1500           3131 2019-03-18         3   1633       23
## 1501           3131 2019-05-10         3   1635      114
## 1502           3131 2018-09-07         3   1632      108
## 1503           3132 2018-07-14         3   1636       78
## 1504           3133 2018-12-26         3   1641       42
## 1505           3133 2019-05-04         3   1643       90
## 1506           3133 2018-12-19         3   1640       87
## 1507           3134 2019-03-06         3   1647       93
## 1508           3134 2019-01-07         3   1646       60
## 1509           3134 2018-08-23         3   1644       20
## 1510           3134 2019-01-05         3   1645       78
## 1511           3135 2018-11-28         3   1650        2
## 1512           3135 2018-11-07         3   1649       25
## 1513           3135 2018-09-06         3   1648       99
## 1514           3137 2018-08-30         3   1653       34
## 1515           3137 2019-03-06         3   1654       49
## 1516           3137 2019-05-07         3   1656       26
## 1517           3137 2019-05-28         3   1657       14
## 1518           3137 2019-03-31         3   1655      109
## 1519           3138 2018-10-03         3   1658       44
## 1520           3138 2019-04-27         3   1661        2
## 1521           3138 2018-10-23         3   1659      112
## 1522           3138 2019-01-28         3   1660       25
## 1523           3139 2019-05-17         3   1663      113
## 1524           3139 2018-11-19         3   1662       87
## 1525           3140 2019-02-23         3   1665       81
## 1526           3140 2019-06-14         3   1667       63
## 1527           3140 2019-05-16         3   1666       49
## 1528           3140 2018-12-09         3   1664       25
## 1529           3141 2018-10-23         3   1669       68
## 1530           3141 2019-05-08         3   1676       16
## 1531           3141 2019-04-12         3   1675       81
## 1532           3141 2019-01-11         3   1671       68
## 1533           3141 2018-09-21         3   1668       20
## 1534           3141 2019-03-14         3   1673       23
## 1535           3141 2019-04-07         3   1674       47
## 1536           3141 2019-02-16         3   1672       78
## 1537           3142 2018-12-29         3   1678       93
## 1538           3142 2019-05-07         3   1679       60
## 1539           3142 2018-10-11         3   1677       20
## 1540           3143 2018-10-15         3   1682        2
## 1541           3143 2018-08-22         3   1680       16
## 1542           3143 2018-09-01         3   1681      102
## 1543           3144 2019-01-26         3   1685        9
## 1544           3144 2018-08-14         3   1683       52
## 1545           3144 2018-12-26         3   1684       36
## 1546           3144 2019-05-16         3   1689       87
## 1547           3144 2019-02-20         3   1686       33
## 1548           3144 2019-02-27         3   1687       90
## 1549           3144 2019-03-26         3   1688       44
## 1550           3145 2018-09-17         3   1690       34
## 1551           3145 2019-06-22         3   1691       15
## 1552           3146 2019-04-08         3   1696      113
## 1553           3146 2019-03-06         3   1694        3
## 1554           3146 2019-02-05         3   1693        9
## 1555           3146 2019-04-15         3   1697       50
## 1556           3147 2019-02-15         3   1701       46
## 1557           3147 2019-05-27         3   1702       81
## 1558           3147 2019-05-29         3   1703      113
## 1559           3147 2018-12-18         3   1700       17
## 1560           3147 2018-08-14         3   1698       16
## 1561           3147 2018-09-09         3   1699        4
## 1562           3148 2019-03-15         3   1707      104
## 1563           3148 2018-10-14         3   1705       75
## 1564           3148 2018-07-11         3   1704       75
## 1565           3149 2018-07-17         3   1708       99
## 1566           3149 2018-07-25         3   1709       25
## 1567           3149 2019-03-02         3   1711      104
## 1568           3149 2019-01-19         3   1710       77
## 1569           3149 2019-03-30         3   1712       78
## 1570           3150 2018-07-13         3   1713       68
## 1571           3151 2019-05-01         3   1717       62
## 1572           3151 2018-09-02         3   1715       28
## 1573           3151 2018-12-07         3   1716       26
## 1574           3152 2019-03-09         3   1722      113
## 1575           3152 2019-01-30         3   1721       60
## 1576           3152 2019-01-09         3   1720       88
## 1577           3152 2018-10-12         3   1719       31
## 1578           3153 2019-01-11         3   1731       33
## 1579           3153 2019-04-18         3   1735       46
## 1580           3153 2018-09-08         3   1727       81
## 1581           3153 2019-03-12         3   1734      114
## 1582           3153 2019-02-18         3   1733       14
## 1583           3153 2019-02-10         3   1732       60
## 1584           3153 2018-07-04         3   1723       87
## 1585           3153 2018-09-30         3   1728       40
## 1586           3153 2018-07-13         3   1724       30
## 1587           3153 2019-05-22         3   1736       89
## 1588           3153 2018-10-10         3   1729       28
## 1589           3153 2018-07-22         3   1725       17
## 1590           3153 2018-08-21         3   1726       46
## 1591           3154 2018-09-17         3   1737       33
## 1592           3154 2018-10-22         3   1738       87
## 1593           3154 2019-06-07         3   1739       89
## 1594           3155 2019-06-27         3   1741      104
## 1595           3155 2019-06-09         3   1740       47
## 1596           3156 2019-02-19         3   1746       62
## 1597           3156 2019-02-10         3   1745       77
## 1598           3156 2018-08-13         3   1743       87
## 1599           3156 2019-06-24         3   1747       20
## 1600           3156 2018-07-26         3   1742       74
## 1601           3157 2018-07-22         3   1748       25
## 1602           3157 2019-03-24         3   1749       20
## 1603           3157 2019-04-05         3   1750       40
## 1604           3158 2018-12-17         3   1753       15
## 1605           3158 2019-01-09         3   1754       78
## 1606           3158 2019-02-03         3   1755        3
## 1607           3158 2018-11-20         3   1751      104
## 1608           3158 2019-02-28         3   1756       20
## 1609           3158 2018-11-21         3   1752       71
## 1610           3159 2019-05-18         3   1759       77
## 1611           3159 2019-03-23         3   1757       36
## 1612           3159 2019-05-10         3   1758       81
## 1613           3160 2018-12-03         3   1762       33
## 1614           3160 2018-12-12         3   1763       34
## 1615           3160 2018-10-08         3   1760       30
## 1616           3161 2018-07-28         3   1765      109
## 1617           3161 2018-11-16         3   1767       81
## 1618           3161 2018-11-28         3   1768       99
## 1619           3161 2018-07-22         3   1764      104
## 1620           3162 2018-09-05         3   1771       16
## 1621           3162 2019-03-06         3   1773       25
## 1622           3162 2018-11-13         3   1772       49
## 1623           3162 2018-07-04         3   1769       78
## 1624           3162 2019-04-24         3   1774        4
## 1625           3162 2018-07-24         3   1770       25
## 1626           3163 2019-03-23         3   1777       30
## 1627           3163 2019-01-19         3   1776       15
## 1628           3163 2018-10-21         3   1775       87
## 1629           3164 2019-02-14         3   1781       31
## 1630           3164 2018-11-03         3   1779        4
## 1631           3164 2019-06-11         3   1782       36
## 1632           3164 2019-01-24         3   1780      108
## 1633           3164 2018-10-09         3   1778       23
## 1634           3165 2018-11-18         3   1783       23
## 1635           3165 2019-05-24         3   1786       16
## 1636           3165 2019-05-02         3   1785       89
## 1637           3166 2019-01-30         3   1789       20
## 1638           3166 2018-08-19         3   1787        3
## 1639           3166 2019-01-06         3   1788      109
## 1640           3166 2019-02-16         3   1791        3
## 1641           3166 2019-02-01         3   1790       87
## 1642           3167 2019-05-08         3   1796       23
## 1643           3167 2018-07-28         3   1794       40
## 1644           3167 2019-03-28         3   1795       24
## 1645           3167 2019-05-26         3   1797      114
## 1646           3167 2018-07-03         3   1792       81
## 1647           3167 2018-07-18         3   1793       75
## 1648           3168 2018-09-14         3   1798       87
## 1649           3168 2019-06-06         3   1799       63
## 1650           3169 2019-03-21         3   1802       74
## 1651           3169 2018-07-04         3   1800       99
## 1652           3169 2018-07-21         3   1801      108
## 1653           3170 2019-03-26         3   1806       50
## 1654           3170 2019-01-22         3   1805       17
## 1655           3170 2019-01-19         3   1804      102
## 1656           3170 2019-04-05         3   1807       63
## 1657           3170 2018-10-02         3   1803       90
## 1658           3171 2019-06-06         3   1811        2
## 1659           3171 2019-02-04         3   1809       49
## 1660           3171 2018-08-18         3   1808       47
## 1661           3171 2019-03-16         3   1810       31
## 1662           3172 2018-11-04         3   1815       36
## 1663           3172 2019-01-27         3   1818       87
## 1664           3172 2018-10-23         3   1814       24
## 1665           3172 2019-05-19         3   1820        7
## 1666           3172 2019-06-17         3   1821       68
## 1667           3172 2018-10-14         3   1813      104
## 1668           3172 2019-02-04         3   1819      112
## 1669           3172 2018-08-16         3   1812       77
## 1670           3172 2019-02-04         3   1819        3
## 1671           3173 2019-02-11         3   1823       75
## 1672           3173 2018-07-17         3   1822       70
## 1673           3174 2018-09-01         3   1824       90
## 1674           3174 2018-11-14         3   1826       44
## 1675           3174 2018-09-29         3   1825       78
## 1676           3174 2018-12-21         3   1828       60
## 1677           3174 2018-12-18         3   1827       88
## 1678           3175 2018-08-01         3   1829       30
## 1679           3175 2019-05-04         3   1834      112
## 1680           3175 2019-06-08         3   1836      104
## 1681           3175 2019-05-26         3   1835       24
## 1682           3175 2019-03-12         3   1832       77
## 1683           3175 2019-04-17         3   1833       71
## 1684           3175 2019-02-20         3   1830      113
## 1685           3175 2019-02-27         3   1831       77
## 1686           3176 2019-01-17         3   1840       87
## 1687           3176 2018-10-15         3   1838       93
## 1688           3176 2018-09-18         3   1837      104
## 1689           3177 2019-04-03         3   1843       93
## 1690           3177 2018-09-27         3   1841       40
## 1691           3177 2019-04-03         3   1843       51
## 1692           3178 2018-10-28         3   1844      112
## 1693           3179 2018-10-08         3   1846       16
## 1694           3179 2018-12-31         3   1848       88
## 1695           3179 2018-08-02         3   1845       71
## 1696           3179 2019-03-01         3   1849       24
## 1697           3180 2018-07-11         3   1850       49
## 1698           3180 2019-02-02         3   1854       49
## 1699           3180 2019-05-25         3   1855       25
## 1700           3180 2018-07-15         3   1851       14
## 1701           3180 2018-10-13         3   1852      112
## 1702           3181 2018-07-25         3   1856       14
## 1703           3181 2018-12-24         3   1857      112
## 1704           3181 2018-12-30         3   1858       23
## 1705           3181 2019-03-21         3   1859       20
## 1706           3182 2019-06-16         3   1865       40
## 1707           3182 2018-10-29         3   1860       32
## 1708           3182 2019-02-16         3   1863      102
## 1709           3182 2019-01-25         3   1862       93
## 1710           3182 2018-12-18         3   1861       60
## 1711           3183 2019-04-30         3   1870       89
## 1712           3183 2018-09-16         3   1866       25
## 1713           3183 2019-06-27         3   1871       74
## 1714           3183 2019-03-07         3   1868       89
## 1715           3183 2018-11-07         3   1867       47
## 1716           3183 2019-04-27         3   1869       75
## 1717           3184 2019-05-19         3   1875       50
## 1718           3184 2019-06-07         3   1876       44
## 1719           3184 2018-11-17         3   1872      102
## 1720           3184 2019-04-08         3   1873       25
## 1721           3184 2019-04-19         3   1874       90
## 1722           3185 2019-06-24         3   1882       24
## 1723           3185 2019-01-10         3   1879       44
## 1724           3185 2018-11-13         3   1877       26
## 1725           3185 2019-04-26         3   1880        7
## 1726           3185 2018-12-28         3   1878       88
## 1727           3185 2019-06-21         3   1881       33
## 1728           3186 2018-08-30         3   1883       46
## 1729           3186 2019-03-05         3   1886       28
## 1730           3186 2018-11-08         3   1884       14
## 1731           3187 2019-05-20         3   1889       78
## 1732           3187 2019-05-16         3   1888       68
## 1733           3187 2019-04-07         3   1887       33
## 1734           3188 2019-05-14         3   1895       46
## 1735           3188 2019-04-02         3   1894       68
## 1736           3188 2018-08-10         3   1891       77
## 1737           3188 2018-11-13         3   1892        3
## 1738           3188 2019-03-13         3   1893       17
## 1739           3188 2018-08-01         3   1890       75
## 1740           3188 2019-04-02         3   1894      109
## 1741           3189 2019-02-06         3   1897       33
## 1742           3189 2019-03-27         3   1898      104
## 1743           3189 2018-07-26         3   1896       24
## 1744           3190 2018-08-30         3   1900       28
## 1745           3190 2019-03-14         3   1903       90
## 1746           3190 2019-02-26         3   1902       87
## 1747           3190 2018-08-18         3   1899       71
## 1748           3191 2019-04-26         3   1912       81
## 1749           3191 2019-03-01         3   1909       40
## 1750           3191 2019-01-08         3   1907       15
## 1751           3191 2018-10-06         3   1906       75
## 1752           3191 2019-04-22         3   1911       36
## 1753           3191 2018-09-19         3   1905       26
## 1754           3191 2019-01-31         3   1908       24
## 1755           3191 2019-03-09         3   1910       52
## 1756           3192 2018-09-13         3   1913      104
## 1757           3193 2019-03-08         3   1916      102
## 1758           3193 2019-01-31         3   1915       36
## 1759           3193 2019-01-25         3   1914       63
## 1760           3194 2019-02-04         3   1922       33
## 1761           3194 2018-12-30         3   1921        7
## 1762           3194 2019-05-24         3   1924       93
## 1763           3194 2018-08-24         3   1917       30
## 1764           3194 2019-03-17         3   1923       88
## 1765           3194 2018-11-10         3   1919       60
## 1766           3194 2018-09-29         3   1918       34
## 1767           3195 2018-11-09         3   1925       77
## 1768           3196 2019-06-13         3   1931       14
## 1769           3196 2019-05-30         3   1930       46
## 1770           3196 2018-12-09         3   1929       87
## 1771           3196 2018-10-14         3   1928       51
## 1772           3196 2018-09-05         3   1927       24
## 1773           3197 2018-12-04         3   1933       42
## 1774           3197 2019-01-25         3   1936      104
## 1775           3197 2018-12-26         3   1935       25
## 1776           3197 2018-09-27         3   1932      109
## 1777           3197 2018-12-15         3   1934       50
## 1778           3198 2019-06-02         3   1944       81
## 1779           3198 2018-08-27         3   1938       50
## 1780           3198 2019-02-06         3   1940       26
## 1781           3198 2019-05-07         3   1943      113
## 1782           3198 2019-04-04         3   1942       52
## 1783           3198 2018-07-14         3   1937       31
## 1784           3198 2019-02-16         3   1941       87
## 1785           3198 2019-01-09         3   1939       32
## 1786           3199 2018-10-11         3   1946       47
## 1787           3199 2018-10-09         3   1945       15
## 1788           3201 2019-02-01         3   1951      104
## 1789           3201 2018-12-29         3   1949       77
## 1790           3201 2019-03-28         3   1952       81
## 1791           3201 2018-12-28         3   1948        2
## 1792           3201 2019-01-09         3   1950      112
## 1793           3201 2018-07-12         3   1947       60
## 1794           3202 2018-11-10         3   1956       15
## 1795           3202 2018-11-21         3   1957       40
## 1796           3202 2018-10-04         3   1955       33
## 1797           3202 2018-09-13         3   1954       17
## 1798           3202 2018-08-23         3   1953       60
## 1799           3202 2019-03-17         3   1958       78
## 1800           3203 2019-03-18         3   1960      108
## 1801           3204 2019-06-28         3   1963      102
## 1802           3204 2019-04-24         3   1962      102
## 1803           3204 2019-03-08         3   1961       42
## 1804           3205 2019-06-22         3   1970       87
## 1805           3205 2019-05-09         3   1969       52
## 1806           3205 2019-03-07         3   1967       49
## 1807           3205 2018-08-09         3   1964       42
## 1808           3205 2019-03-23         3   1968       62
## 1809           3205 2018-09-04         3   1966       52
## 1810           3205 2018-09-02         3   1965      102
## 1811           3206 2018-08-22         3   1973       88
## 1812           3206 2018-12-02         3   1974       62
## 1813           3206 2018-07-27         3   1972       14
## 1814           3206 2018-12-20         3   1975       25
## 1815           3206 2018-07-08         3   1971       52
## 1816           3206 2019-05-16         3   1979       71
## 1817           3206 2019-04-03         3   1978       63
## 1818           3206 2019-01-10         3   1976       60
## 1819           3206 2019-06-18         3   1980       68
## 1820           3206 2019-02-15         3   1977       30
## 1821           3207 2018-07-04         3   1981       16
## 1822           3208 2019-06-22         3   1990       34
## 1823           3208 2018-11-24         3   1985       89
## 1824           3208 2018-10-27         3   1984       89
## 1825           3208 2019-02-17         3   1986        2
## 1826           3208 2019-02-21         3   1987       52
## 1827           3208 2019-04-25         3   1989       60
## 1828           3208 2019-02-24         3   1988      104
## 1829           3208 2018-08-30         3   1983       25
## 1830           3209 2019-03-22         3   1994       14
## 1831           3209 2019-03-18         3   1993       33
## 1832           3209 2018-12-12         3   1991       90
## 1833           3209 2019-01-25         3   1992      113
## 1834           3210 2018-12-12         3   1995       20
## 1835           3210 2019-04-13         3   1998        2
## 1836           3211 2019-02-15         3   2001       74
## 1837           3211 2019-02-19         3   2002       68
## 1838           3211 2019-06-10         3   2004        9
## 1839           3211 2018-07-08         3   1999      113
## 1840           3211 2019-04-08         3   2003       74
## 1841           3212 2018-10-19         3   2006       50
## 1842           3212 2018-11-12         3   2007       52
## 1843           3212 2019-05-18         3   2011       24
## 1844           3212 2019-01-27         3   2010       34
## 1845           3212 2018-11-15         3   2008       78
## 1846           3212 2018-08-26         3   2005        2
## 1847           3212 2018-11-28         3   2009       26
## 1848           3213 2018-09-30         3   2014       89
## 1849           3213 2019-05-16         3   2020       33
## 1850           3213 2018-11-04         3   2015       60
## 1851           3213 2018-12-30         3   2016       14
## 1852           3213 2019-02-12         3   2017       28
## 1853           3213 2018-08-07         3   2013       63
## 1854           3213 2019-03-30         3   2019       28
## 1855           3213 2019-02-26         3   2018       88
## 1856           3213 2018-07-16         3   2012      102
## 1857           3214 2019-06-19         3   2023      102
## 1858           3214 2019-01-05         3   2022       36
## 1859           3214 2018-07-02         3   2021       16
## 1860           3215 2018-10-05         3   2026        2
## 1861           3215 2018-09-10         3   2024       50
## 1862           3215 2019-02-08         3   2029      104
## 1863           3215 2018-12-19         3   2028      104
## 1864           3215 2018-09-15         3   2025       24
## 1865           3216 2019-03-01         3   2031       14
## 1866           3216 2018-07-16         3   2030       50
## 1867           3216 2019-03-01         3   2031       62
## 1868           3216 2019-03-24         3   2032       17
## 1869           3217 2018-11-09         3   2036       89
## 1870           3217 2019-02-15         3   2039        4
## 1871           3217 2018-09-10         3   2035       32
## 1872           3217 2019-01-01         3   2038       50
## 1873           3217 2018-09-01         3   2033       44
## 1874           3217 2018-09-03         3   2034       16
## 1875           3218 2019-03-10         3   2043       30
## 1876           3218 2019-05-12         3   2048      112
## 1877           3218 2019-03-16         3   2044        4
## 1878           3218 2019-02-20         3   2042       47
## 1879           3218 2019-04-30         3   2047      108
## 1880           3218 2019-04-13         3   2046       52
## 1881           3218 2019-03-28         3   2045       62
## 1882           3219 2019-01-23         3   2049       46
## 1883           3219 2019-03-18         3   2051       78
## 1884           3219 2019-03-05         3   2050        4
## 1885           3219 2019-06-28         3   2052       71
## 1886           3220 2018-11-05         3   2053       24
## 1887           3220 2018-12-20         3   2054       44
## 1888           3221 2018-07-14         3   2055       77
## 1889           3221 2019-03-12         3   2056       17
## 1890           3221 2019-05-16         3   2057       93
## 1891           3222 2019-01-12         3   2061       93
## 1892           3222 2018-12-31         3   2060       81
## 1893           3222 2018-11-19         3   2059      109
## 1894           3222 2018-10-17         3   2058       99
## 1895           3222 2019-05-11         3   2063        7
## 1896           3223 2019-02-03         3   2069       16
## 1897           3223 2018-11-07         3   2066       63
## 1898           3223 2018-12-30         3   2068       75
## 1899           3223 2018-12-27         3   2067      112
## 1900           3223 2018-09-22         3   2064       16
## 1901           3223 2018-10-25         3   2065       44
## 1902           3224 2018-07-08         3   2070       26
## 1903           3224 2018-08-15         3   2072       90
## 1904           3224 2019-06-28         3   2075       36
## 1905           3224 2019-05-06         3   2074       60
## 1906           3224 2019-03-14         3   2073       68
## 1907           3224 2018-07-21         3   2071       89
## 1908           3225 2018-12-22         3   2077       52
## 1909           3225 2018-10-06         3   2076       36
## 1910           3226 2018-10-13         3   2081       33
## 1911           3226 2018-09-06         3   2079       74
## 1912           3226 2019-01-13         3   2082       32
## 1913           3226 2019-06-12         3   2084       31
## 1914           3226 2018-10-10         3   2080       16
## 1915           3226 2019-03-14         3   2083       20
## 1916           3226 2018-09-03         3   2078       36
## 1917           3227 2018-10-01         3   2086       33
## 1918           3227 2019-02-12         3   2090       75
## 1919           3227 2018-07-30         3   2085      102
## 1920           3227 2018-11-30         3   2088       42
## 1921           3227 2018-10-06         3   2087       49
## 1922           3227 2019-02-11         3   2089       77
## 1923           3228 2018-09-24         3   2093      102
## 1924           3228 2018-08-30         3   2092       52
## 1925           3228 2019-01-15         3   2096       70
## 1926           3228 2018-12-23         3   2095       32
## 1927           3228 2019-03-08         3   2097       14
## 1928           3228 2019-03-22         3   2098       24
## 1929           3229 2019-02-11         3   2100       75
## 1930           3229 2019-04-07         3   2101       28
## 1931           3230 2019-06-04         3   2105       32
## 1932           3230 2018-07-02         3   2102      102
## 1933           3230 2019-02-01         3   2103       31
## 1934           3230 2019-05-06         3   2104       40
## 1935           3231 2018-10-17         3   2107       23
## 1936           3231 2018-07-31         3   2106       15
## 1937           3232 2019-01-03         3   2111       24
## 1938           3232 2018-12-17         3   2110        4
## 1939           3232 2019-04-11         3   2112      104
## 1940           3232 2019-04-12         3   2113       17
## 1941           3232 2018-10-27         3   2109       24
## 1942           3232 2018-07-08         3   2108       63
## 1943           3233 2018-12-14         3   2116       74
## 1944           3233 2018-08-24         3   2114       89
## 1945           3233 2019-02-23         3   2117       33
## 1946           3233 2018-09-25         3   2115      102
## 1947           3233 2019-03-30         3   2118      112
## 1948           3233 2019-05-12         3   2119      108
## 1949           3234 2018-07-07         3   2120       62
## 1950           3234 2018-10-07         3   2121      102
## 1951           3234 2018-10-23         3   2122       31
## 1952           3234 2019-01-03         3   2123       26
## 1953           3235 2018-08-03         3   2125       81
## 1954           3235 2019-05-22         3   2129       46
## 1955           3235 2019-06-27         3   2130       17
## 1956           3235 2018-09-28         3   2127       87
## 1957           3235 2018-10-20         3   2128       63
## 1958           3236 2018-07-06         3   2131      112
## 1959           3236 2019-06-20         3   2138       52
## 1960           3236 2018-09-28         3   2133       30
## 1961           3236 2018-10-15         3   2134       16
## 1962           3236 2018-08-25         3   2132       63
## 1963           3236 2019-02-12         3   2136       81
## 1964           3236 2019-05-01         3   2137      114
## 1965           3237 2018-12-21         3   2140       24
## 1966           3237 2018-09-20         3   2139       16
## 1967           3237 2019-06-23         3   2142       81
## 1968           3237 2019-06-11         3   2141       51
## 1969           3238 2018-12-27         3   2145       49
## 1970           3238 2018-08-06         3   2143       42
## 1971           3238 2018-09-03         3   2144      104
## 1972           3239 2019-01-10         3   2150      104
## 1973           3239 2018-08-18         3   2148       25
## 1974           3239 2018-10-02         3   2149       30
## 1975           3239 2018-08-18         3   2148       63
## 1976           3239 2019-03-17         3   2152       17
## 1977           3239 2018-07-15         3   2147       42
## 1978           3239 2019-03-09         3   2151       16
## 1979           3239 2018-07-03         3   2146        3
## 1980           3240 2018-11-10         3   2157       71
## 1981           3240 2018-10-19         3   2156       23
## 1982           3240 2018-08-22         3   2154       52
## 1983           3240 2019-02-17         3   2159       68
## 1984           3240 2018-08-29         3   2155        7
## 1985           3240 2018-12-01         3   2158      108
## 1986           3240 2018-08-21         3   2153       89
## 1987           3241 2018-07-20         3   2160       28
## 1988           3241 2019-05-21         3   2165       77
## 1989           3241 2018-12-27         3   2161       36
## 1990           3241 2019-04-05         3   2163       89
## 1991           3241 2019-03-11         3   2162      112
## 1992           3242 2019-05-19         3   2168       71
## 1993           3242 2018-11-05         3   2166       68
## 1994           3242 2019-03-15         3   2167        7
## 1995           3243 2018-09-18         3   2170       32
## 1996           3243 2018-09-04         3   2169       99
## 1997           3244 2018-12-05         3   2174       60
## 1998           3244 2019-04-19         3   2177       52
## 1999           3244 2019-01-07         3   2175       75
## 2000           3244 2018-11-04         3   2172       88
## 2001           3244 2019-06-02         3   2178       25
## 2002           3244 2018-11-24         3   2173       99
## 2003           3244 2019-02-24         3   2176       62
## 2004           3245 2019-02-03         3   2180        4
## 2005           3245 2018-07-28         3   2179       68
## 2006           3246 2018-07-17         3   2181       49
## 2007           3246 2018-11-26         3   2183       23
## 2008           3246 2018-12-22         3   2184      104
## 2009           3246 2019-01-13         3   2185      104
## 2010           3246 2019-06-01         3   2186       75
## 2011           3246 2018-11-21         3   2182        3
## 2012           3247 2019-02-10         3   2189       23
## 2013           3247 2018-09-08         3   2188       14
## 2014           3247 2018-07-25         3   2187       88
## 2015           3248 2018-12-23         3   2193       47
## 2016           3248 2019-01-26         3   2194       40
## 2017           3248 2018-11-18         3   2192       26
## 2018           3248 2019-02-07         3   2195       93
## 2019           3248 2018-10-25         3   2191      113
## 2020           3248 2018-07-06         3   2190       16
## 2021           3249 2018-07-23         3   2197       26
## 2022           3249 2019-06-11         3   2198       23
## 2023           3249 2019-06-22         3   2199       88
## 2024           3250 2018-12-11         3   2202       99
## 2025           3250 2018-12-08         3   2201      102
## 2026           3250 2018-07-13         3   2200       15
## 2027           3250 2019-06-18         3   2203       49
## 2028           3251 2018-08-05         3   2204       32
## 2029           3252 2019-02-23         3   2206      113
## 2030           3252 2019-04-16         3   2207        2
## 2031           3253 2018-10-13         3   2208       70
## 2032           3253 2019-04-27         3   2209       24
## 2033           3254 2019-06-29         3   2216       93
## 2034           3254 2019-06-18         3   2215       32
## 2035           3254 2018-12-13         3   2211       46
## 2036           3254 2019-02-22         3   2212       60
## 2037           3254 2018-07-23         3   2210       68
## 2038           3255 2019-05-08         3   2219       51
## 2039           3255 2019-02-20         3   2218       75
## 2040           3255 2018-12-01         3   2217       52
## 2041           3256 2019-04-05         3   2223       16
## 2042           3256 2019-01-25         3   2221      108
## 2043           3256 2019-04-24         3   2224        7
## 2044           3256 2019-03-10         3   2222       25
## 2045           3257 2018-09-07         3   2225      104
## 2046           3257 2019-02-18         3   2228        9
## 2047           3257 2018-11-04         3   2226       36
## 2048           3257 2019-02-06         3   2227       32
## 2049           3258 2019-06-30         3   2234       70
## 2050           3258 2019-01-09         3   2232       30
## 2051           3258 2019-02-17         3   2233       50
## 2052           3258 2018-09-06         3   2229      109
## 2053           3258 2018-11-04         3   2231       14
## 2054           3258 2018-09-14         3   2230      102
## 2055           3259 2019-06-10         3   2238        7
## 2056           3259 2018-08-23         3   2236       78
## 2057           3259 2019-01-07         3   2237       34
## 2058           3260 2019-06-01         3   2241      108
## 2059           3260 2019-02-15         3   2240       70
## 2060           3260 2018-09-13         3   2239       68
## 2061           3261 2018-10-19         3   2243      104
## 2062           3261 2018-12-01         3   2244        2
## 2063           3261 2018-09-10         3   2242      112
## 2064           3261 2019-02-09         3   2245       62
## 2065           3262 2018-09-10         3   2246       74
## 2066           3262 2019-03-24         3   2249       30
## 2067           3262 2019-02-12         3   2248      113
## 2068           3262 2018-09-15         3   2247       20
## 2069           3262 2019-05-01         3   2251       75
## 2070           3262 2019-05-20         3   2252        3
## 2071           3263 2019-05-08         3   2253       46
## 2072           3263 2019-06-01         3   2254       17
## 2073           3264 2018-07-10         3   2255       16
## 2074           3264 2019-06-19         3   2260      113
## 2075           3264 2019-03-07         3   2258       68
## 2076           3264 2019-02-07         3   2257       89
## 2077           3264 2018-11-13         3   2256       99
## 2078           3265 2019-02-22         3   2264        3
## 2079           3265 2019-04-02         3   2265       68
## 2080           3265 2018-10-31         3   2262        4
## 2081           3265 2018-12-24         3   2263       23
## 2082           3265 2019-05-20         3   2268       20
## 2083           3265 2019-06-23         3   2269       28
## 2084           3265 2019-04-22         3   2266       51
## 2085           3265 2019-05-12         3   2267       90
## 2086           3266 2019-04-13         3   2271       25
## 2087           3266 2018-10-26         3   2270       89
## 2088           3266 2019-05-06         3   2272       68
## 2089           3267 2018-12-04         3   2275       89
## 2090           3267 2018-07-02         3   2273      102
## 2091           3267 2018-10-20         3   2274       14
## 2092           3267 2018-12-22         3   2277       36
## 2093           3267 2018-12-14         3   2276       16
## 2094           3268 2018-07-28         3   2278       78
## 2095           3268 2019-06-10         3   2281      104
## 2096           3268 2018-10-12         3   2279       17
## 2097           3268 2019-06-07         3   2280       99
## 2098           3269 2019-02-12         3   2285       14
## 2099           3269 2018-07-24         3   2282       36
## 2100           3269 2018-11-30         3   2283       36
## 2101           3269 2019-01-11         3   2284       44
## 2102           3270 2018-11-20         3   2287        3
## 2103           3270 2018-12-24         3   2289        4
## 2104           3270 2018-10-07         3   2286       52
## 2105           3270 2018-11-27         3   2288        9
## 2106           3271 2018-08-22         3   2290       63
## 2107           3271 2018-09-05         3   2291       81
## 2108           3272 2018-08-16         3   2292       74
## 2109           3273 2019-06-29         3   2296       24
## 2110           3273 2018-10-14         3   2293       31
## 2111           3273 2019-01-18         3   2295       90
## 2112           3274 2018-10-09         3   2297       87
## 2113           3275 2018-07-15         3   2298       81
## 2114           3275 2019-05-24         3   2301      104
## 2115           3275 2019-05-02         3   2300       60
## 2116           3276 2019-01-20         3   2304        4
## 2117           3276 2018-07-03         3   2302       50
## 2118           3276 2018-07-26         3   2303       70
## 2119           3276 2019-04-11         3   2305       87
## 2120           3277 2018-09-18         3   2306       36
## 2121           3277 2019-06-30         3   2307       24
## 2122           3278 2019-01-08         3   2310       62
## 2123           3278 2018-09-08         3   2308       60
## 2124           3279 2019-04-16         3   2313       63
## 2125           3279 2018-08-21         3   2311        7
## 2126           3279 2018-11-11         3   2312       52
## 2127           3280 2019-02-09         3   2317       74
## 2128           3280 2018-11-26         3   2316       33
## 2129           3280 2018-10-27         3   2315       15
## 2130           3280 2018-08-31         3   2314       24
## 2131           3280 2019-06-10         3   2318       17
## 2132           3282 2018-11-21         3   2320       78
## 2133           3282 2019-03-27         3   2321       32
## 2134           3282 2018-09-13         3   2319       87
## 2135           3282 2019-04-14         3   2322       47
## 2136           3283 2018-08-26         3   2324       68
## 2137           3283 2018-09-20         3   2325       87
## 2138           3283 2018-08-25         3   2323       75
## 2139           3284 2018-07-31         3   2327       51
## 2140           3285 2018-09-01         3   2328       60
## 2141           3286 2018-10-11         3   2329       15
## 2142           3286 2018-12-02         3   2330       16
## 2143           3286 2019-03-30         3   2331       62
## 2144           3287 2018-07-21         3   2333       14
## 2145           3287 2018-07-11         3   2332       75
## 2146           3287 2019-06-10         3   2337      112
## 2147           3287 2018-09-13         3   2334      112
## 2148           3287 2019-02-20         3   2336       17
## 2149           3287 2018-10-07         3   2335       78
## 2150           3288 2019-03-05         3   2338        2
## 2151           3288 2019-06-23         3   2339       68
## 2152           3289 2018-11-16         3   2345       71
## 2153           3289 2018-11-05         3   2344      113
## 2154           3289 2018-08-10         3   2342       51
## 2155           3289 2018-07-02         3   2340       62
## 2156           3289 2018-12-12         3   2346       75
## 2157           3289 2018-07-12         3   2341       47
## 2158           3289 2019-01-09         3   2347        2
## 2159           3289 2019-05-26         3   2348       17
## 2160           3290 2018-12-28         3   2353       28
## 2161           3290 2018-07-31         3   2349       36
## 2162           3290 2018-10-19         3   2352       75
## 2163           3290 2018-08-27         3   2351       68
## 2164           3290 2018-08-13         3   2350      112
## 2165           3291 2019-01-02         3   2357      112
## 2166           3291 2019-01-21         3   2358       47
## 2167           3291 2019-02-05         3   2359       47
## 2168           3291 2018-11-14         3   2355       77
## 2169           3291 2018-08-01         3   2354       34
## 2170           3291 2019-04-22         3   2361       30
## 2171           3291 2018-12-11         3   2356       31
## 2172           3292 2019-02-17         3   2363       47
## 2173           3293 2019-06-08         3   2368       52
## 2174           3293 2018-09-30         3   2364       50
## 2175           3293 2019-03-29         3   2367      104
## 2176           3293 2019-01-17         3   2366        9
## 2177           3293 2018-10-30         3   2365       71
## 2178           3294 2019-04-22         3   2369      114
## 2179           3294 2019-05-16         3   2370       51
## 2180           3295 2018-12-15         3   2372       25
## 2181           3295 2019-02-25         3   2373       62
## 2182           3295 2019-05-11         3   2374       50
## 2183           3295 2019-06-27         3   2375      108
## 2184           3295 2018-09-30         3   2371       34
## 2185           3296 2019-01-16         3   2380       70
## 2186           3296 2018-12-07         3   2379       70
## 2187           3296 2018-11-22         3   2378       47
## 2188           3296 2019-02-14         3   2381       52
## 2189           3296 2018-08-23         3   2376       44
## 2190           3296 2018-10-20         3   2377      114
## 2191           3296 2019-04-27         3   2382       89
## 2192           3297 2018-10-12         3   2383       70
## 2193           3297 2019-03-10         3   2384       49
## 2194           3298 2019-02-27         3   2385       70
## 2195           3299 2018-09-23         3   2386       34
## 2196           3299 2019-04-07         3   2388      112
## 2197           3299 2019-01-03         3   2387        7
## 2198           3300 2018-11-17         3   2391        3
## 2199           3300 2019-04-03         3   2394       24
## 2200           3300 2018-12-26         3   2392       14
## 2201           3300 2018-09-07         3   2390       81
## 2202           3300 2019-03-04         3   2393       25
## 2203           3301 2019-01-10         3   2395       28
## 2204           3302 2019-02-24         3   2396       31
## 2205           3303 2018-11-04         3   2398       26
## 2206           3303 2019-03-14         3   2401       31
## 2207           3303 2018-12-21         3   2399       93
## 2208           3303 2019-02-03         3   2400       16
## 2209           3303 2019-06-13         3   2402       14
## 2210           3304 2018-07-03         3   2403       89
## 2211           3304 2018-08-05         3   2404       74
## 2212           3304 2018-11-22         3   2406       40
## 2213           3304 2018-10-19         3   2405       47
## 2214           3304 2019-02-14         3   2407       88
## 2215           3305 2019-04-30         3   2408       47
## 2216           3306 2018-08-26         3   2409       31
## 2217           3306 2018-08-26         3   2409       44
## 2218           3306 2018-09-12         3   2410       20
## 2219           3306 2019-01-30         3   2411        3
## 2220           3307 2018-12-10         3   2412       47
## 2221           3307 2019-03-19         3   2414       34
## 2222           3307 2019-02-28         3   2413       16
## 2223           3308 2019-02-10         3   2420       50
## 2224           3308 2018-09-13         3   2416        4
## 2225           3308 2018-12-17         3   2419       40
## 2226           3308 2018-11-29         3   2418       70
## 2227           3308 2018-07-06         3   2415       34
## 2228           3308 2019-05-06         3   2422        3
## 2229           3308 2018-09-20         3   2417       89
## 2230           3309 2018-09-17         3   2423       17
## 2231           3309 2018-11-05         3   2424       89
## 2232           3310 2019-05-04         3   2426       20
## 2233           3310 2019-02-18         3   2425       23
## 2234           3311 2018-10-22         3   2427      104
## 2235           3311 2019-05-25         3   2430      104
## 2236           3311 2019-04-26         3   2429       17
## 2237           3312 2018-07-28         3   2431      108
## 2238           3312 2019-05-24         3   2434      109
## 2239           3312 2018-11-02         3   2432       81
## 2240           3312 2019-03-20         3   2433       34
## 2241           3313 2019-06-26         3   2437       15
## 2242           3314 2018-09-02         3   2440       30
## 2243           3314 2019-05-02         3   2444       47
## 2244           3314 2018-08-21         3   2439      112
## 2245           3314 2019-03-21         3   2442       78
## 2246           3314 2019-01-21         3   2441       26
## 2247           3314 2018-07-05         3   2438       42
## 2248           3314 2019-04-13         3   2443       33
## 2249           3315 2019-01-31         3   2447        4
## 2250           3315 2018-10-06         3   2446       33
## 2251           3315 2019-04-08         3   2448       87
## 2252           3315 2018-09-03         3   2445       49
## 2253           3316 2018-08-15         3   2449       60
## 2254           3316 2019-01-04         3   2450       32
## 2255           3316 2019-02-22         3   2451       93
## 2256           3317 2018-12-14         3   2454      112
## 2257           3317 2018-10-16         3   2453       93
## 2258           3317 2018-08-02         3   2452       60
## 2259           3318 2019-01-22         3   2455       70
## 2260           3319 2019-01-23         3   2457       46
## 2261           3319 2018-07-28         3   2456       51
## 2262           3319 2019-05-23         3   2458      112
## 2263           3320 2018-12-27         3   2460        3
## 2264           3320 2018-07-15         3   2459       70
## 2265           3322 2018-07-06         3   2461       70
## 2266           3322 2018-11-18         3   2462       89
## 2267           3322 2019-05-06         3   2463      109
## 2268           3323 2018-08-03         3   2466       28
## 2269           3323 2018-07-11         3   2465       87
## 2270           3323 2018-12-15         3   2467       26
## 2271           3323 2019-03-28         3   2469       74
## 2272           3324 2018-11-23         3   2472       74
## 2273           3324 2018-07-14         3   2470       88
## 2274           3324 2019-03-06         3   2474       31
## 2275           3324 2018-07-24         3   2471       60
## 2276           3324 2019-06-02         3   2475       40
## 2277           3325 2019-02-04         3   2478       81
## 2278           3325 2019-04-12         3   2480       75
## 2279           3325 2018-12-16         3   2477      102
## 2280           3325 2018-09-22         3   2476      112
## 2281           3325 2019-02-12         3   2479       14
## 2282           3326 2019-03-02         3   2481       44
## 2283           3326 2019-06-11         3   2484       40
## 2284           3326 2019-04-29         3   2483      102
## 2285           3326 2019-04-23         3   2482      102
## 2286           3327 2019-05-23         3   2487       88
## 2287           3327 2018-08-17         3   2485       89
## 2288           3327 2019-03-04         3   2486       78
## 2289           3328 2019-02-04         3   2490       15
## 2290           3328 2018-07-15         3   2488       36
## 2291           3328 2018-12-29         3   2489       30
## 2292           3329 2018-08-18         3   2491       16
## 2293           3330 2019-06-24         3   2495       49
## 2294           3330 2019-05-25         3   2494       49
## 2295           3330 2019-02-10         3   2493       26
## 2296           3331 2019-02-20         3   2496       23
## 2297           3331 2019-05-09         3   2497       90
## 2298           3332 2018-12-08         3   2499       25
## 2299           3332 2018-11-20         3   2498      104
## 2300           3332 2019-05-04         3   2501       68
## 2301           3332 2019-03-10         3   2500       93
## 2302           3333 2019-05-21         3   2505      112
## 2303           3333 2018-08-02         3   2503       36
## 2304           3333 2018-07-20         3   2502      109
## 2305           3333 2018-09-17         3   2504      112
## 2306           3334 2019-02-04         3   2506       25
## 2307           3335 2019-06-22         3   2510       14
## 2308           3335 2018-11-19         3   2508       17
## 2309           3335 2018-07-05         3   2507       90
## 2310           3335 2019-03-29         3   2509       14
## 2311           3336 2019-01-20         3   2511       36
## 2312           3337 2019-02-27         3   2513       20
## 2313           3337 2018-11-15         3   2512      113
## 2314           3337 2019-06-29         3   2514       20
## 2315           3338 2018-11-28         3   2516       30
## 2316           3338 2019-02-04         3   2519       26
## 2317           3338 2018-12-03         3   2517       33
## 2318           3338 2019-05-03         3   2520       36
## 2319           3338 2018-10-17         3   2515       78
## 2320           3339 2019-02-19         3   2527       93
## 2321           3339 2018-08-08         3   2521       40
## 2322           3339 2018-09-26         3   2522       93
## 2323           3339 2019-01-11         3   2525       15
## 2324           3339 2018-12-06         3   2524       25
## 2325           3339 2018-11-26         3   2523       88
## 2326           3339 2019-05-09         3   2528       81
## 2327           3339 2019-01-19         3   2526       33
## 2328           3340 2018-10-24         3   2529       52
## 2329           3340 2018-11-10         3   2530       88
## 2330           3340 2019-01-23         3   2531       24
## 2331           3340 2019-04-07         3   2532       52
## 2332           3341 2019-01-17         3   2536       16
## 2333           3341 2019-04-02         3   2537       74
## 2334           3341 2019-06-22         3   2539       62
## 2335           3341 2018-07-24         3   2533       47
## 2336           3341 2019-06-05         3   2538       34
## 2337           3341 2018-11-04         3   2534       31
## 2338           3342 2018-11-11         3   2542        3
## 2339           3342 2019-02-21         3   2545       99
## 2340           3342 2018-07-17         3   2540       16
## 2341           3342 2018-11-07         3   2541       30
## 2342           3342 2019-01-25         3   2544       62
## 2343           3342 2019-06-29         3   2547       88
## 2344           3342 2019-02-21         3   2545       33
## 2345           3342 2019-04-23         3   2546        3
## 2346           3343 2018-10-19         3   2548      112
## 2347           3344 2019-05-05         3   2552       93
## 2348           3344 2018-08-13         3   2549        7
## 2349           3344 2019-06-18         3   2553       40
## 2350           3344 2019-04-09         3   2551      102
## 2351           3344 2019-02-01         3   2550       60
## 2352           3345 2018-09-13         3   2554       87
## 2353           3345 2018-10-10         3   2555       78
## 2354           3346 2018-12-23         3   2556       34
## 2355           3347 2018-12-17         3   2559       52
## 2356           3347 2018-10-16         3   2558        9
## 2357           3347 2019-02-17         3   2560       93
## 2358           3347 2018-08-06         3   2557      102
## 2359           3348 2018-08-17         3   2561      108
## 2360           3348 2019-04-01         3   2568       68
## 2361           3348 2019-02-25         3   2566       93
## 2362           3348 2019-02-22         3   2565       34
## 2363           3348 2019-03-27         3   2567      102
## 2364           3348 2018-10-18         3   2562       42
## 2365           3348 2018-12-15         3   2563      112
## 2366           3348 2019-01-28         3   2564       50
## 2367           3349 2019-03-23         3   2572       25
## 2368           3349 2019-01-29         3   2571       88
## 2369           3349 2019-03-26         3   2573       75
## 2370           3349 2018-09-14         3   2569       89
## 2371           3350 2018-09-24         3   2574       40
## 2372           3350 2019-03-01         3   2575       23
## 2373           3350 2019-06-17         3   2577        2
## 2374           3350 2019-06-01         3   2576       93
## 2375           3351 2018-09-29         3   2578       30
## 2376           3351 2019-03-22         3   2580       60
## 2377           3351 2018-12-31         3   2579       78
## 2378           3352 2019-02-19         3   2583       78
## 2379           3352 2018-07-25         3   2581       23
## 2380           3352 2018-11-07         3   2582       23
## 2381           3353 2019-04-20         3   2589       75
## 2382           3353 2019-06-05         3   2591       15
## 2383           3353 2018-11-27         3   2587       51
## 2384           3353 2019-03-13         3   2588       15
## 2385           3353 2018-07-11         3   2584       90
## 2386           3353 2018-08-30         3   2585       60
## 2387           3353 2019-05-19         3   2590       24
## 2388           3353 2018-11-14         3   2586       49
## 2389           3354 2019-05-20         3   2594       14
## 2390           3354 2018-11-12         3   2593       77
## 2391           3354 2018-11-06         3   2592       81
## 2392           3355 2019-01-06         3   2598      109
## 2393           3355 2018-12-24         3   2597       33
## 2394           3355 2018-12-03         3   2596       93
## 2395           3355 2018-08-09         3   2595       30
## 2396           3356 2018-08-21         3   2600       28
## 2397           3356 2018-08-30         3   2601       34
## 2398           3356 2019-05-12         3   2603       63
## 2399           3356 2019-06-14         3   2604       17
## 2400           3356 2018-09-16         3   2602       49
## 2401           3356 2018-07-10         3   2599       31
## 2402           3357 2018-08-05         3   2606        7
## 2403           3357 2018-10-11         3   2607       99
## 2404           3357 2018-08-02         3   2605       68
## 2405           3357 2019-02-08         3   2608       36
## 2406           3358 2019-06-27         3   2610       46
## 2407           3358 2019-01-01         3   2609       50
## 2408           3359 2019-01-20         3   2611       70
## 2409           3359 2019-05-02         3   2612       88
## 2410           3359 2019-06-29         3   2614       33
## 2411           3359 2019-06-17         3   2613       49
## 2412           3360 2018-07-24         3   2615       51
## 2413           3360 2019-02-06         3   2618       88
## 2414           3360 2019-04-18         3   2621       62
## 2415           3360 2019-03-30         3   2620       46
## 2416           3360 2019-01-31         3   2617       20
## 2417           3360 2019-02-17         3   2619       99
## 2418           3360 2018-09-04         3   2616       89
## 2419           3361 2019-04-28         3   2624       89
## 2420           3361 2019-02-23         3   2623       14
## 2421           3362 2018-11-11         3   2625       77
## 2422           3363 2019-03-15         3   2626       99
## 2423           3364 2019-04-09         3   2629       75
## 2424           3364 2018-12-21         3   2627       20
## 2425           3364 2019-01-06         3   2628      102
## 2426           3365 2018-09-06         3   2630        2
## 2427           3366 2019-03-17         3   2632       49
## 2428           3366 2018-12-28         3   2631       17
## 2429           3366 2019-03-27         3   2634       31
## 2430           3366 2019-03-25         3   2633      104
## 2431           3367 2019-06-25         3   2638      104
## 2432           3367 2018-07-19         3   2635       81
## 2433           3367 2019-04-04         3   2637       50
## 2434           3367 2019-02-21         3   2636       24
## 2435           4000 2019-06-10         4   2640       17
## 2436           4000 2018-10-22         4   2639        2
## 2437           4001 2019-06-29         4   2647      108
## 2438           4001 2018-10-23         4   2644       78
## 2439           4001 2018-11-18         4   2645       33
## 2440           4001 2018-07-13         4   2641      113
## 2441           4001 2018-07-19         4   2642       47
## 2442           4001 2019-05-25         4   2646       62
## 2443           4001 2018-10-16         4   2643       63
## 2444           4002 2018-11-09         4   2648      109
## 2445           4002 2019-05-15         4   2649       93
## 2446           4003 2018-08-13         4   2650       15
## 2447           4003 2019-06-04         4   2653       60
## 2448           4003 2018-11-22         4   2651      113
## 2449           4003 2019-01-26         4   2652       62
## 2450           4004 2018-11-08         4   2656       28
## 2451           4004 2019-05-26         4   2659        7
## 2452           4004 2019-04-21         4   2658        9
## 2453           4004 2018-10-09         4   2655       14
## 2454           4004 2019-01-31         4   2657       32
## 2455           4004 2018-09-20         4   2654       17
## 2456           4005 2018-07-27         4   2660       87
## 2457           4005 2019-01-07         4   2662        7
## 2458           4005 2018-12-23         4   2661        2
## 2459           4005 2019-06-22         4   2665        4
## 2460           4005 2019-06-18         4   2664       47
## 2461           4006 2018-10-03         4   2666       75
## 2462           4006 2019-02-25         4   2668       78
## 2463           4006 2019-03-22         4   2669       33
## 2464           4007 2018-10-23         4   2671      113
## 2465           4007 2019-02-22         4   2678      112
## 2466           4007 2018-12-13         4   2674       28
## 2467           4007 2018-11-02         4   2673       14
## 2468           4007 2018-08-30         4   2670       52
## 2469           4007 2019-05-09         4   2679        2
## 2470           4007 2018-10-29         4   2672       23
## 2471           4007 2019-01-18         4   2677       63
## 2472           4008 2019-05-13         4   2686      112
## 2473           4008 2018-07-14         4   2680       75
## 2474           4008 2018-07-19         4   2681      113
## 2475           4008 2018-09-01         4   2683       44
## 2476           4008 2018-07-29         4   2682       93
## 2477           4008 2019-04-03         4   2685       47
## 2478           4009 2019-05-31         4   2689       17
## 2479           4009 2018-07-19         4   2687       46
## 2480           4009 2019-05-04         4   2688      102
## 2481           4010 2018-09-07         4   2691       36
## 2482           4010 2018-08-31         4   2690       15
## 2483           4010 2019-06-06         4   2694       81
## 2484           4010 2018-12-31         4   2693       44
## 2485           4011 2018-12-09         4   2697       88
## 2486           4011 2019-06-21         4   2698        2
## 2487           4011 2018-09-28         4   2696       44
## 2488           4011 2018-09-18         4   2695       32
## 2489           4012 2019-02-14         4   2701       99
## 2490           4012 2018-12-28         4   2700       44
## 2491           4012 2018-07-11         4   2699       23
## 2492           4013 2019-04-13         4   2706        4
## 2493           4013 2018-09-17         4   2703       75
## 2494           4013 2018-10-09         4   2704        7
## 2495           4013 2018-07-22         4   2702       93
## 2496           4014 2018-11-09         4   2707      109
## 2497           4014 2019-01-31         4   2708       81
## 2498           4015 2019-03-04         4   2710       25
## 2499           4015 2019-03-22         4   2711       87
## 2500           4015 2019-05-16         4   2712       23
## 2501           4015 2018-07-29         4   2709       47
## 2502           4016 2019-03-31         4   2715       49
## 2503           4016 2018-08-06         4   2713       28
## 2504           4016 2019-01-02         4   2714       50
## 2505           4017 2019-06-24         4   2719       78
## 2506           4017 2018-09-14         4   2716       34
## 2507           4017 2019-04-21         4   2718       49
## 2508           4017 2019-02-01         4   2717       52
## 2509           4018 2018-08-04         4   2720       15
## 2510           4018 2019-06-14         4   2725      112
## 2511           4018 2018-08-07         4   2721       26
## 2512           4018 2018-09-03         4   2722       77
## 2513           4018 2019-05-17         4   2724      112
## 2514           4018 2019-02-05         4   2723       40
## 2515           4019 2019-06-24         4   2727       36
## 2516           4019 2018-07-24         4   2726       51
## 2517           4020 2018-09-13         4   2728       28
## 2518           4021 2018-12-12         4   2732       68
## 2519           4021 2018-08-19         4   2730       52
## 2520           4021 2018-08-23         4   2731       77
## 2521           4021 2019-01-20         4   2734       47
## 2522           4021 2019-01-16         4   2733       93
## 2523           4022 2018-09-09         4   2737      114
## 2524           4022 2018-07-29         4   2735       62
## 2525           4022 2018-08-28         4   2736       44
## 2526           4022 2018-07-29         4   2735       60
## 2527           4022 2019-01-19         4   2740      113
## 2528           4022 2018-11-17         4   2739       46
## 2529           4022 2018-10-20         4   2738       17
## 2530           4022 2019-04-20         4   2741        2
## 2531           4023 2018-08-09         4   2742       74
## 2532           4023 2019-03-24         4   2744       50
## 2533           4023 2018-09-10         4   2743       33
## 2534           4024 2018-10-27         4   2746       46
## 2535           4024 2018-09-21         4   2745        2
## 2536           4024 2019-01-02         4   2749      104
## 2537           4024 2018-11-26         4   2748      114
## 2538           4024 2018-11-23         4   2747       99
## 2539           4025 2018-07-13         4   2750      108
## 2540           4026 2019-04-21         4   2753       75
## 2541           4026 2018-11-25         4   2751       46
## 2542           4026 2019-06-03         4   2754       14
## 2543           4026 2019-06-30         4   2755       44
## 2544           4027 2018-08-18         4   2757       24
## 2545           4027 2019-01-09         4   2759       74
## 2546           4027 2019-03-06         4   2760       17
## 2547           4027 2018-07-19         4   2756      113
## 2548           4027 2018-09-03         4   2758        2
## 2549           4028 2019-04-28         4   2762       32
## 2550           4028 2018-09-26         4   2761       25
## 2551           4029 2018-09-14         4   2765       25
## 2552           4029 2018-12-23         4   2767        7
## 2553           4029 2018-09-12         4   2764       31
## 2554           4029 2018-10-01         4   2766       36
## 2555           4029 2018-07-08         4   2763       75
## 2556           4030 2019-05-03         4   2768        3
## 2557           4030 2019-06-13         4   2769       89
## 2558           4031 2019-06-28         4   2774       16
## 2559           4031 2019-05-09         4   2773       17
## 2560           4031 2018-10-03         4   2771       87
## 2561           4031 2018-07-23         4   2770       47
## 2562           4031 2018-11-22         4   2772       36
## 2563           4032 2018-08-22         4   2776       99
## 2564           4033 2018-07-18         4   2779        9
## 2565           4033 2018-08-10         4   2780      102
## 2566           4033 2018-08-17         4   2781       71
## 2567           4033 2019-01-23         4   2782        2
## 2568           4034 2019-02-12         4   2785       36
## 2569           4034 2018-09-10         4   2783       93
## 2570           4034 2018-12-21         4   2784        7
## 2571           4035 2019-01-31         4   2788       63
## 2572           4035 2018-10-07         4   2786       47
## 2573           4035 2018-11-06         4   2787       63
## 2574           4035 2019-05-08         4   2789       90
## 2575           4036 2019-05-19         4   2795        9
## 2576           4036 2019-04-28         4   2793       36
## 2577           4036 2019-05-14         4   2794       70
## 2578           4036 2019-04-16         4   2792       75
## 2579           4036 2018-08-20         4   2790       42
## 2580           4036 2018-10-30         4   2791        3
## 2581           4037 2018-12-13         4   2798       77
## 2582           4037 2019-01-26         4   2799        3
## 2583           4037 2018-11-01         4   2796       87
## 2584           4037 2018-11-03         4   2797       89
## 2585           4038 2019-05-28         4   2805        3
## 2586           4038 2019-04-27         4   2804       32
## 2587           4038 2019-03-10         4   2803       75
## 2588           4038 2018-07-04         4   2800       68
## 2589           4038 2018-10-13         4   2801       93
## 2590           4038 2018-10-13         4   2801       99
## 2591           4039 2019-02-26         4   2809      114
## 2592           4039 2018-08-02         4   2806       99
## 2593           4039 2018-08-18         4   2807      104
## 2594           4039 2019-03-03         4   2810       52
## 2595           4039 2019-04-12         4   2811      104
## 2596           4039 2018-09-02         4   2808       42
## 2597           4040 2018-10-24         4   2813       20
## 2598           4040 2018-08-27         4   2812       15
## 2599           4041 2019-06-24         4   2819        7
## 2600           4041 2019-06-15         4   2817       20
## 2601           4041 2019-06-14         4   2816       15
## 2602           4041 2019-03-23         4   2815        3
## 2603           4041 2019-06-17         4   2818       40
## 2604           4041 2018-11-27         4   2814        9
## 2605           4042 2018-08-08         4   2823       30
## 2606           4042 2018-10-10         4   2824       90
## 2607           4042 2018-07-19         4   2820       71
## 2608           4042 2018-07-20         4   2821       40
## 2609           4042 2018-08-04         4   2822      114
## 2610           4042 2019-03-17         4   2825       30
## 2611           4043 2019-06-09         4   2832       71
## 2612           4043 2018-08-27         4   2828       30
## 2613           4043 2018-11-30         4   2829      108
## 2614           4043 2019-01-04         4   2830        9
## 2615           4043 2018-08-15         4   2827       90
## 2616           4043 2019-03-25         4   2831       40
## 2617           4043 2018-07-27         4   2826       81
## 2618           4044 2018-11-19         4   2834       99
## 2619           4044 2019-04-09         4   2835       25
## 2620           4044 2018-08-25         4   2833       74
## 2621           4045 2018-12-11         4   2836       17
## 2622           4046 2019-02-03         4   2845       42
## 2623           4046 2019-05-20         4   2846       33
## 2624           4046 2019-01-24         4   2844       77
## 2625           4046 2019-06-28         4   2847      114
## 2626           4046 2018-07-20         4   2839       74
## 2627           4046 2018-11-30         4   2843      112
## 2628           4046 2018-11-16         4   2842       47
## 2629           4046 2018-07-07         4   2838       63
## 2630           4046 2018-07-05         4   2837       70
## 2631           4046 2018-11-15         4   2841       87
## 2632           4046 2018-07-31         4   2840       40
## 2633           4047 2018-07-30         4   2848       16
## 2634           4047 2018-12-14         4   2849       78
## 2635           4048 2018-08-05         4   2852       77
## 2636           4048 2019-06-22         4   2856       24
## 2637           4048 2018-11-29         4   2853       49
## 2638           4049 2018-11-17         4   2858        3
## 2639           4049 2019-05-21         4   2862      112
## 2640           4049 2019-05-31         4   2863       25
## 2641           4049 2018-12-13         4   2859       16
## 2642           4049 2019-04-23         4   2861       28
## 2643           4049 2018-08-11         4   2857       26
## 2644           4049 2019-04-17         4   2860       23
## 2645           4050 2019-04-30         4   2866       51
## 2646           4050 2019-06-09         4   2867       23
## 2647           4050 2019-04-02         4   2865       24
## 2648           4050 2018-07-17         4   2864       49
## 2649           4051 2019-05-15         4   2870      108
## 2650           4051 2019-05-30         4   2871      109
## 2651           4051 2018-11-03         4   2869       89
## 2652           4051 2018-10-31         4   2868      102
## 2653           4052 2019-01-23         4   2873        7
## 2654           4052 2019-06-16         4   2875       15
## 2655           4052 2019-01-24         4   2874      102
## 2656           4052 2019-01-03         4   2872       32
## 2657           4053 2018-08-03         4   2876       51
## 2658           4053 2019-05-25         4   2880       77
## 2659           4053 2019-04-28         4   2879       68
## 2660           4053 2018-11-15         4   2878       77
## 2661           4053 2018-09-23         4   2877       70
## 2662           4054 2018-10-19         4   2882       90
## 2663           4054 2018-12-26         4   2884       90
## 2664           4054 2018-12-31         4   2885      108
## 2665           4054 2018-12-23         4   2883       71
## 2666           4055 2018-08-30         4   2887       31
## 2667           4055 2018-09-25         4   2888       90
## 2668           4055 2019-03-17         4   2889       16
## 2669           4055 2018-07-16         4   2886       33
## 2670           4056 2018-11-29         4   2891       50
## 2671           4056 2019-01-03         4   2893      114
## 2672           4056 2019-06-25         4   2894       87
## 2673           4056 2018-11-21         4   2890        2
## 2674           4057 2019-05-31         4   2897       77
## 2675           4057 2018-08-27         4   2896      112
## 2676           4057 2018-08-23         4   2895       47
## 2677           4058 2019-04-13         4   2899       74
## 2678           4058 2019-04-12         4   2898       23
## 2679           4059 2018-12-08         4   2902       46
## 2680           4059 2018-09-30         4   2901      113
## 2681           4059 2019-01-02         4   2904      114
## 2682           4059 2018-07-14         4   2900      109
## 2683           4059 2018-12-13         4   2903       60
## 2684           4060 2018-09-05         4   2905       93
## 2685           4060 2019-03-02         4   2907       30
## 2686           4060 2019-04-20         4   2908      109
## 2687           4060 2019-02-13         4   2906       32
## 2688           4060 2019-04-26         4   2909       88
## 2689           4061 2018-08-28         4   2913       28
## 2690           4061 2018-07-24         4   2912        9
## 2691           4061 2018-12-18         4   2915       16
## 2692           4061 2019-03-31         4   2917      113
## 2693           4061 2019-02-26         4   2916       89
## 2694           4061 2018-11-10         4   2914       90
## 2695           4062 2019-02-05         4   2921       63
## 2696           4062 2018-07-14         4   2918       51
## 2697           4062 2019-06-20         4   2923      113
## 2698           4062 2018-12-12         4   2920      114
## 2699           4062 2018-09-08         4   2919       17
## 2700           4062 2019-05-16         4   2922       23
## 2701           4063 2019-04-24         4   2927       74
## 2702           4063 2018-10-16         4   2925      108
## 2703           4063 2019-05-03         4   2928       50
## 2704           4063 2018-11-03         4   2926       87
## 2705           4063 2018-09-23         4   2924       88
## 2706           4064 2018-07-02         4   2929       17
## 2707           4064 2018-08-13         4   2930       49
## 2708           4064 2018-10-11         4   2931       87
## 2709           4064 2019-04-07         4   2934       31
## 2710           4064 2018-10-22         4   2932       15
## 2711           4064 2019-06-18         4   2935       16
## 2712           4064 2019-03-08         4   2933       44
## 2713           4065 2019-03-20         4   2938        2
## 2714           4065 2018-07-18         4   2936        4
## 2715           4065 2019-03-10         4   2937       87
## 2716           4066 2019-01-30         4   2943       20
## 2717           4066 2018-07-11         4   2939       87
## 2718           4066 2018-12-19         4   2940       99
## 2719           4066 2019-01-24         4   2942       26
## 2720           4067 2018-09-13         4   2945       17
## 2721           4067 2019-01-09         4   2948       75
## 2722           4067 2018-10-21         4   2947       26
## 2723           4067 2018-09-29         4   2946       63
## 2724           4067 2018-07-04         4   2944       62
## 2725           4067 2019-04-14         4   2949       17
## 2726           4068 2019-03-14         4   2952       47
## 2727           4068 2018-10-07         4   2950      108
## 2728           4068 2019-01-20         4   2951       32
## 2729           4069 2019-05-31         4   2953       15
## 2730           4070 2019-05-20         4   2957       47
## 2731           4070 2018-07-17         4   2954        2
## 2732           4070 2019-01-16         4   2956       31
## 2733           4070 2018-08-08         4   2955       16
## 2734           4071 2019-02-21         4   2961       33
## 2735           4071 2019-02-22         4   2962       14
## 2736           4071 2019-03-22         4   2963       44
## 2737           4071 2018-07-07         4   2958       77
## 2738           4071 2019-04-19         4   2964       15
## 2739           4071 2018-07-25         4   2959        4
## 2740           4071 2019-01-28         4   2960       68
## 2741           4072 2018-10-13         4   2966       75
## 2742           4072 2019-01-31         4   2968       14
## 2743           4072 2019-02-24         4   2970       87
## 2744           4072 2019-02-08         4   2969        3
## 2745           4072 2018-07-13         4   2965       17
## 2746           4072 2019-04-28         4   2971       25
## 2747           4073 2018-07-29         4   2972      109
## 2748           4073 2019-01-07         4   2976       24
## 2749           4073 2019-02-23         4   2977       68
## 2750           4073 2018-11-07         4   2975       77
## 2751           4073 2018-08-07         4   2973       23
## 2752           4073 2018-10-28         4   2974       34
## 2753           4074 2018-12-12         4   2980        4
## 2754           4074 2019-03-05         4   2981       51
## 2755           4074 2018-08-09         4   2979       60
## 2756           4074 2018-08-06         4   2978       70
## 2757           4075 2018-11-14         4   2986       93
## 2758           4075 2019-02-25         4   2988       14
## 2759           4075 2019-04-16         4   2991       62
## 2760           4075 2019-03-07         4   2989       51
## 2761           4075 2019-01-08         4   2987       71
## 2762           4075 2019-04-28         4   2992      108
## 2763           4075 2019-03-14         4   2990       32
## 2764           4075 2018-10-02         4   2984       90
## 2765           4075 2018-11-06         4   2985       89
## 2766           4076 2018-12-12         4   2996       50
## 2767           4076 2019-02-11         4   2997       31
## 2768           4076 2018-07-28         4   2993       16
## 2769           4076 2018-09-04         4   2995       87
## 2770           4077 2018-08-26         4   2998       63
## 2771           4077 2018-11-27         4   3001       36
## 2772           4077 2018-09-05         4   2999        2
## 2773           4077 2019-04-10         4   3002       88
## 2774           4077 2018-11-03         4   3000      109
## 2775           4078 2019-01-08         4   3004       16
## 2776           4078 2019-01-18         4   3005       89
## 2777           4078 2019-04-24         4   3007       25
## 2778           4078 2018-10-23         4   3003       25
## 2779           4078 2019-03-04         4   3006       52
## 2780           4079 2018-07-02         4   3008       34
## 2781           4079 2018-10-12         4   3009       81
## 2782           4079 2019-01-11         4   3010       47
## 2783           4080 2019-04-14         4   3014       78
## 2784           4080 2018-09-09         4   3011       75
## 2785           4080 2019-03-22         4   3013       75
## 2786           4080 2018-12-19         4   3012      114
## 2787           4081 2018-12-05         4   3017        9
## 2788           4081 2019-02-28         4   3018       81
## 2789           4081 2019-04-12         4   3020       46
## 2790           4081 2019-03-24         4   3019       74
## 2791           4081 2018-10-17         4   3016        2
## 2792           4081 2019-05-16         4   3021       81
## 2793           4081 2018-08-31         4   3015       74
## 2794           4082 2018-09-14         4   3022       90
## 2795           4083 2019-04-28         4   3025       32
## 2796           4083 2018-10-11         4   3023       93
## 2797           4083 2019-03-19         4   3024       26
## 2798           4084 2019-04-16         4   3027       88
## 2799           4084 2019-01-23         4   3026       33
## 2800           4085 2018-07-25         4   3028       34
## 2801           4085 2018-12-09         4   3032       44
## 2802           4085 2018-11-16         4   3031       89
## 2803           4085 2018-08-28         4   3030        4
## 2804           4085 2018-08-22         4   3029      102
## 2805           4085 2019-06-29         4   3033       47
## 2806           4086 2019-01-10         4   3036      114
## 2807           4086 2019-01-09         4   3035       71
## 2808           4086 2019-04-16         4   3037       32
## 2809           4086 2018-09-05         4   3034       31
## 2810           4087 2019-06-29         4   3047       75
## 2811           4087 2019-05-02         4   3046        9
## 2812           4087 2018-09-29         4   3039       71
## 2813           4087 2018-11-23         4   3042       62
## 2814           4087 2019-01-05         4   3044       74
## 2815           4087 2018-08-28         4   3038       62
## 2816           4087 2018-10-11         4   3040        2
## 2817           4087 2018-10-27         4   3041       25
## 2818           4087 2019-01-07         4   3045       14
## 2819           4088 2018-08-20         4   3048      102
## 2820           4088 2019-03-10         4   3053      114
## 2821           4088 2018-11-08         4   3049       24
## 2822           4088 2018-12-17         4   3050       88
## 2823           4088 2018-12-23         4   3051       20
## 2824           4089 2018-10-03         4   3055       23
## 2825           4089 2018-11-04         4   3056        2
## 2826           4089 2018-08-08         4   3054       14
## 2827           4090 2019-03-03         4   3063       88
## 2828           4090 2018-10-09         4   3059        9
## 2829           4090 2019-01-25         4   3062       81
## 2830           4090 2019-06-16         4   3064       28
## 2831           4090 2018-09-29         4   3058       63
## 2832           4090 2018-11-20         4   3060      114
## 2833           4090 2018-12-30         4   3061       62
## 2834           4091 2018-10-18         4   3066       71
## 2835           4091 2019-04-11         4   3068       77
## 2836           4091 2019-04-16         4   3069       23
## 2837           4091 2018-09-14         4   3065       49
## 2838           4091 2019-01-30         4   3067       17
## 2839           4092 2019-03-06         4   3071       23
## 2840           4093 2018-09-25         4   3073      104
## 2841           4093 2019-05-29         4   3076       78
## 2842           4093 2019-04-30         4   3074       16
## 2843           4093 2018-09-01         4   3072      108
## 2844           4094 2019-01-29         4   3083      104
## 2845           4094 2019-05-25         4   3084       75
## 2846           4094 2019-01-06         4   3081       49
## 2847           4094 2018-07-01         4   3077       32
## 2848           4094 2018-11-28         4   3080        9
## 2849           4094 2019-01-07         4   3082      108
## 2850           4094 2018-08-20         4   3079       26
## 2851           4094 2018-07-16         4   3078       44
## 2852           4095 2019-01-11         4   3086       31
## 2853           4095 2019-01-30         4   3087      113
## 2854           4095 2018-10-24         4   3085       46
## 2855           4095 2019-06-03         4   3088       74
## 2856           4096 2019-03-21         4   3095       15
## 2857           4096 2019-01-05         4   3092       23
## 2858           4096 2018-10-19         4   3091        4
## 2859           4096 2019-03-05         4   3093       17
## 2860           4096 2019-03-12         4   3094       47
## 2861           4096 2018-07-28         4   3089       25
## 2862           4096 2018-09-30         4   3090       20
## 2863           4097 2018-11-03         4   3096       28
## 2864           4097 2019-02-23         4   3099        9
## 2865           4097 2019-01-04         4   3098      102
## 2866           4098 2019-06-10         4   3105       46
## 2867           4098 2019-05-25         4   3104       34
## 2868           4098 2018-10-29         4   3101       68
## 2869           4098 2019-03-16         4   3102       15
## 2870           4098 2019-03-29         4   3103       28
## 2871           4098 2018-08-11         4   3100       31
## 2872           4099 2018-11-10         4   3109       40
## 2873           4099 2018-07-02         4   3106      109
## 2874           4099 2018-09-11         4   3108       90
## 2875           4099 2019-03-15         4   3111      109
## 2876           4100 2018-09-09         4   3114       49
## 2877           4100 2019-06-27         4   3116       15
## 2878           4100 2018-07-14         4   3113      113
## 2879           4101 2018-11-24         4   3118       40
## 2880           4101 2018-10-01         4   3117       47
## 2881           4102 2018-11-19         4   3119       26
## 2882           4102 2019-02-19         4   3121       33
## 2883           4103 2018-09-15         4   3124       60
## 2884           4103 2018-07-07         4   3122       71
## 2885           4103 2018-11-27         4   3125       49
## 2886           4103 2019-02-05         4   3126       89
## 2887           4103 2019-06-04         4   3127       34
## 2888           4103 2018-07-24         4   3123       34
## 2889           4104 2019-04-13         4   3131      113
## 2890           4104 2018-09-20         4   3128       24
## 2891           4104 2018-12-19         4   3130        9
## 2892           4104 2018-10-06         4   3129       28
## 2893           4105 2018-12-13         4   3133       87
## 2894           4105 2019-03-15         4   3134       52
## 2895           4106 2019-06-30         4   3138      113
## 2896           4106 2018-10-09         4   3135       78
## 2897           4106 2019-04-13         4   3136       28
## 2898           4106 2019-06-27         4   3137       78
## 2899           4107 2019-03-12         4   3139      102
## 2900           4108 2019-03-06         4   3140       31
## 2901           4109 2019-04-05         4   3141       16
## 2902           4110 2019-01-21         4   3146       42
## 2903           4110 2018-11-10         4   3144       81
## 2904           4110 2019-03-07         4   3147       33
## 2905           4110 2018-10-06         4   3143       16
## 2906           4110 2018-10-04         4   3142       15
## 2907           4110 2019-04-14         4   3148       28
## 2908           4110 2018-12-06         4   3145       31
## 2909           4111 2018-08-13         4   3150        4
## 2910           4111 2018-08-04         4   3149       46
## 2911           4112 2018-11-15         4   3152      108
## 2912           4112 2019-01-29         4   3154      102
## 2913           4112 2019-04-23         4   3156       31
## 2914           4112 2018-07-02         4   3151       88
## 2915           4112 2019-01-16         4   3153       26
## 2916           4112 2019-03-08         4   3155       93
## 2917           4113 2018-07-16         4   3157      104
## 2918           4113 2019-01-10         4   3160       68
## 2919           4113 2019-06-18         4   3161       40
## 2920           4113 2018-10-17         4   3159       44
## 2921           4113 2018-08-08         4   3158       89
## 2922           4114 2018-09-04         4   3163      109
## 2923           4114 2018-12-04         4   3164       60
## 2924           4114 2019-01-14         4   3165        4
## 2925           4114 2019-01-18         4   3166       90
## 2926           4114 2018-08-01         4   3162       52
## 2927           4115 2019-02-11         4   3169       78
## 2928           4115 2018-08-07         4   3167       81
## 2929           4115 2019-04-07         4   3170        4
## 2930           4115 2018-10-26         4   3168       75
## 2931           4116 2019-05-04         4   3177       34
## 2932           4116 2018-12-08         4   3174       70
## 2933           4116 2019-04-13         4   3176       74
## 2934           4116 2018-12-01         4   3173       68
## 2935           4116 2019-04-01         4   3175       36
## 2936           4116 2018-11-05         4   3172      113
## 2937           4117 2018-07-03         4   3178       71
## 2938           4117 2019-04-06         4   3182       88
## 2939           4117 2019-03-12         4   3181        9
## 2940           4117 2018-12-26         4   3179       51
## 2941           4117 2019-06-05         4   3183       46
## 2942           4118 2019-01-17         4   3187       15
## 2943           4118 2018-11-20         4   3185       70
## 2944           4118 2019-01-19         4   3188       16
## 2945           4118 2018-09-05         4   3184      114
## 2946           4118 2019-06-02         4   3189        4
## 2947           4118 2018-11-23         4   3186       68
## 2948           4119 2018-09-05         4   3191      108
## 2949           4119 2018-10-26         4   3192      109
## 2950           4119 2019-03-19         4   3194       36
## 2951           4119 2019-03-03         4   3193       20
## 2952           4119 2018-08-23         4   3190       28
## 2953           4120 2019-02-27         4   3200       30
## 2954           4120 2018-08-27         4   3197       24
## 2955           4120 2018-07-06         4   3195       77
## 2956           4120 2018-08-03         4   3196       90
## 2957           4120 2018-08-30         4   3198       60
## 2958           4120 2019-05-25         4   3201        9
## 2959           4120 2019-01-15         4   3199       34
## 2960           4121 2019-06-05         4   3205       28
## 2961           4121 2018-09-26         4   3204       90
## 2962           4121 2018-08-08         4   3202       77
## 2963           4121 2018-09-02         4   3203       36
## 2964           4122 2018-11-03         4   3208      114
## 2965           4122 2019-02-15         4   3213       70
## 2966           4122 2018-10-29         4   3207       34
## 2967           4122 2018-11-08         4   3209       50
## 2968           4122 2018-11-11         4   3210       47
## 2969           4122 2018-12-09         4   3211       26
## 2970           4122 2018-10-22         4   3206       70
## 2971           4122 2018-12-14         4   3212       62
## 2972           4123 2019-02-07         4   3217       89
## 2973           4123 2019-01-22         4   3216       62
## 2974           4123 2019-01-08         4   3215       78
## 2975           4123 2019-04-13         4   3218       52
## 2976           4123 2019-06-07         4   3219       60
## 2977           4124 2019-03-21         4   3222      113
## 2978           4124 2018-08-10         4   3220        4
## 2979           4124 2018-08-26         4   3221      102
## 2980           4125 2018-11-01         4   3225       68
## 2981           4125 2018-09-26         4   3224       71
## 2982           4125 2018-09-23         4   3223       93
## 2983           4125 2019-01-29         4   3226      114
## 2984           4126 2019-03-01         4   3231        3
## 2985           4126 2018-10-16         4   3227       46
## 2986           4126 2019-01-16         4   3229       25
## 2987           4126 2019-02-15         4   3230      108
## 2988           4126 2019-06-04         4   3232       16
## 2989           4126 2019-01-08         4   3228      102
## 2990           4127 2018-07-24         4   3233      113
## 2991           4127 2018-10-10         4   3234       52
## 2992           4128 2019-01-10         4   3238       14
## 2993           4128 2019-04-15         4   3239       51
## 2994           4128 2019-05-15         4   3240       44
## 2995           4128 2019-01-05         4   3237       40
## 2996           4129 2019-01-27         4   3243       17
## 2997           4129 2018-12-22         4   3242      102
## 2998           4129 2019-05-06         4   3244       49
## 2999           4129 2019-06-24         4   3245       36
## 3000           4129 2018-07-16         4   3241       30
## 3001           4130 2019-02-02         4   3248       31
## 3002           4130 2018-09-29         4   3247       47
## 3003           4130 2018-08-06         4   3246       16
## 3004           4130 2019-03-13         4   3249        2
## 3005           4131 2018-10-11         4   3253        3
## 3006           4131 2018-07-20         4   3251       87
## 3007           4131 2018-10-08         4   3252       20
## 3008           4132 2018-12-01         4   3255       14
## 3009           4132 2018-10-30         4   3254      102
## 3010           4132 2019-02-12         4   3258       16
## 3011           4132 2019-02-22         4   3259       93
## 3012           4132 2018-12-06         4   3256      102
## 3013           4132 2018-12-17         4   3257       99
## 3014           4132 2019-05-03         4   3260       68
## 3015           4133 2018-11-27         4   3261       40
## 3016           4133 2019-03-31         4   3263       68
## 3017           4134 2018-08-16         4   3266       78
## 3018           4134 2018-07-01         4   3265       71
## 3019           4134 2019-01-01         4   3267       60
## 3020           4135 2019-06-18         4   3272       30
## 3021           4135 2018-10-26         4   3269       26
## 3022           4135 2018-11-18         4   3270       28
## 3023           4135 2018-09-07         4   3268       68
## 3024           4135 2019-01-06         4   3271       93
## 3025           4136 2018-07-11         4   3273        4
## 3026           4136 2019-04-04         4   3275       17
## 3027           4136 2018-11-25         4   3274       47
## 3028           4136 2019-04-17         4   3276       68
## 3029           4136 2019-06-06         4   3277       25
## 3030           4137 2019-06-11         4   3280       60
## 3031           4137 2019-05-12         4   3278       77
## 3032           4137 2019-05-21         4   3279       32
## 3033           4138 2018-10-07         4   3282      104
## 3034           4138 2018-08-11         4   3281       47
## 3035           4138 2019-06-22         4   3283      104
## 3036           4139 2018-08-06         4   3284       78
## 3037           4139 2019-01-16         4   3288       36
## 3038           4139 2019-01-04         4   3286       71
## 3039           4139 2019-01-19         4   3289       89
## 3040           4139 2019-06-03         4   3290       15
## 3041           4139 2019-01-11         4   3287       36
## 3042           4139 2018-08-24         4   3285      114
## 3043           4140 2018-12-10         4   3292        3
## 3044           4140 2019-01-27         4   3293       14
## 3045           4140 2018-09-13         4   3291        3
## 3046           4141 2019-03-22         4   3294       78
## 3047           4141 2019-05-23         4   3295       32
## 3048           4142 2018-12-29         4   3299       70
## 3049           4142 2019-03-04         4   3300       60
## 3050           4142 2019-06-08         4   3301       51
## 3051           4142 2018-09-11         4   3297       36
## 3052           4142 2018-07-25         4   3296       23
## 3053           4142 2018-10-20         4   3298       44
## 3054           4143 2018-08-05         4   3302       77
## 3055           4144 2018-10-11         4   3303       14
## 3056           4144 2019-04-27         4   3307       33
## 3057           4144 2018-12-02         4   3305       36
## 3058           4144 2019-06-24         4   3308       93
## 3059           4144 2018-11-25         4   3304       75
## 3060           4144 2019-02-21         4   3306       78
## 3061           4145 2019-02-21         4   3311        4
## 3062           4145 2019-03-27         4   3312       16
## 3063           4145 2018-08-23         4   3309       78
## 3064           4145 2018-12-31         4   3310       46
## 3065           4146 2018-07-23         4   3315       89
## 3066           4146 2018-07-17         4   3314        9
## 3067           4147 2019-01-05         4   3318       46
## 3068           4147 2018-10-26         4   3317       33
## 3069           4147 2019-03-10         4   3319       87
## 3070           4148 2018-12-29         4   3327       17
## 3071           4148 2018-09-28         4   3322       28
## 3072           4148 2018-10-13         4   3325      104
## 3073           4148 2018-10-28         4   3326       44
## 3074           4148 2018-08-20         4   3321      112
## 3075           4148 2019-03-28         4   3328       40
## 3076           4148 2018-10-08         4   3323       17
## 3077           4148 2018-10-10         4   3324       30
## 3078           4149 2019-05-16         4   3333       16
## 3079           4149 2019-04-07         4   3332       87
## 3080           4149 2018-07-06         4   3330       46
## 3081           4149 2018-07-18         4   3331      112
## 3082           4150 2018-09-18         4   3335       16
## 3083           4150 2018-10-06         4   3336       51
## 3084           4150 2019-05-15         4   3338        9
## 3085           4150 2018-07-03         4   3334       49
## 3086           4150 2019-06-13         4   3339       51
## 3087           4150 2018-11-16         4   3337      109
## 3088           4151 2019-04-20         4   3345       74
## 3089           4151 2019-01-21         4   3343       70
## 3090           4151 2019-02-04         4   3344       20
## 3091           4151 2018-07-07         4   3340       50
## 3092           4151 2018-09-19         4   3341       68
## 3093           4151 2018-10-08         4   3342      109
## 3094           4152 2019-04-21         4   3347       17
## 3095           4152 2019-02-24         4   3346       90
## 3096           4153 2018-07-06         4   3348      104
## 3097           4153 2018-07-08         4   3349        9
## 3098           4153 2018-11-14         4   3350       44
## 3099           4153 2019-05-16         4   3353       77
## 3100           4153 2019-05-11         4   3352        9
## 3101           4153 2019-01-19         4   3351      108
## 3102           4154 2018-12-06         4   3354       60
## 3103           4155 2019-02-12         4   3359       30
## 3104           4155 2018-11-03         4   3357       93
## 3105           4155 2019-05-06         4   3360       60
## 3106           4155 2018-11-02         4   3356       68
## 3107           4155 2018-11-21         4   3358        2
## 3108           4155 2018-09-07         4   3355       26
## 3109           4156 2019-02-20         4   3361       47
## 3110           4156 2019-06-23         4   3362       78
## 3111           4156 2019-02-20         4   3361        3
## 3112           4157 2019-04-12         4   3367        7
## 3113           4157 2019-01-05         4   3364       47
## 3114           4157 2019-03-28         4   3366       15
## 3115           4157 2019-02-24         4   3365       51
## 3116           4157 2019-01-03         4   3363       20
## 3117           4157 2019-05-04         4   3368       25
## 3118           4157 2019-05-22         4   3369       23
## 3119           4158 2018-12-05         4   3373       25
## 3120           4158 2018-10-27         4   3372       62
## 3121           4158 2018-10-16         4   3371       75
## 3122           4158 2019-03-23         4   3375       30
## 3123           4158 2018-10-02         4   3370       17
## 3124           4158 2019-01-16         4   3374       68
## 3125           4158 2019-04-01         4   3376       23
## 3126           4159 2019-05-16         4   3378        4
## 3127           4159 2019-03-19         4   3377       81
## 3128           4160 2019-02-01         4   3381      109
## 3129           4160 2019-02-18         4   3382      104
## 3130           4160 2018-09-01         4   3379        3
## 3131           4160 2019-04-16         4   3384        7
## 3132           4160 2019-06-16         4   3385       15
## 3133           4160 2018-11-25         4   3380       60
## 3134           4161 2018-12-05         4   3386       52
## 3135           4161 2018-12-19         4   3387        9
## 3136           4161 2018-12-30         4   3388      104
## 3137           4162 2019-06-10         4   3390        7
## 3138           4162 2018-07-22         4   3389        9
## 3139           4163 2018-07-15         4   3392      102
## 3140           4163 2018-08-05         4   3393       77
## 3141           4163 2018-10-01         4   3395       15
## 3142           4163 2018-09-09         4   3394       93
## 3143           4163 2019-04-05         4   3397        3
## 3144           4163 2018-07-11         4   3391       30
## 3145           4164 2019-03-08         4   3402       17
## 3146           4164 2019-04-02         4   3403       74
## 3147           4164 2018-08-09         4   3399        2
## 3148           4164 2018-10-22         4   3400        2
## 3149           4164 2019-01-21         4   3401       88
## 3150           4165 2018-12-24         4   3404       89
## 3151           4166 2019-03-18         4   3410       89
## 3152           4166 2019-03-16         4   3409       88
## 3153           4166 2018-11-18         4   3406        7
## 3154           4166 2019-01-21         4   3408       90
## 3155           4166 2018-11-02         4   3405       89
## 3156           4167 2019-03-12         4   3413      113
## 3157           4167 2018-09-17         4   3411       15
## 3158           4168 2019-02-24         4   3416       93
## 3159           4168 2018-12-27         4   3415       47
## 3160           4169 2019-06-19         4   3422       42
## 3161           4169 2019-02-25         4   3420      112
## 3162           4169 2018-10-14         4   3418       49
## 3163           4169 2018-12-28         4   3419       20
## 3164           4169 2018-07-20         4   3417       33
## 3165           4169 2019-04-18         4   3421       32
## 3166           4169 2019-06-28         4   3423       28
## 3167           4170 2019-01-24         4   3428        4
## 3168           4170 2019-06-06         4   3431       89
## 3169           4170 2019-03-28         4   3430       17
## 3170           4170 2019-02-07         4   3429       16
## 3171           4170 2019-06-15         4   3432       40
## 3172           4170 2018-09-17         4   3425       16
## 3173           4170 2018-11-19         4   3427       75
## 3174           4170 2018-08-05         4   3424       20
## 3175           4171 2019-06-29         4   3434       36
## 3176           4171 2019-02-02         4   3433       40
## 3177           4172 2018-10-31         4   3435       50
## 3178           4172 2019-05-08         4   3437      112
## 3179           4172 2018-12-23         4   3436        4
## 3180           4173 2019-05-16         4   3443       49
## 3181           4173 2019-04-05         4   3440       50
## 3182           4173 2018-09-18         4   3439      113
## 3183           4173 2018-08-16         4   3438       62
## 3184           4173 2019-06-06         4   3444        9
## 3185           4173 2019-04-22         4   3442       75
## 3186           4174 2018-11-22         4   3446       99
## 3187           4174 2018-09-18         4   3445       20
## 3188           4175 2019-03-21         4   3448       32
## 3189           4175 2018-11-09         4   3447       34
## 3190           4176 2018-09-05         4   3449       71
## 3191           4176 2019-06-17         4   3452       30
## 3192           4176 2019-04-21         4   3451       36
## 3193           4176 2018-11-13         4   3450       88
## 3194           4177 2019-04-15         4   3459       62
## 3195           4177 2019-05-16         4   3460       68
## 3196           4177 2018-08-02         4   3453       34
## 3197           4177 2018-10-16         4   3455       42
## 3198           4177 2018-12-27         4   3456       75
## 3199           4177 2019-01-08         4   3457       17
## 3200           4177 2019-02-20         4   3458       30
## 3201           4177 2018-08-24         4   3454       77
## 3202           4178 2019-06-14         4   3463       31
## 3203           4178 2018-10-26         4   3461       71
## 3204           4178 2019-04-24         4   3462       52
## 3205           4178 2019-06-17         4   3464       89
## 3206           4179 2019-04-01         4   3468       88
## 3207           4179 2018-12-19         4   3467       24
## 3208           4179 2018-08-05         4   3465       78
## 3209           4179 2018-09-13         4   3466       30
## 3210           4180 2019-02-08         4   3470      104
## 3211           4180 2019-01-07         4   3469       51
## 3212           4180 2019-05-02         4   3471       28
## 3213           4181 2018-12-26         4   3472       62
## 3214           4182 2019-05-10         4   3473        4
## 3215           4183 2018-12-11         4   3476       88
## 3216           4183 2018-09-26         4   3474      113
## 3217           4183 2019-02-21         4   3478       70
## 3218           4184 2018-08-23         4   3480       14
## 3219           4184 2018-09-30         4   3481       93
## 3220           4184 2018-07-01         4   3479       50
## 3221           4184 2019-06-20         4   3483       32
## 3222           4184 2019-05-17         4   3482       52
## 3223           4185 2019-05-15         4   3486      112
## 3224           4185 2019-02-05         4   3484       89
## 3225           4185 2019-02-12         4   3485       93
## 3226           4186 2019-04-26         4   3489       99
## 3227           4186 2018-07-11         4   3487       47
## 3228           4186 2019-04-28         4   3490       74
## 3229           4186 2019-05-06         4   3491       47
## 3230           4186 2019-02-04         4   3488       32
## 3231           4187 2018-08-18         4   3492       89
## 3232           4187 2019-04-13         4   3494       77
## 3233           4188 2019-04-14         4   3500       30
## 3234           4188 2019-02-09         4   3499       34
## 3235           4188 2018-12-29         4   3498       75
## 3236           4188 2018-12-13         4   3497       99
## 3237           4189 2018-09-30         4   3505       17
## 3238           4189 2018-12-28         4   3508       68
## 3239           4189 2018-08-21         4   3502       77
## 3240           4189 2018-09-15         4   3504       42
## 3241           4189 2018-08-28         4   3503      104
## 3242           4189 2018-10-15         4   3506       33
## 3243           4189 2018-08-03         4   3501       62
## 3244           4190 2019-01-14         4   3509      102
## 3245           4191 2018-07-02         4   3510      114
## 3246           4191 2018-12-12         4   3512       71
## 3247           4191 2018-08-18         4   3511       44
## 3248           4191 2019-06-04         4   3514       17
## 3249           4192 2019-05-10         4   3523       23
## 3250           4192 2018-12-04         4   3518       70
## 3251           4192 2019-06-22         4   3524        2
## 3252           4192 2018-12-05         4   3519       31
## 3253           4192 2018-09-12         4   3516       31
## 3254           4192 2018-09-28         4   3517      104
## 3255           4192 2019-04-11         4   3522        2
## 3256           4192 2019-01-25         4   3521       28
## 3257           4192 2018-07-19         4   3515       44
## 3258           4193 2019-02-16         4   3527        7
## 3259           4193 2018-08-07         4   3525       51
## 3260           4193 2019-01-17         4   3526        2
## 3261           4193 2019-02-23         4   3528      112
## 3262           4194 2018-12-21         4   3530       99
## 3263           4194 2019-01-16         4   3531       77
## 3264           4194 2018-10-19         4   3529       51
## 3265           4195 2018-10-04         4   3533       78
## 3266           4195 2019-04-27         4   3535        7
## 3267           4195 2018-10-01         4   3532       20
## 3268           4196 2019-05-16         4   3539       24
## 3269           4196 2018-11-30         4   3537       93
## 3270           4196 2019-01-14         4   3538       60
## 3271           4196 2019-06-30         4   3540       28
## 3272           4197 2018-07-12         4   3541      108
## 3273           4197 2018-12-10         4   3543        3
## 3274           4197 2018-12-12         4   3544       34
## 3275           4197 2018-08-01         4   3542       93
## 3276           4197 2019-06-15         4   3545      108
## 3277           4198 2018-08-05         4   3546        3
## 3278           4198 2019-06-23         4   3549       14
## 3279           4198 2018-12-08         4   3547       63
## 3280           4199 2019-03-20         4   3550       47
## 3281           4200 2019-04-04         4   3554       26
## 3282           4200 2019-01-01         4   3553       46
## 3283           4200 2018-12-27         4   3552       23
## 3284           4200 2018-08-28         4   3551       34
## 3285           4201 2019-06-21         4   3558       89
## 3286           4201 2018-07-29         4   3555       23
## 3287           4201 2019-04-27         4   3557       50
## 3288           4201 2019-03-02         4   3556       23
## 3289           4202 2018-09-26         4   3561        9
## 3290           4202 2018-11-17         4   3562       33
## 3291           4202 2018-08-29         4   3560      108
## 3292           4202 2018-08-18         4   3559       28
## 3293           4203 2018-08-22         4   3563       77
## 3294           4203 2019-01-02         4   3565       14
## 3295           4203 2018-10-13         4   3564       16
## 3296           4203 2019-04-25         4   3566       71
## 3297           4204 2018-07-15         4   3567       36
## 3298           4204 2019-06-08         4   3570       31
## 3299           4204 2019-02-24         4   3569       71
## 3300           4204 2018-12-03         4   3568       20
## 3301           4205 2018-10-09         4   3571       87
## 3302           4205 2019-02-28         4   3572        4
## 3303           4206 2018-10-01         4   3573       33
## 3304           4206 2019-03-09         4   3575       68
## 3305           4206 2019-05-01         4   3576       52
## 3306           4206 2018-11-30         4   3574       26
## 3307           4207 2019-03-17         4   3584       62
## 3308           4207 2018-08-04         4   3579      112
## 3309           4207 2018-07-25         4   3578       30
## 3310           4207 2018-11-18         4   3582        3
## 3311           4207 2019-01-23         4   3583       87
## 3312           4207 2018-08-31         4   3581       77
## 3313           4207 2018-07-02         4   3577       93
## 3314           4207 2018-08-13         4   3580       87
## 3315           4208 2018-07-05         4   3585       71
## 3316           4208 2018-11-05         4   3587      114
## 3317           4208 2019-01-16         4   3592        2
## 3318           4208 2019-05-21         4   3594       14
## 3319           4208 2018-11-12         4   3589       70
## 3320           4208 2019-01-02         4   3591       26
## 3321           4208 2019-03-19         4   3593       51
## 3322           4208 2018-11-07         4   3588       36
## 3323           4208 2018-07-21         4   3586       23
## 3324           4209 2019-01-22         4   3601       46
## 3325           4209 2018-10-22         4   3596       68
## 3326           4209 2019-01-11         4   3600       17
## 3327           4209 2019-01-08         4   3599       50
## 3328           4209 2018-12-13         4   3597      108
## 3329           4209 2018-08-26         4   3595       62
## 3330           4209 2018-12-17         4   3598        9
## 3331           4210 2018-09-05         4   3603       42
## 3332           4210 2018-10-02         4   3604       16
## 3333           4211 2019-03-13         4   3609       44
## 3334           4211 2018-12-24         4   3607       17
## 3335           4211 2019-02-27         4   3608       60
## 3336           4212 2018-09-05         4   3611       26
## 3337           4212 2018-08-02         4   3610       15
## 3338           4212 2019-03-12         4   3612       14
## 3339           4212 2019-03-27         4   3613       33
## 3340           4213 2018-07-14         4   3614        3
## 3341           4214 2018-08-29         4   3615       42
## 3342           4214 2018-11-17         4   3616       28
## 3343           4214 2019-03-04         4   3617      109
## 3344           4214 2019-03-10         4   3618       75
## 3345           4215 2019-04-06         4   3624       42
## 3346           4215 2018-08-21         4   3620       49
## 3347           4215 2018-09-12         4   3621       74
## 3348           4215 2019-01-05         4   3623       24
## 3349           4216 2018-11-07         4   3628       74
## 3350           4216 2019-01-27         4   3629       88
## 3351           4216 2018-07-05         4   3627       50
## 3352           4216 2018-07-01         4   3625        3
## 3353           4216 2018-07-03         4   3626       90
## 3354           4217 2019-01-05         4   3631       90
## 3355           4217 2018-08-14         4   3630       87
## 3356           4217 2019-06-08         4   3633      109
## 3357           4217 2019-02-23         4   3632       47
## 3358           4218 2019-01-02         4   3638       90
## 3359           4218 2019-02-14         4   3639       33
## 3360           4218 2018-10-25         4   3636       26
## 3361           4218 2018-09-20         4   3635       28
## 3362           4218 2018-07-08         4   3634      109
## 3363           4218 2019-03-12         4   3640       47
## 3364           4219 2018-12-14         4   3643      114
## 3365           4219 2019-06-22         4   3648       46
## 3366           4219 2019-01-17         4   3645       25
## 3367           4219 2019-01-15         4   3644      109
## 3368           4219 2018-09-14         4   3642       47
## 3369           4219 2019-06-07         4   3647       89
## 3370           4219 2018-07-02         4   3641       77
## 3371           4219 2019-05-21         4   3646       52
## 3372           4220 2019-01-03         4   3652        4
## 3373           4220 2018-08-24         4   3650       26
## 3374           4220 2019-01-17         4   3653       30
## 3375           4220 2019-03-26         4   3654       33
## 3376           4220 2019-05-27         4   3655       16
## 3377           4220 2018-12-09         4   3651       77
## 3378           4221 2019-05-23         4   3659        7
## 3379           4221 2018-08-01         4   3656        2
## 3380           4221 2019-05-19         4   3658       81
## 3381           4221 2018-11-19         4   3657        9
## 3382           4221 2019-06-24         4   3660       81
## 3383           4222 2019-03-10         4   3661       88
## 3384           4223 2019-06-13         4   3664       89
## 3385           4223 2018-12-27         4   3662       75
## 3386           4225 2019-03-21         4   3667       42
## 3387           4225 2019-01-25         4   3666       90
## 3388           4225 2018-07-06         4   3665       75
## 3389           4226 2018-12-02         4   3670       90
## 3390           4226 2019-04-25         4   3675       20
## 3391           4226 2019-01-14         4   3673       51
## 3392           4226 2018-10-01         4   3668       31
## 3393           4226 2019-06-29         4   3676       44
## 3394           4226 2018-10-03         4   3669       78
## 3395           4226 2019-01-13         4   3672       50
## 3396           4226 2018-12-18         4   3671       32
## 3397           4226 2019-03-22         4   3674       36
## 3398           4227 2018-07-14         4   3677      102
## 3399           4227 2018-07-29         4   3678      108
## 3400           4227 2018-08-15         4   3680      109
## 3401           4228 2019-06-09         4   3686       77
## 3402           4228 2019-04-18         4   3685       42
## 3403           4228 2018-07-25         4   3682      112
## 3404           4228 2018-09-13         4   3683       15
## 3405           4228 2018-07-07         4   3681       44
## 3406           4229 2019-06-09         4   3688       62
## 3407           4229 2018-10-14         4   3687       74
## 3408           4230 2018-09-03         4   3689       47
## 3409           4230 2019-05-12         4   3692       33
## 3410           4230 2019-04-23         4   3691       68
## 3411           4230 2018-10-03         4   3690       23
## 3412           4231 2018-12-12         4   3694       31
## 3413           4231 2019-03-30         4   3695      102
## 3414           4231 2019-05-12         4   3696       14
## 3415           4231 2018-08-05         4   3693       71
## 3416           4231 2019-06-13         4   3697       74
## 3417           4232 2018-08-28         4   3698       14
## 3418           4232 2019-01-30         4   3700        4
## 3419           4232 2018-08-28         4   3698       17
## 3420           4233 2018-09-08         4   3704       88
## 3421           4233 2018-11-18         4   3708      112
## 3422           4233 2018-09-29         4   3706       14
## 3423           4233 2018-07-08         4   3701      109
## 3424           4233 2018-09-27         4   3705       75
## 3425           4233 2019-01-06         4   3709       88
## 3426           4233 2018-09-07         4   3703      114
## 3427           4233 2019-02-18         4   3710       33
## 3428           4233 2019-06-14         4   3711       75
## 3429           4233 2018-07-21         4   3702       46
## 3430           4233 2018-11-07         4   3707       99
## 3431           4233 2018-09-29         4   3706       93
## 3432           4234 2018-08-20         4   3713       71
## 3433           4234 2019-04-03         4   3714       62
## 3434           4234 2018-07-24         4   3712       30
## 3435           4235 2018-11-21         4   3715       52
## 3436           4235 2018-12-10         4   3716       70
## 3437           4235 2019-01-19         4   3717       62
## 3438           4236 2018-07-25         4   3718       50
## 3439           4236 2019-02-20         4   3721       30
## 3440           4236 2019-03-06         4   3722       99
## 3441           4237 2019-04-29         4   3726      104
## 3442           4237 2019-02-15         4   3724       62
## 3443           4237 2019-03-10         4   3725       28
## 3444           4238 2018-07-02         4   3727       24
## 3445           4238 2018-09-27         4   3728       34
## 3446           4238 2018-11-19         4   3729      112
## 3447           4238 2019-02-18         4   3731       70
## 3448           4238 2019-03-14         4   3732       75
## 3449           4238 2019-06-03         4   3734       28
## 3450           4238 2019-03-15         4   3733       63
## 3451           4239 2018-11-29         4   3737       52
## 3452           4239 2018-09-28         4   3735       34
## 3453           4239 2018-10-31         4   3736       44
## 3454           4239 2019-02-17         4   3738       52
## 3455           4240 2018-12-22         4   3742       63
## 3456           4240 2018-10-22         4   3741       63
## 3457           4240 2019-04-04         4   3746      112
## 3458           4240 2018-10-06         4   3740      108
## 3459           4240 2019-06-10         4   3747        9
## 3460           4240 2018-12-31         4   3743       36
## 3461           4240 2019-01-24         4   3744        2
## 3462           4240 2018-09-24         4   3739       60
## 3463           4241 2018-07-18         4   3748       51
## 3464           4241 2018-11-30         4   3749       60
## 3465           4242 2019-06-15         4   3750       63
## 3466           4243 2019-02-11         4   3754       99
## 3467           4243 2018-12-28         4   3753       25
## 3468           4243 2018-09-02         4   3752       77
## 3469           4243 2018-07-06         4   3751       16
## 3470           4244 2018-08-04         4   3755      113
## 3471           4244 2019-04-18         4   3760       42
## 3472           4244 2019-01-01         4   3757       42
## 3473           4244 2019-02-06         4   3758       33
## 3474           4244 2018-12-08         4   3756       36
## 3475           4245 2018-09-06         4   3762        7
## 3476           4245 2019-03-02         4   3765       47
## 3477           4245 2018-10-02         4   3763       15
## 3478           4245 2019-04-01         4   3766       60
## 3479           4245 2018-08-05         4   3761       26
## 3480           4245 2019-06-29         4   3767       75
## 3481           4245 2018-10-16         4   3764      104
## 3482           4246 2019-06-21         4   3772       63
## 3483           4246 2018-12-29         4   3769       51
## 3484           4246 2018-07-05         4   3768       93
## 3485           4246 2019-03-20         4   3771        7
## 3486           4246 2019-03-12         4   3770       52
## 3487           4247 2019-04-26         4   3776       88
## 3488           4247 2018-07-26         4   3774       16
## 3489           4247 2018-07-01         4   3773       23
## 3490           4247 2018-09-15         4   3775       42
## 3491           4248 2019-02-28         4   3779       47
## 3492           4248 2018-07-26         4   3778       28
## 3493           4249 2018-11-13         4   3780       26
## 3494           4250 2018-07-28         4   3781       14
## 3495           4250 2018-08-09         4   3782       81
## 3496           4250 2018-11-16         4   3784       15
## 3497           4250 2019-05-28         4   3786       68
## 3498           4250 2018-08-12         4   3783       60
## 3499           4250 2019-06-19         4   3787       89
## 3500           4250 2019-03-05         4   3785       99
## 3501           4251 2019-05-17         4   3790       68
## 3502           4251 2019-06-03         4   3791       81
## 3503           4251 2019-01-31         4   3789       36
## 3504           4252 2019-01-02         4   3793       81
## 3505           4252 2018-10-04         4   3792        3
## 3506           4252 2019-01-02         4   3793      112
## 3507           4252 2019-04-03         4   3794       14
## 3508           4252 2019-05-07         4   3795       75
## 3509           4253 2018-07-24         4   3796       81
## 3510           4253 2019-06-07         4   3799       62
## 3511           4253 2018-10-02         4   3797      108
## 3512           4253 2019-01-30         4   3798      104
## 3513           4254 2018-11-17         4   3800       30
## 3514           4254 2019-04-01         4   3801       93
## 3515           4255 2018-09-27         4   3803        4
## 3516           4255 2018-08-28         4   3802       87
## 3517           4255 2019-02-05         4   3806       75
## 3518           4255 2018-12-08         4   3804       77
## 3519           4255 2019-04-05         4   3807       63
## 3520           4255 2019-04-18         4   3808       33
## 3521           4256 2019-04-04         4   3812       89
## 3522           4256 2018-07-07         4   3809       68
## 3523           4256 2018-10-27         4   3810       89
## 3524           4256 2019-03-26         4   3811       25
## 3525           4257 2019-05-13         4   3814       42
## 3526           4257 2019-03-04         4   3813        4
## 3527           4258 2019-04-07         4   3820       74
## 3528           4258 2018-10-03         4   3816       50
## 3529           4258 2019-01-13         4   3818       17
## 3530           4258 2019-02-26         4   3819       32
## 3531           4258 2018-10-27         4   3817       30
## 3532           4258 2018-08-19         4   3815      113
## 3533           4259 2018-09-15         4   3821       74
## 3534           4259 2019-06-12         4   3822       33
## 3535           4260 2018-07-19         4   3823       51
## 3536           4260 2019-01-18         4   3825       31
## 3537           4260 2019-03-27         4   3826       62
## 3538           4260 2019-06-03         4   3827       44
## 3539           4261 2018-07-03         4   3828       81
## 3540           4261 2019-05-11         4   3830       89
## 3541           4261 2019-06-30         4   3831       68
## 3542           4262 2019-05-29         4   3833       52
## 3543           4262 2018-09-07         4   3832       75
## 3544           4262 2019-06-20         4   3834       88
## 3545           4263 2018-08-03         4   3835        2
## 3546           4263 2018-09-26         4   3836       77
## 3547           4263 2018-10-20         4   3837       51
## 3548           4264 2019-03-07         4   3840        2
## 3549           4264 2019-05-19         4   3841       47
## 3550           4264 2018-10-14         4   3839       40
## 3551           4264 2018-07-30         4   3838      109
## 3552           4265 2018-08-02         4   3842      108
## 3553           4265 2018-12-05         4   3844       24
## 3554           4265 2018-09-19         4   3843       32
## 3555           4265 2018-12-11         4   3845       63
## 3556           4265 2019-05-06         4   3846       42
## 3557           4266 2019-01-22         4   3852       87
## 3558           4266 2018-12-22         4   3850       28
## 3559           4266 2018-10-13         4   3849      113
## 3560           4266 2019-06-15         4   3854       47
## 3561           4266 2019-03-31         4   3853       32
## 3562           4266 2018-07-27         4   3847       51
## 3563           4266 2018-10-08         4   3848        7
## 3564           4266 2018-12-27         4   3851       51
## 3565           4267 2018-08-25         4   3855       25
## 3566           4267 2019-02-25         4   3858       30
## 3567           4267 2019-03-01         4   3859       15
## 3568           4267 2018-12-05         4   3857      102
## 3569           4267 2019-04-12         4   3860        3
## 3570           4267 2018-11-29         4   3856      102
## 3571           4268 2018-11-30         4   3862       33
## 3572           4268 2018-09-17         4   3861        3
## 3573           4269 2019-04-19         4   3866       42
## 3574           4269 2018-09-14         4   3864      104
## 3575           4269 2018-09-04         4   3863       90
## 3576           4269 2018-09-04         4   3863       16
## 3577           4270 2019-01-02         4   3869       26
## 3578           4270 2019-04-19         4   3871       40
## 3579           4270 2019-06-13         4   3872       30
## 3580           4270 2018-12-10         4   3868       49
## 3581           4270 2018-08-11         4   3867       31
## 3582           4272 2018-07-13         4   3875      113
## 3583           4272 2018-10-03         4   3876        3
## 3584           4273 2018-09-27         4   3877       93
## 3585           4274 2018-07-05         4   3878       93
## 3586           4274 2019-05-11         4   3882       46
## 3587           4274 2019-04-04         4   3880       49
## 3588           4274 2019-06-09         4   3883       68
## 3589           4274 2018-11-13         4   3879       52
## 3590           4274 2019-04-11         4   3881       26
## 3591           4275 2018-10-11         4   3884       23
## 3592           4275 2018-11-22         4   3886       88
## 3593           4276 2018-10-28         4   3890       81
## 3594           4276 2018-10-17         4   3889       93
## 3595           4277 2019-06-21         4   3897       40
## 3596           4277 2018-12-19         4   3894       33
## 3597           4277 2018-08-23         4   3892       81
## 3598           4277 2018-10-07         4   3893       30
## 3599           4277 2019-03-03         4   3896       36
## 3600           4277 2018-12-27         4   3895       87
## 3601           4278 2019-01-13         4   3898       30
## 3602           4278 2019-05-05         4   3900       68
## 3603           4278 2019-03-13         4   3899       52
## 3604           4279 2018-10-31         4   3903        2
## 3605           4279 2018-08-29         4   3901       33
## 3606           4279 2018-12-30         4   3904       70
## 3607           4279 2018-10-30         4   3902       81
## 3608           4280 2019-06-15         4   3912      102
## 3609           4280 2019-06-02         4   3911       88
## 3610           4280 2018-12-20         4   3907       30
## 3611           4280 2019-03-04         4   3910       34
## 3612           4280 2019-02-08         4   3909       93
## 3613           4280 2019-01-14         4   3908      113
## 3614           4280 2018-07-03         4   3905       32
## 3615           4281 2018-10-30         4   3914       52
## 3616           4281 2019-04-04         4   3915       89
## 3617           4281 2019-05-17         4   3916      108
## 3618           4281 2018-08-24         4   3913       93
## 3619           4282 2019-06-20         4   3919       33
## 3620           4282 2019-05-03         4   3917       87
## 3621           4282 2019-05-16         4   3918       60
## 3622           4283 2018-10-03         4   3921       90
## 3623           4283 2018-07-03         4   3920       90
## 3624           4283 2019-06-23         4   3928       44
## 3625           4283 2019-04-24         4   3926       89
## 3626           4283 2019-03-20         4   3924       42
## 3627           4283 2019-05-23         4   3927       47
## 3628           4283 2019-01-11         4   3923        7
## 3629           4283 2018-07-03         4   3920      109
## 3630           4283 2019-03-26         4   3925        2
## 3631           4284 2018-10-20         4   3930       71
## 3632           4284 2018-10-22         4   3931       87
## 3633           4284 2018-12-01         4   3932       15
## 3634           4285 2018-09-04         4   3933       50
## 3635           4285 2018-10-10         4   3934       44
## 3636           4285 2018-10-14         4   3935       77
## 3637           4285 2019-06-10         4   3939       74
## 3638           4285 2019-05-19         4   3938       24
## 3639           4285 2019-05-18         4   3937       77
## 3640           4286 2019-05-31         4   3945      112
## 3641           4286 2019-04-18         4   3943       31
## 3642           4286 2018-11-02         4   3942       89
## 3643           4286 2019-05-02         4   3944        2
## 3644           4286 2018-08-31         4   3941       46
## 3645           4287 2019-04-30         4   3950      109
## 3646           4287 2018-12-18         4   3949       33
## 3647           4287 2018-09-14         4   3946       60
## 3648           4287 2018-10-06         4   3947       99
## 3649           4288 2018-08-26         4   3951       47
## 3650           4288 2019-03-09         4   3953       16
## 3651           4288 2019-04-03         4   3954       34
## 3652           4288 2019-04-19         4   3955       31
## 3653           4288 2019-02-04         4   3952       44
## 3654           4289 2019-04-25         4   3957       90
## 3655           4291 2018-09-05         4   3958       81
## 3656           4291 2019-01-07         4   3959      104
## 3657           4291 2019-05-26         4   3962      109
## 3658           4291 2019-04-19         4   3960       32
## 3659           4291 2019-05-25         4   3961       51
## 3660           4292 2019-01-18         4   3964       75
## 3661           4292 2019-01-27         4   3965      108
## 3662           4292 2019-03-03         4   3966        3
## 3663           4293 2019-06-29         4   3967       51
## 3664           4294 2019-02-26         4   3972       33
## 3665           4294 2019-06-26         4   3973       23
## 3666           4294 2018-10-26         4   3970       42
## 3667           4294 2018-09-17         4   3969        7
## 3668           4294 2019-02-07         4   3971       31
## 3669           4294 2018-07-16         4   3968       87
## 3670           4295 2019-04-04         4   3974       89
## 3671           4295 2019-05-14         4   3976       81
## 3672           4295 2019-05-06         4   3975        4
## 3673           4296 2019-04-27         4   3980       14
## 3674           4296 2018-08-18         4   3977      108
## 3675           4296 2019-02-12         4   3978       90
## 3676           4297 2018-12-18         4   3983      108
## 3677           4297 2018-08-06         4   3981       44
## 3678           4297 2018-12-10         4   3982       23
## 3679           4298 2018-10-15         4   3985       28
## 3680           4298 2018-11-13         4   3986       36
## 3681           4298 2019-04-17         4   3988       23
## 3682           4298 2018-11-22         4   3987      112
## 3683           4298 2018-07-23         4   3984       36
## 3684           4298 2019-05-21         4   3989       70
## 3685           4299 2018-07-19         4   3991      104
## 3686           4299 2019-01-03         4   3995       74
## 3687           4299 2018-11-30         4   3994       81
## 3688           4299 2018-07-10         4   3990       87
## 3689           4299 2019-03-17         4   3996       23
## 3690           4299 2018-08-02         4   3992       63
## 3691           4299 2018-09-23         4   3993       71
## 3692           4300 2019-06-03         4   4002      104
## 3693           4300 2018-11-18         4   4000       20
## 3694           4300 2018-10-21         4   3998      104
## 3695           4300 2018-10-28         4   3999       62
## 3696           4300 2018-07-26         4   3997        3
## 3697           4300 2019-04-26         4   4001      102
## 3698           4301 2018-11-12         4   4006       68
## 3699           4301 2018-09-23         4   4005       90
## 3700           4301 2019-06-06         4   4008       46
## 3701           4301 2018-07-24         4   4003        4
## 3702           4301 2019-01-26         4   4007       25
## 3703           4301 2018-09-16         4   4004      108
## 3704           4302 2018-11-25         4   4011      102
## 3705           4302 2018-08-07         4   4010       25
## 3706           4302 2019-03-13         4   4015       42
## 3707           4302 2018-12-18         4   4012       33
## 3708           4302 2018-07-05         4   4009       42
## 3709           4302 2019-02-27         4   4014      114
## 3710           4303 2018-07-23         4   4017      113
## 3711           4303 2018-07-17         4   4016       68
## 3712           4303 2018-11-12         4   4019        2
## 3713           4303 2019-02-01         4   4021       24
## 3714           4303 2018-09-09         4   4018       40
## 3715           4303 2019-01-18         4   4020       25
## 3716           4304 2018-11-17         4   4023       31
## 3717           4304 2019-01-04         4   4025       52
## 3718           4304 2019-05-17         4   4027       40
## 3719           4304 2019-03-19         4   4026       26
## 3720           4304 2018-07-13         4   4022       33
## 3721           4305 2019-04-15         4   4033      104
## 3722           4305 2019-01-18         4   4030       47
## 3723           4305 2019-04-22         4   4034       49
## 3724           4305 2018-11-09         4   4029       99
## 3725           4305 2019-03-26         4   4032       17
## 3726           4305 2018-10-02         4   4028       68
## 3727           4305 2019-02-04         4   4031       32
## 3728           4306 2018-09-01         4   4036       25
## 3729           4306 2018-07-20         4   4035       16
## 3730           4307 2018-11-02         4   4038       14
## 3731           4307 2019-01-25         4   4040       60
## 3732           4308 2019-02-02         4   4045       40
## 3733           4308 2019-01-07         4   4044       75
## 3734           4308 2019-03-13         4   4046        4
## 3735           4308 2018-09-27         4   4041      112
## 3736           4309 2018-11-13         4   4051        3
## 3737           4309 2018-07-28         4   4048       24
## 3738           4309 2018-08-01         4   4049      108
## 3739           4309 2018-07-23         4   4047       28
## 3740           4309 2018-08-30         4   4050       68
## 3741           4310 2018-07-30         4   4052       70
## 3742           4311 2019-04-08         4   4054       62
## 3743           4311 2019-02-23         4   4053       40
## 3744           4311 2019-06-02         4   4056       25
## 3745           4312 2018-07-15         4   4057       40
## 3746           4312 2019-06-14         4   4064      108
## 3747           4312 2019-05-05         4   4062       26
## 3748           4312 2019-06-08         4   4063       88
## 3749           4312 2018-11-16         4   4058      112
## 3750           4312 2019-02-12         4   4060       75
## 3751           4312 2019-05-03         4   4061       14
## 3752           4312 2018-12-19         4   4059        9
## 3753           4313 2019-02-13         4   4067      109
## 3754           4313 2019-01-04         4   4066       87
## 3755           4314 2019-01-28         4   4072       24
## 3756           4314 2019-03-11         4   4073       25
## 3757           4314 2018-10-13         4   4071       62
## 3758           4314 2018-07-05         4   4068       20
## 3759           4314 2018-09-06         4   4070       40
## 3760           4314 2018-08-25         4   4069       34
## 3761           4315 2019-05-11         4   4076       25
## 3762           4315 2019-04-28         4   4075      112
## 3763           4315 2018-11-26         4   4074       25
## 3764           4316 2019-03-12         4   4080        3
## 3765           4316 2019-05-23         4   4082       42
## 3766           4316 2019-05-21         4   4081        9
## 3767           4316 2019-01-19         4   4079      104
## 3768           4316 2019-06-14         4   4083       30
## 3769           4316 2018-12-03         4   4078       25
## 3770           4316 2018-08-22         4   4077       99
## 3771           4317 2018-09-08         4   4086       89
## 3772           4317 2019-03-26         4   4088        4
## 3773           4317 2019-01-24         4   4087        4
## 3774           4317 2018-08-02         4   4084       89
## 3775           4317 2018-08-11         4   4085      113
## 3776           4318 2018-11-18         4   4090       42
## 3777           4318 2018-10-20         4   4089        3
## 3778           4319 2019-03-20         4   4093       63
## 3779           4319 2018-10-27         4   4092       74
## 3780           4319 2019-06-21         4   4095       24
## 3781           4319 2019-04-23         4   4094       88
## 3782           4320 2019-06-07         4   4098        3
## 3783           4320 2019-04-09         4   4097       49
## 3784           4320 2018-09-06         4   4096       20
## 3785           4321 2018-08-22         4   4100       77
## 3786           4321 2019-06-11         4   4105       75
## 3787           4321 2018-10-27         4   4103       62
## 3788           4321 2018-10-18         4   4102       77
## 3789           4321 2018-07-27         4   4099        2
## 3790           4321 2019-05-03         4   4104       87
## 3791           4321 2018-09-09         4   4101       25
## 3792           4322 2019-03-24         4   4109      112
## 3793           4322 2018-09-10         4   4108       30
## 3794           4322 2018-08-17         4   4107       24
## 3795           4323 2018-11-25         4   4115       90
## 3796           4323 2019-04-10         4   4117      108
## 3797           4323 2018-07-09         4   4111        3
## 3798           4323 2018-07-11         4   4112       31
## 3799           4323 2018-09-17         4   4113       14
## 3800           4323 2018-10-01         4   4114       14
## 3801           4324 2019-01-10         4   4120       70
## 3802           4324 2019-06-18         4   4125        9
## 3803           4324 2018-11-24         4   4118        9
## 3804           4324 2019-05-31         4   4124      113
## 3805           4324 2018-11-30         4   4119      108
## 3806           4324 2019-02-13         4   4121       93
## 3807           4324 2019-02-28         4   4122       46
## 3808           4324 2019-05-14         4   4123       62
## 3809           4325 2019-03-29         4   4126        9
## 3810           4326 2018-11-24         4   4128       50
## 3811           4326 2018-10-09         4   4127       46
## 3812           4326 2019-06-16         4   4131       49
## 3813           4326 2019-05-12         4   4130       88
## 3814           4326 2019-01-02         4   4129      109
## 3815           4327 2018-12-24         4   4135       81
## 3816           4327 2018-09-07         4   4133       90
## 3817           4327 2019-03-23         4   4137       32
## 3818           4327 2018-08-21         4   4132       60
## 3819           4327 2018-10-03         4   4134      113
## 3820           4328 2018-08-31         4   4138       26
## 3821           4328 2019-05-06         4   4141       99
## 3822           4328 2018-10-15         4   4139       32
## 3823           4328 2018-12-11         4   4140      102
## 3824           4329 2019-02-27         4   4146        3
## 3825           4329 2018-11-04         4   4145       71
## 3826           4329 2018-09-24         4   4143       71
## 3827           4329 2018-10-07         4   4144       89
## 3828           4330 2018-12-01         4   4148       88
## 3829           4330 2018-08-11         4   4147       20
## 3830           4330 2018-12-22         4   4149       33
## 3831           4331 2018-10-21         4   4151       31
## 3832           4331 2019-05-19         4   4154      108
## 3833           4331 2019-01-01         4   4153        9
## 3834           4331 2018-08-08         4   4150      114
## 3835           4332 2019-02-22         4   4155       26
## 3836           4333 2019-06-03         4   4159       81
## 3837           4333 2018-12-27         4   4156       17
## 3838           4333 2019-05-27         4   4158      113
## 3839           4334 2018-09-05         4   4160       99
## 3840           4334 2019-03-17         4   4164       52
## 3841           4334 2018-10-15         4   4161      109
## 3842           4334 2019-06-16         4   4165       14
## 3843           4334 2019-01-21         4   4163       15
## 3844           4334 2019-01-12         4   4162       44
## 3845           4335 2018-12-07         4   4167       28
## 3846           4335 2018-07-03         4   4166       42
## 3847           4336 2019-01-08         4   4170       63
## 3848           4336 2018-07-16         4   4168      113
## 3849           4336 2019-05-22         4   4171      109
## 3850           4337 2019-04-28         4   4174      108
## 3851           4337 2018-09-23         4   4172       15
## 3852           4337 2018-10-10         4   4173       49
## 3853           4338 2018-12-26         4   4178        7
## 3854           4338 2018-07-15         4   4175       52
## 3855           4338 2018-10-17         4   4177       93
## 3856           4338 2019-02-02         4   4180       20
## 3857           4338 2019-01-27         4   4179       36
## 3858           4338 2019-03-23         4   4181      113
## 3859           4339 2018-11-14         4   4183       87
## 3860           4339 2018-09-18         4   4182       31
## 3861           4340 2018-08-26         4   4185       90
## 3862           4340 2018-12-16         4   4188       34
## 3863           4340 2019-06-04         4   4189        9
## 3864           4340 2018-10-06         4   4186       78
## 3865           4340 2018-12-03         4   4187      112
## 3866           4341 2018-11-03         4   4192       20
## 3867           4341 2018-07-27         4   4190        3
## 3868           4341 2018-08-29         4   4191       70
## 3869           4342 2019-06-04         4   4202       74
## 3870           4342 2018-12-26         4   4198       33
## 3871           4342 2018-12-06         4   4196       81
## 3872           4342 2018-07-23         4   4194       40
## 3873           4342 2019-02-18         4   4200       63
## 3874           4342 2018-12-20         4   4197       90
## 3875           4342 2018-09-10         4   4195       74
## 3876           4342 2019-02-13         4   4199       47
## 3877           4342 2018-07-19         4   4193      114
## 3878           4342 2019-05-30         4   4201       24
## 3879           4343 2018-10-15         4   4204       77
## 3880           4343 2018-07-30         4   4203       42
## 3881           4344 2018-10-14         4   4207       50
## 3882           4345 2019-01-21         4   4210      112
## 3883           4345 2019-05-26         4   4212       49
## 3884           4345 2018-07-31         4   4208        7
## 3885           4345 2019-05-22         4   4211       62
## 3886           4345 2018-08-07         4   4209      108
## 3887           4346 2019-03-07         4   4213       90
## 3888           4346 2019-05-06         4   4215       23
## 3889           4346 2019-03-16         4   4214       32
## 3890           4346 2019-05-15         4   4216      113
## 3891           4347 2019-05-16         4   4220       14
## 3892           4347 2019-03-17         4   4219       34
## 3893           4347 2019-06-27         4   4221       15
## 3894           4347 2018-11-07         4   4218      109
## 3895           4347 2018-09-28         4   4217       16
## 3896           4348 2018-11-03         4   4222       93
## 3897           4348 2019-06-26         4   4224       46
## 3898           4348 2019-04-16         4   4223       74
## 3899           4349 2018-09-08         4   4226      112
## 3900           4349 2018-07-04         4   4225       15
## 3901           4349 2019-04-09         4   4228       44
## 3902           4349 2018-12-26         4   4227       52
## 3903           4350 2018-09-06         4   4230      108
## 3904           4350 2019-01-04         4   4233       40
## 3905           4350 2019-01-03         4   4232       26
## 3906           4350 2019-06-11         4   4234       52
## 3907           4350 2018-09-04         4   4229       44
## 3908           4350 2018-09-28         4   4231       68
## 3909           4351 2018-08-02         4   4236       23
## 3910           4351 2018-10-14         4   4238       51
## 3911           4351 2019-02-05         4   4240       24
## 3912           4351 2018-10-08         4   4237       63
## 3913           4351 2018-11-28         4   4239       75
## 3914           4352 2018-08-14         4   4241       49
## 3915           4352 2019-05-09         4   4244       23
## 3916           4352 2018-08-17         4   4242      109
## 3917           4353 2018-09-15         4   4246       40
## 3918           4353 2018-09-04         4   4245      102
## 3919           4353 2018-11-26         4   4247       23
## 3920           4354 2019-06-28         4   4252       40
## 3921           4354 2018-11-23         4   4249       52
## 3922           4354 2018-08-15         4   4248       71
## 3923           4355 2019-03-02         4   4254      114
## 3924           4356 2018-08-27         4   4255        3
## 3925           4356 2018-09-23         4   4256       33
## 3926           4356 2018-12-10         4   4257       20
## 3927           4356 2019-04-16         4   4258       78
## 3928           4357 2019-02-22         4   4263       34
## 3929           4357 2019-01-11         4   4262       14
## 3930           4357 2018-07-21         4   4260       33
## 3931           4357 2018-07-06         4   4259      109
## 3932           4358 2018-09-16         4   4264       77
## 3933           4358 2019-03-11         4   4267       49
## 3934           4358 2019-02-14         4   4266       44
## 3935           4358 2018-11-11         4   4265       36
## 3936           4359 2019-04-07         4   4273      113
## 3937           4359 2018-10-17         4   4271       77
## 3938           4359 2018-08-23         4   4269       90
## 3939           4359 2018-08-08         4   4268       75
## 3940           4359 2019-01-24         4   4272       30
## 3941           4359 2018-10-10         4   4270       52
## 3942           4360 2019-05-15         4   4275      109
## 3943           4360 2018-08-10         4   4274       87
## 3944           4361 2018-12-06         4   4276       17
## 3945           4361 2019-01-18         4   4277       30
## 3946           4361 2019-03-14         4   4278       34
## 3947           4362 2018-11-14         4   4279       51
## 3948           4362 2019-02-01         4   4281       77
## 3949           4362 2018-12-12         4   4280       30
## 3950           4363 2019-06-30         4   4287       87
## 3951           4363 2019-03-23         4   4284       40
## 3952           4363 2018-08-21         4   4282       28
## 3953           4363 2019-06-18         4   4286       15
## 3954           4364 2019-04-22         4   4289       20
## 3955           4364 2019-06-05         4   4290       25
## 3956           4364 2019-01-14         4   4288       90
## 3957           4365 2019-04-27         4   4293        2
## 3958           4365 2018-10-29         4   4292      108
## 3959           4365 2018-07-16         4   4291       15
## 3960           4366 2019-06-24         4   4296       14
## 3961           4366 2018-11-05         4   4295       77
## 3962           4366 2018-08-04         4   4294       20
## 3963           4367 2018-11-02         4   4297       42
## 3964           4368 2018-09-28         4   4298       99
## 3965           4368 2019-03-06         4   4302       50
## 3966           4368 2019-03-15         4   4303       68
## 3967           4368 2019-05-10         4   4304       14
## 3968           4368 2018-11-15         4   4299       90
## 3969           4368 2018-12-29         4   4300       81
## 3970           4368 2019-02-08         4   4301       31
## 3971           4369 2019-04-02         4   4309        3
## 3972           4369 2018-12-24         4   4307        9
## 3973           4369 2018-07-29         4   4306       40
## 3974           4369 2019-01-02         4   4308       33
## 3975           4369 2019-04-02         4   4309        2
## 3976           4369 2019-04-27         4   4310       23
## 3977           4369 2018-07-13         4   4305       52
## 3978           4370 2018-12-11         4   4312       36
## 3979           4370 2018-11-28         4   4311       71
## 3980           4370 2019-03-07         4   4314       30
## 3981           4370 2018-12-13         4   4313       77
## 3982           4371 2018-12-02         4   4315      108
## 3983           4371 2019-03-04         4   4317       60
## 3984           4371 2018-12-24         4   4316       78
## 3985           4372 2018-09-21         4   4318        3
## 3986           4372 2019-06-29         4   4319       36
## 3987           4373 2019-02-01         4   4320       17
## 3988           4373 2019-03-29         4   4321       33
## 3989           4373 2019-04-05         4   4322       75
## 3990           4374 2019-05-07         4   4324       62
## 3991           4375 2019-03-24         4   4329       88
## 3992           4375 2018-10-17         4   4325       31
## 3993           4375 2019-03-07         4   4328       71
## 3994           4375 2019-01-18         4   4327       78
## 3995           4376 2018-10-24         4   4334       71
## 3996           4376 2018-09-20         4   4331       77
## 3997           4376 2018-11-29         4   4335       15
## 3998           4376 2018-07-07         4   4330       40
## 3999           4376 2019-03-28         4   4337      114
## 4000           4376 2018-10-17         4   4333       88
## 4001           4376 2018-10-04         4   4332      108
## 4002           4376 2018-12-27         4   4336       17
## 4003           4377 2019-04-09         4   4344        2
## 4004           4377 2018-09-01         4   4339       15
## 4005           4377 2019-01-30         4   4342       32
## 4006           4377 2019-02-05         4   4343       44
## 4007           4377 2018-12-27         4   4340       74
## 4008           4377 2019-01-17         4   4341       36
## 4009           4377 2018-08-26         4   4338       26
## 4010           4378 2019-02-10         4   4348       42
## 4011           4378 2019-06-07         4   4350      108
## 4012           4378 2019-02-22         4   4349       34
## 4013           4378 2018-09-09         4   4346       68
## 4014           4378 2019-01-29         4   4347       74
## 4015           4379 2019-01-30         4   4352       32
## 4016           4379 2018-11-23         4   4351       74
## 4017           4379 2019-06-04         4   4353      104
## 4018           4380 2019-04-04         4   4355       93
## 4019           4380 2019-04-03         4   4354       62
## 4020           5000 2018-07-22         5   4356      111
## 4021           5000 2018-09-15         5   4359       15
## 4022           5000 2019-06-23         5   4363       24
## 4023           5000 2018-10-16         5   4360       10
## 4024           5000 2019-02-22         5   4362       92
## 4025           5000 2018-09-11         5   4358       86
## 4026           5000 2018-12-12         5   4361       72
## 4027           5001 2018-12-09         5   4366       46
## 4028           5001 2018-07-28         5   4364      111
## 4029           5001 2019-05-10         5   4369       37
## 4030           5001 2018-09-27         5   4365       34
## 4031           5001 2019-01-29         5   4367       15
## 4032           5001 2019-03-12         5   4368       56
## 4033           5002 2018-11-16         5   4370       78
## 4034           5002 2019-01-30         5   4374       31
## 4035           5002 2019-03-07         5   4377       10
## 4036           5002 2018-11-25         5   4373       91
## 4037           5002 2019-02-03         5   4375       81
## 4038           5002 2019-02-26         5   4376       28
## 4039           5002 2019-06-12         5   4378        6
## 4040           5002 2018-11-17         5   4371       23
## 4041           5002 2018-11-23         5   4372       29
## 4042           5003 2019-05-07         5   4382       27
## 4043           5003 2018-11-24         5   4381       31
## 4044           5003 2018-09-12         5   4380      108
## 4045           5003 2018-08-29         5   4379       20
## 4046           5004 2018-10-27         5   4383       60
## 4047           5004 2019-05-11         5   4389        9
## 4048           5004 2019-03-22         5   4387       24
## 4049           5004 2018-10-31         5   4384       60
## 4050           5004 2019-05-10         5   4388       10
## 4051           5005 2018-08-26         5   4391       69
## 4052           5005 2018-07-18         5   4390       84
## 4053           5005 2018-09-09         5   4392       27
## 4054           5005 2019-06-05         5   4394      107
## 4055           5005 2019-04-30         5   4393        5
## 4056           5006 2018-12-13         5   4397      114
## 4057           5006 2018-07-20         5   4395      111
## 4058           5006 2019-05-31         5   4401      113
## 4059           5006 2019-05-21         5   4400      112
## 4060           5006 2019-01-25         5   4398      112
## 4061           5006 2019-04-17         5   4399       21
## 4062           5006 2018-09-26         5   4396       87
## 4063           5007 2018-07-24         5   4402       12
## 4064           5007 2018-09-04         5   4405      114
## 4065           5007 2019-01-23         5   4408       13
## 4066           5007 2018-08-31         5   4404       50
## 4067           5007 2018-10-12         5   4406        2
## 4068           5007 2018-08-10         5   4403       42
## 4069           5007 2019-05-05         5   4409      107
## 4070           5007 2018-11-30         5   4407        5
## 4071           5008 2019-04-14         5   4411       60
## 4072           5008 2019-02-23         5   4410       48
## 4073           5008 2019-04-28         5   4412       96
## 4074           5009 2019-02-05         5   4417       28
## 4075           5009 2019-04-08         5   4419       30
## 4076           5009 2018-07-19         5   4413       13
## 4077           5009 2019-03-26         5   4418       26
## 4078           5009 2018-10-12         5   4415       81
## 4079           5009 2018-08-10         5   4414       94
## 4080           5009 2018-11-18         5   4416       93
## 4081           5010 2019-04-12         5   4426       24
## 4082           5010 2019-04-04         5   4425       61
## 4083           5010 2019-01-23         5   4424      102
## 4084           5010 2019-01-08         5   4423      103
## 4085           5010 2018-09-01         5   4421       93
## 4086           5010 2019-01-01         5   4422      113
## 4087           5011 2018-09-07         5   4428      106
## 4088           5011 2019-04-10         5   4431       31
## 4089           5011 2019-05-05         5   4433       88
## 4090           5011 2019-05-04         5   4432       25
## 4091           5011 2018-10-09         5   4429       67
## 4092           5011 2018-10-31         5   4430       49
## 4093           5011 2019-06-25         5   4434      109
## 4094           5012 2018-11-14         5   4437       48
## 4095           5012 2019-05-05         5   4441      114
## 4096           5012 2018-08-22         5   4436      100
## 4097           5012 2019-02-04         5   4440       93
## 4098           5012 2018-07-04         5   4435        3
## 4099           5012 2018-12-02         5   4438       16
## 4100           5013 2019-04-29         5   4443      104
## 4101           5013 2019-06-09         5   4444       51
## 4102           5013 2018-11-11         5   4442       28
## 4103           5014 2018-11-09         5   4445       83
## 4104           5014 2019-03-30         5   4448       22
## 4105           5015 2018-12-29         5   4450      104
## 4106           5015 2019-04-24         5   4452       81
## 4107           5015 2019-06-04         5   4453        9
## 4108           5015 2019-06-06         5   4454       45
## 4109           5015 2019-02-24         5   4451      109
## 4110           5016 2018-09-15         5   4455       21
## 4111           5016 2019-01-30         5   4456       92
## 4112           5016 2019-06-15         5   4459      114
## 4113           5016 2019-06-01         5   4458       66
## 4114           5016 2019-02-15         5   4457       27
## 4115           5017 2018-08-12         5   4460      114
## 4116           5017 2018-12-01         5   4463      113
## 4117           5017 2019-06-08         5   4464       36
## 4118           5018 2019-06-01         5   4468       91
## 4119           5018 2018-09-18         5   4466       66
## 4120           5018 2018-09-02         5   4465       52
## 4121           5018 2019-01-17         5   4467       53
## 4122           5019 2019-01-04         5   4471       62
## 4123           5019 2019-05-19         5   4472       74
## 4124           5019 2018-07-18         5   4470       11
## 4125           5020 2018-07-23         5   4473       66
## 4126           5020 2018-09-17         5   4475       73
## 4127           5020 2018-12-06         5   4476       44
## 4128           5020 2019-05-31         5   4478       87
## 4129           5020 2019-03-17         5   4477        7
## 4130           5020 2018-07-26         5   4474       72
## 4131           5021 2018-10-20         5   4480       75
## 4132           5021 2019-03-13         5   4485       27
## 4133           5021 2019-01-11         5   4484       69
## 4134           5021 2019-01-08         5   4483       62
## 4135           5021 2019-01-06         5   4482       73
## 4136           5021 2018-12-08         5   4481       80
## 4137           5021 2018-08-12         5   4479       71
## 4138           5022 2018-09-18         5   4487       43
## 4139           5022 2019-04-25         5   4493        6
## 4140           5022 2019-01-25         5   4491       25
## 4141           5022 2019-01-17         5   4489       67
## 4142           5022 2019-04-29         5   4494       20
## 4143           5022 2018-07-26         5   4486       69
## 4144           5022 2019-01-18         5   4490       69
## 4145           5022 2018-09-20         5   4488       81
## 4146           5023 2019-02-11         5   4500       55
## 4147           5023 2018-07-06         5   4495       10
## 4148           5023 2018-09-23         5   4496       79
## 4149           5023 2018-10-21         5   4497       95
## 4150           5023 2019-02-10         5   4499       17
## 4151           5023 2019-02-18         5   4501       11
## 4152           5024 2018-10-09         5   4503       96
## 4153           5024 2019-02-02         5   4505       89
## 4154           5024 2019-03-25         5   4506       99
## 4155           5024 2018-10-01         5   4502        4
## 4156           5024 2019-05-21         5   4509       90
## 4157           5024 2019-01-18         5   4504       98
## 4158           5024 2019-05-07         5   4508       54
## 4159           5024 2019-04-15         5   4507       56
## 4160           5025 2019-01-12         5   4515       61
## 4161           5025 2019-06-02         5   4521       10
## 4162           5025 2019-01-13         5   4516       62
## 4163           5025 2018-12-10         5   4513       38
## 4164           5025 2018-10-08         5   4512       68
## 4165           5025 2019-06-28         5   4522       48
## 4166           5025 2019-06-30         5   4523       78
## 4167           5025 2019-04-26         5   4518       33
## 4168           5025 2018-09-07         5   4511       61
## 4169           5025 2019-01-27         5   4517       30
## 4170           5025 2019-05-11         5   4520       51
## 4171           5026 2018-09-17         5   4527       83
## 4172           5026 2018-10-31         5   4528       44
## 4173           5026 2018-07-07         5   4524       13
## 4174           5026 2018-09-09         5   4526       84
## 4175           5026 2018-08-20         5   4525       42
## 4176           5027 2019-01-24         5   4532       67
## 4177           5027 2018-08-29         5   4529       82
## 4178           5027 2018-09-21         5   4530       62
## 4179           5027 2019-01-14         5   4531        7
## 4180           5027 2019-03-04         5   4533       49
## 4181           5028 2019-04-06         5   4542       66
## 4182           5028 2018-10-26         5   4537      114
## 4183           5028 2018-10-29         5   4538      109
## 4184           5028 2018-08-11         5   4535       67
## 4185           5028 2018-07-09         5   4534       84
## 4186           5028 2019-03-23         5   4539       92
## 4187           5028 2018-09-20         5   4536       94
## 4188           5028 2019-04-01         5   4541       82
## 4189           5029 2018-07-16         5   4543       18
## 4190           5029 2019-02-23         5   4547        6
## 4191           5029 2019-02-06         5   4546       10
## 4192           5029 2019-05-24         5   4551       89
## 4193           5029 2018-12-21         5   4545       10
## 4194           5029 2019-05-16         5   4550       67
## 4195           5029 2018-11-03         5   4544       67
## 4196           5029 2019-04-01         5   4548       24
## 4197           5029 2019-04-21         5   4549       75
## 4198           5030 2018-11-10         5   4553       98
## 4199           5030 2019-05-15         5   4555       20
## 4200           5030 2018-10-01         5   4552       47
## 4201           5030 2019-06-25         5   4556       77
## 4202           5030 2019-02-22         5   4554      108
## 4203           5031 2019-05-29         5   4562      100
## 4204           5031 2018-09-07         5   4558        2
## 4205           5031 2019-03-02         5   4561       85
## 4206           5031 2018-11-09         5   4559      111
## 4207           5031 2019-02-04         5   4560       17
## 4208           5031 2018-08-17         5   4557       46
## 4209           5032 2019-02-08         5   4566       38
## 4210           5032 2019-05-05         5   4569       29
## 4211           5032 2019-01-18         5   4565       87
## 4212           5032 2019-02-19         5   4567       29
## 4213           5032 2018-08-24         5   4563       13
## 4214           5032 2019-01-06         5   4564       20
## 4215           5033 2018-07-24         5   4570       34
## 4216           5033 2019-02-01         5   4574       83
## 4217           5033 2018-09-10         5   4571        7
## 4218           5033 2018-12-13         5   4573       81
## 4219           5034 2018-11-20         5   4580       86
## 4220           5034 2018-11-06         5   4579       14
## 4221           5034 2018-09-14         5   4577       85
## 4222           5034 2018-12-22         5   4583       62
## 4223           5034 2018-07-02         5   4576       87
## 4224           5034 2018-11-21         5   4581       36
## 4225           5034 2018-12-08         5   4582       28
## 4226           5034 2019-02-22         5   4584       70
## 4227           5034 2018-09-19         5   4578       11
## 4228           5034 2019-04-22         5   4585       77
## 4229           5034 2019-06-06         5   4587        4
## 4230           5035 2018-09-02         5   4588       61
## 4231           5035 2018-10-25         5   4592      103
## 4232           5035 2019-05-21         5   4595       84
## 4233           5035 2018-10-07         5   4591        1
## 4234           5035 2018-10-04         5   4590       12
## 4235           5035 2018-09-19         5   4589       77
## 4236           5035 2018-12-28         5   4593       27
## 4237           5035 2019-03-30         5   4594       75
## 4238           5036 2018-08-05         5   4596      114
## 4239           5036 2018-11-01         5   4598       26
## 4240           5036 2019-06-06         5   4602       48
## 4241           5036 2019-03-27         5   4601       62
## 4242           5036 2018-12-11         5   4599       55
## 4243           5036 2018-10-20         5   4597      104
## 4244           5037 2018-10-17         5   4603       12
## 4245           5037 2019-06-10         5   4607      110
## 4246           5037 2019-03-26         5   4605       78
## 4247           5037 2018-12-14         5   4604       32
## 4248           5037 2019-06-19         5   4608        3
## 4249           5037 2019-05-31         5   4606       34
## 4250           5038 2019-06-02         5   4614      102
## 4251           5038 2019-04-15         5   4613      111
## 4252           5038 2019-03-16         5   4612       21
## 4253           5038 2018-10-25         5   4609       66
## 4254           5038 2018-11-03         5   4610       81
## 4255           5039 2018-12-23         5   4616      109
## 4256           5039 2018-09-12         5   4615       66
## 4257           5040 2019-01-19         5   4618       24
## 4258           5040 2018-08-20         5   4617      114
## 4259           5041 2018-11-22         5   4622       14
## 4260           5041 2018-08-14         5   4620       92
## 4261           5041 2018-10-27         5   4621       50
## 4262           5041 2018-12-02         5   4624       12
## 4263           5041 2019-04-14         5   4625        9
## 4264           5041 2018-11-27         5   4623       36
## 4265           5042 2019-04-05         5   4629       85
## 4266           5042 2019-02-26         5   4628       75
## 4267           5042 2019-02-18         5   4627       77
## 4268           5042 2019-06-21         5   4631      114
## 4269           5042 2018-08-06         5   4626       78
## 4270           5042 2019-04-24         5   4630       67
## 4271           5043 2019-04-08         5   4633       87
## 4272           5043 2019-01-06         5   4632       33
## 4273           5043 2019-04-19         5   4634       15
## 4274           5043 2019-04-24         5   4635       96
## 4275           5044 2019-06-01         5   4639       24
## 4276           5044 2018-09-19         5   4637       96
## 4277           5044 2018-09-30         5   4638       20
## 4278           5045 2018-08-28         5   4641      107
## 4279           5045 2018-07-03         5   4640       26
## 4280           5046 2018-10-10         5   4644      114
## 4281           5046 2019-01-01         5   4646       24
## 4282           5046 2018-08-01         5   4642       19
## 4283           5046 2018-09-27         5   4643      108
## 4284           5046 2019-05-23         5   4647      108
## 4285           5047 2018-10-21         5   4648       27
## 4286           5047 2019-03-03         5   4649       27
## 4287           5048 2019-05-30         5   4657       51
## 4288           5048 2018-11-18         5   4653       93
## 4289           5048 2018-07-13         5   4651       68
## 4290           5048 2019-01-17         5   4654       34
## 4291           5048 2019-03-31         5   4655       61
## 4292           5048 2019-05-01         5   4656       43
## 4293           5048 2018-07-02         5   4650       36
## 4294           5048 2018-08-28         5   4652       97
## 4295           5049 2019-01-23         5   4659       66
## 4296           5049 2019-02-21         5   4660       56
## 4297           5049 2019-06-16         5   4661       77
## 4298           5049 2018-10-26         5   4658       85
## 4299           5049 2019-06-23         5   4662       20
## 4300           5050 2018-12-05         5   4667        5
## 4301           5050 2019-03-09         5   4670       67
## 4302           5050 2018-11-01         5   4665      109
## 4303           5050 2019-06-11         5   4672       61
## 4304           5050 2019-02-22         5   4669       12
## 4305           5050 2018-11-19         5   4666       18
## 4306           5050 2018-09-24         5   4664        4
## 4307           5051 2019-01-06         5   4677       78
## 4308           5051 2019-06-29         5   4679       98
## 4309           5051 2019-01-26         5   4678       14
## 4310           5051 2018-10-27         5   4673       16
## 4311           5051 2018-11-11         5   4675       16
## 4312           5051 2018-11-10         5   4674       96
## 4313           5052 2019-02-12         5   4684       25
## 4314           5052 2018-09-11         5   4682       26
## 4315           5052 2018-08-26         5   4680       45
## 4316           5052 2019-04-20         5   4686       84
## 4317           5052 2019-02-24         5   4685       36
## 4318           5052 2019-06-07         5   4687       78
## 4319           5052 2018-10-28         5   4683        1
## 4320           5052 2018-09-04         5   4681       20
## 4321           5053 2018-07-31         5   4689        3
## 4322           5053 2018-09-02         5   4690       15
## 4323           5054 2019-02-19         5   4694      102
## 4324           5054 2019-02-02         5   4693       56
## 4325           5054 2019-04-02         5   4695       69
## 4326           5055 2018-09-19         5   4697       67
## 4327           5055 2018-09-26         5   4699       87
## 4328           5055 2018-09-01         5   4696       22
## 4329           5055 2018-12-15         5   4700       33
## 4330           5055 2019-05-22         5   4702       12
## 4331           5055 2018-09-23         5   4698       17
## 4332           5056 2019-06-03         5   4708       86
## 4333           5056 2019-05-26         5   4707       85
## 4334           5056 2018-10-05         5   4704       67
## 4335           5056 2018-08-06         5   4703       49
## 4336           5056 2019-03-28         5   4706       47
## 4337           5056 2018-12-07         5   4705      102
## 4338           5057 2019-04-13         5   4712       51
## 4339           5057 2018-10-21         5   4710        9
## 4340           5057 2018-09-19         5   4709       26
## 4341           5057 2019-06-01         5   4713       15
## 4342           5057 2019-02-25         5   4711       96
## 4343           5058 2018-11-24         5   4715       50
## 4344           5058 2019-05-11         5   4719       58
## 4345           5058 2019-02-10         5   4718       72
## 4346           5058 2018-12-15         5   4716       22
## 4347           5058 2018-07-24         5   4714       98
## 4348           5059 2019-04-13         5   4724       66
## 4349           5059 2019-01-01         5   4721       21
## 4350           5059 2019-04-02         5   4723       20
## 4351           5059 2018-09-21         5   4720       91
## 4352           5059 2019-01-01         5   4721       38
## 4353           5059 2019-03-16         5   4722       89
## 4354           5059 2019-06-09         5   4725       45
## 4355           5060 2018-10-05         5   4727       15
## 4356           5060 2019-04-19         5   4729       28
## 4357           5060 2019-03-08         5   4728       15
## 4358           5060 2018-08-12         5   4726      113
## 4359           5060 2019-04-20         5   4730       67
## 4360           5061 2018-10-14         5   4732       29
## 4361           5061 2019-03-27         5   4735        6
## 4362           5061 2018-07-31         5   4731      109
## 4363           5061 2019-01-08         5   4734       89
## 4364           5062 2019-06-18         5   4739      109
## 4365           5062 2018-12-01         5   4737       46
## 4366           5063 2019-03-11         5   4744       85
## 4367           5063 2019-04-08         5   4745       25
## 4368           5063 2018-08-20         5   4742       30
## 4369           5063 2018-09-26         5   4743      114
## 4370           5063 2018-07-10         5   4741       97
## 4371           5064 2019-05-28         5   4749       83
## 4372           5064 2018-11-30         5   4748      104
## 4373           5064 2018-07-09         5   4746       53
## 4374           5064 2018-07-23         5   4747       22
## 4375           5065 2019-03-02         5   4754       46
## 4376           5065 2019-04-22         5   4755       50
## 4377           5065 2018-12-31         5   4753       23
## 4378           5065 2018-08-01         5   4751       98
## 4379           5065 2018-09-21         5   4752       28
## 4380           5065 2019-05-15         5   4756       15
## 4381           5066 2018-08-20         5   4757       32
## 4382           5066 2018-09-02         5   4758       58
## 4383           5066 2019-01-06         5   4760       66
## 4384           5067 2018-12-09         5   4762       58
## 4385           5067 2018-10-11         5   4761      111
## 4386           5067 2019-05-28         5   4764       88
## 4387           5068 2019-01-31         5   4767       50
## 4388           5068 2018-08-25         5   4765       60
## 4389           5068 2019-03-27         5   4768        1
## 4390           5069 2018-12-17         5   4775       16
## 4391           5069 2018-10-22         5   4773       60
## 4392           5069 2019-05-07         5   4780       79
## 4393           5069 2018-10-25         5   4774       24
## 4394           5069 2018-08-28         5   4771        3
## 4395           5069 2018-10-05         5   4772       80
## 4396           5069 2019-02-15         5   4778       11
## 4397           5069 2018-08-22         5   4770       18
## 4398           5069 2019-01-14         5   4777       29
## 4399           5070 2019-02-22         5   4784      105
## 4400           5070 2019-02-07         5   4783       66
## 4401           5070 2019-05-19         5   4785      114
## 4402           5070 2018-09-10         5   4782        7
## 4403           5070 2019-06-15         5   4786       38
## 4404           5070 2018-07-26         5   4781       22
## 4405           5071 2019-04-07         5   4789       52
## 4406           5071 2018-09-03         5   4787       90
## 4407           5071 2019-06-15         5   4790       51
## 4408           5071 2018-11-24         5   4788       72
## 4409           5072 2019-04-09         5   4794       86
## 4410           5072 2018-10-29         5   4791       85
## 4411           5072 2019-06-17         5   4796       27
## 4412           5072 2019-06-06         5   4795       52
## 4413           5073 2019-06-09         5   4801       49
## 4414           5073 2018-11-12         5   4797      107
## 4415           5073 2019-05-26         5   4800       60
## 4416           5073 2019-02-04         5   4799       62
## 4417           5074 2019-05-09         5   4805       89
## 4418           5074 2019-02-14         5   4803       15
## 4419           5074 2018-10-10         5   4802       90
## 4420           5074 2019-03-26         5   4804      112
## 4421           5075 2019-04-28         5   4811       91
## 4422           5075 2018-09-06         5   4809       79
## 4423           5075 2018-07-24         5   4807       60
## 4424           5075 2018-07-22         5   4806       25
## 4425           5075 2018-08-28         5   4808       84
## 4426           5075 2018-10-23         5   4810       15
## 4427           5076 2018-09-24         5   4813        2
## 4428           5076 2018-11-15         5   4814       49
## 4429           5077 2019-03-06         5   4816        9
## 4430           5077 2019-03-12         5   4817        5
## 4431           5077 2019-06-29         5   4818       53
## 4432           5077 2018-09-01         5   4815       60
## 4433           5078 2019-03-28         5   4823      114
## 4434           5078 2018-11-11         5   4821       33
## 4435           5078 2018-07-22         5   4820      108
## 4436           5078 2018-12-23         5   4822       46
## 4437           5078 2019-05-07         5   4825       14
## 4438           5078 2019-06-10         5   4826       44
## 4439           5078 2019-04-26         5   4824       85
## 4440           5078 2018-07-08         5   4819       77
## 4441           5079 2019-03-14         5   4830       27
## 4442           5079 2018-10-29         5   4828        7
## 4443           5079 2019-04-18         5   4831       58
## 4444           5079 2018-07-05         5   4827       71
## 4445           5079 2019-06-04         5   4833      111
## 4446           5079 2019-04-20         5   4832       52
## 4447           5079 2019-01-23         5   4829        3
## 4448           5080 2019-05-17         5   4842       79
## 4449           5080 2019-02-05         5   4841      105
## 4450           5080 2018-10-15         5   4836       77
## 4451           5080 2018-12-01         5   4838       90
## 4452           5080 2018-08-17         5   4834       38
## 4453           5080 2019-01-28         5   4840      106
## 4454           5080 2018-08-27         5   4835       23
## 4455           5080 2018-12-06         5   4839       83
## 4456           5080 2018-10-19         5   4837       17
## 4457           5081 2018-08-10         5   4843        4
## 4458           5081 2019-01-09         5   4848       29
## 4459           5081 2019-04-23         5   4849       74
## 4460           5081 2018-10-29         5   4845       32
## 4461           5081 2018-08-25         5   4844       46
## 4462           5081 2018-11-14         5   4846       10
## 4463           5081 2018-11-28         5   4847       42
## 4464           5082 2019-06-19         5   4851       55
## 4465           5082 2019-06-09         5   4850       50
## 4466           5083 2019-02-10         5   4855       21
## 4467           5083 2018-11-09         5   4853       90
## 4468           5083 2019-01-07         5   4854       19
## 4469           5083 2018-08-06         5   4852       98
## 4470           5084 2018-12-08         5   4860       73
## 4471           5084 2018-07-02         5   4857      114
## 4472           5084 2018-12-24         5   4861       38
## 4473           5084 2018-07-29         5   4858       98
## 4474           5084 2019-02-27         5   4862       53
## 4475           5085 2018-08-23         5   4865        5
## 4476           5085 2018-11-29         5   4868       15
## 4477           5085 2019-03-18         5   4871       18
## 4478           5085 2018-07-01         5   4863       11
## 4479           5085 2018-08-10         5   4864       77
## 4480           5085 2018-12-18         5   4869      114
## 4481           5085 2018-11-05         5   4867       12
## 4482           5086 2018-10-20         5   4872      114
## 4483           5086 2018-12-18         5   4873       36
## 4484           5086 2019-04-08         5   4876       17
## 4485           5086 2019-05-08         5   4877      112
## 4486           5086 2019-06-18         5   4878       77
## 4487           5086 2019-04-03         5   4875       20
## 4488           5086 2019-03-17         5   4874      105
## 4489           5087 2018-08-08         5   4879       25
## 4490           5087 2018-09-20         5   4880       16
## 4491           5087 2019-03-08         5   4883       34
## 4492           5088 2018-07-25         5   4884       51
## 4493           5088 2019-04-13         5   4885      111
## 4494           5089 2018-09-30         5   4886      104
## 4495           5089 2018-10-02         5   4887       69
## 4496           5089 2019-01-22         5   4890       48
## 4497           5089 2019-02-09         5   4891       14
## 4498           5089 2019-04-26         5   4892       95
## 4499           5089 2019-05-30         5   4893       87
## 4500           5089 2019-06-26         5   4894       25
## 4501           5089 2018-12-19         5   4889       94
## 4502           5089 2018-12-05         5   4888      106
## 4503           5090 2018-07-27         5   4895        2
## 4504           5090 2019-05-03         5   4901       25
## 4505           5090 2018-11-02         5   4898        8
## 4506           5090 2019-05-25         5   4902       87
## 4507           5090 2018-12-30         5   4899       92
## 4508           5090 2019-06-30         5   4903       93
## 4509           5090 2018-07-31         5   4896       11
## 4510           5090 2018-09-17         5   4897      104
## 4511           5091 2019-06-23         5   4906      100
## 4512           5091 2019-03-15         5   4905       38
## 4513           5092 2018-07-25         5   4907       73
## 4514           5092 2018-09-06         5   4908       98
## 4515           5093 2018-09-03         5   4911      114
## 4516           5093 2019-02-15         5   4913       78
## 4517           5093 2018-10-05         5   4912      111
## 4518           5094 2018-08-19         5   4914       63
## 4519           5094 2019-02-16         5   4916       18
## 4520           5094 2019-05-19         5   4918       60
## 4521           5094 2018-12-27         5   4915       56
## 4522           5095 2019-05-03         5   4923      111
## 4523           5095 2019-06-26         5   4924       99
## 4524           5095 2019-02-23         5   4921       53
## 4525           5095 2018-12-12         5   4920        6
## 4526           5095 2019-04-05         5   4922        6
## 4527           5096 2018-09-18         5   4926        5
## 4528           5096 2018-10-17         5   4928       88
## 4529           5096 2019-06-08         5   4934      110
## 4530           5096 2019-05-20         5   4933       22
## 4531           5096 2018-10-09         5   4927       45
## 4532           5096 2018-09-07         5   4925       55
## 4533           5096 2019-01-22         5   4930       46
## 4534           5096 2019-02-08         5   4931       23
## 4535           5096 2019-05-12         5   4932       77
## 4536           5097 2019-04-16         5   4940       27
## 4537           5097 2018-11-13         5   4937      105
## 4538           5097 2018-08-27         5   4935       91
## 4539           5097 2018-09-20         5   4936        2
## 4540           5097 2019-01-20         5   4939      110
## 4541           5098 2018-07-24         5   4943       91
## 4542           5098 2018-07-09         5   4941       72
## 4543           5098 2019-06-15         5   4947        5
## 4544           5098 2018-07-25         5   4944      114
## 4545           5098 2019-01-24         5   4946       62
## 4546           5098 2018-08-30         5   4945       86
## 4547           5098 2018-07-20         5   4942       81
## 4548           5099 2018-12-26         5   4949       75
## 4549           5099 2019-04-28         5   4951       95
## 4550           5099 2019-02-26         5   4950       73
## 4551           5099 2019-06-24         5   4952       47
## 4552           5100 2018-11-24         5   4953       44
## 4553           5100 2019-05-08         5   4955       52
## 4554           5100 2019-04-03         5   4954      109
## 4555           5101 2018-11-23         5   4958       12
## 4556           5101 2018-12-30         5   4959        5
## 4557           5101 2018-09-03         5   4957       58
## 4558           5102 2018-10-14         5   4960      112
## 4559           5102 2019-03-04         5   4965       47
## 4560           5102 2019-01-15         5   4964       44
## 4561           5102 2018-11-10         5   4961       50
## 4562           5102 2019-01-01         5   4963       75
## 4563           5103 2018-07-12         5   4966       70
## 4564           5103 2018-11-13         5   4967       43
## 4565           5103 2018-12-01         5   4968      105
## 4566           5104 2018-09-24         5   4970       25
## 4567           5104 2018-12-08         5   4971       53
## 4568           5105 2019-03-20         5   4972       21
## 4569           5106 2018-11-13         5   4974       14
## 4570           5106 2019-03-20         5   4977       37
## 4571           5107 2019-04-28         5   4985       52
## 4572           5107 2019-01-06         5   4981       13
## 4573           5107 2018-08-11         5   4979      106
## 4574           5107 2019-04-19         5   4984      113
## 4575           5107 2018-12-16         5   4980       37
## 4576           5107 2019-03-14         5   4982       62
## 4577           5107 2019-03-24         5   4983       45
## 4578           5108 2019-05-14         5   4991       52
## 4579           5108 2018-07-28         5   4986       13
## 4580           5108 2019-06-03         5   4993       83
## 4581           5108 2019-05-29         5   4992       15
## 4582           5108 2019-02-22         5   4989       11
## 4583           5108 2019-02-28         5   4990       38
## 4584           5108 2018-12-28         5   4988       74
## 4585           5108 2018-12-17         5   4987       30
## 4586           5109 2018-07-01         5   4994       60
## 4587           5109 2018-07-11         5   4996       11
## 4588           5109 2018-07-04         5   4995        4
## 4589           5109 2019-06-28         5   5001       79
## 4590           5109 2018-08-10         5   4997       83
## 4591           5109 2019-02-03         5   4999       48
## 4592           5109 2019-03-01         5   5000       74
## 4593           5109 2018-12-05         5   4998       22
## 4594           5110 2018-11-22         5   5004       66
## 4595           5110 2018-08-14         5   5003       14
## 4596           5110 2019-02-09         5   5005       86
## 4597           5110 2018-07-02         5   5002       27
## 4598           5110 2019-06-07         5   5006       45
## 4599           5111 2018-11-10         5   5010       80
## 4600           5111 2019-06-12         5   5014       85
## 4601           5111 2018-10-22         5   5009      113
## 4602           5111 2019-06-13         5   5015       21
## 4603           5111 2019-06-21         5   5016       25
## 4604           5111 2019-01-20         5   5011       45
## 4605           5111 2018-09-03         5   5007       18
## 4606           5111 2018-09-23         5   5008       71
## 4607           5111 2019-01-31         5   5012       24
## 4608           5112 2018-10-25         5   5018       81
## 4609           5112 2019-06-19         5   5020       49
## 4610           5112 2018-09-19         5   5017      111
## 4611           5112 2019-01-02         5   5019       52
## 4612           5113 2018-07-20         5   5022      111
## 4613           5113 2018-12-12         5   5023      103
## 4614           5113 2019-01-28         5   5025       80
## 4615           5113 2018-07-03         5   5021       75
## 4616           5114 2018-12-31         5   5029       24
## 4617           5114 2019-06-09         5   5030       16
## 4618           5114 2018-10-16         5   5027       89
## 4619           5114 2018-08-29         5   5026       88
## 4620           5114 2018-10-25         5   5028       71
## 4621           5115 2018-10-22         5   5032      107
## 4622           5115 2018-12-16         5   5033      107
## 4623           5115 2019-02-07         5   5035       85
## 4624           5115 2018-07-11         5   5031      103
## 4625           5115 2018-12-28         5   5034       90
## 4626           5115 2019-04-13         5   5036       83
## 4627           5116 2019-06-18         5   5042       84
## 4628           5116 2018-12-06         5   5037       62
## 4629           5116 2019-04-26         5   5039       27
## 4630           5116 2019-06-09         5   5041       40
## 4631           5116 2019-05-08         5   5040       95
## 4632           5116 2019-02-24         5   5038       21
## 4633           5117 2018-08-11         5   5043       83
## 4634           5117 2018-11-27         5   5045       99
## 4635           5117 2019-04-21         5   5046       66
## 4636           5118 2019-04-01         5   5051       80
## 4637           5118 2019-04-08         5   5052       38
## 4638           5118 2018-07-27         5   5047        1
## 4639           5118 2019-02-12         5   5049       16
## 4640           5118 2018-12-06         5   5048       80
## 4641           5118 2019-03-06         5   5050       25
## 4642           5119 2019-05-31         5   5056       20
## 4643           5119 2018-10-25         5   5053       21
## 4644           5119 2019-05-01         5   5055       85
## 4645           5119 2019-02-01         5   5054       62
## 4646           5120 2019-05-19         5   5064       62
## 4647           5120 2018-07-27         5   5058       84
## 4648           5120 2018-08-11         5   5059      113
## 4649           5120 2018-07-04         5   5057       49
## 4650           5120 2019-03-17         5   5063      102
## 4651           5120 2018-09-10         5   5061       45
## 4652           5120 2018-10-24         5   5062       85
## 4653           5120 2018-08-14         5   5060       46
## 4654           5121 2018-08-01         5   5066       87
## 4655           5121 2018-08-28         5   5067       49
## 4656           5121 2018-12-07         5   5068        6
## 4657           5121 2019-04-02         5   5070       94
## 4658           5121 2019-06-05         5   5071       89
## 4659           5121 2018-07-20         5   5065       24
## 4660           5121 2019-03-04         5   5069        9
## 4661           5122 2019-03-06         5   5077       51
## 4662           5122 2018-09-07         5   5073       92
## 4663           5122 2018-08-13         5   5072       22
## 4664           5122 2018-10-12         5   5074       69
## 4665           5122 2019-02-21         5   5076       20
## 4666           5123 2019-03-17         5   5087       53
## 4667           5123 2018-08-07         5   5080       83
## 4668           5123 2018-07-10         5   5078       68
## 4669           5123 2019-06-26         5   5089       33
## 4670           5123 2019-02-04         5   5085       92
## 4671           5123 2019-06-01         5   5088       52
## 4672           5123 2018-08-17         5   5082      113
## 4673           5123 2018-08-12         5   5081       12
## 4674           5123 2019-02-16         5   5086       98
## 4675           5123 2018-07-13         5   5079       69
## 4676           5124 2019-01-03         5   5098       89
## 4677           5124 2018-11-19         5   5094        8
## 4678           5124 2018-12-22         5   5097       21
## 4679           5124 2018-12-04         5   5096       45
## 4680           5124 2018-11-13         5   5093       79
## 4681           5124 2018-11-30         5   5095       27
## 4682           5124 2018-09-19         5   5091      109
## 4683           5124 2018-10-04         5   5092       50
## 4684           5125 2018-12-17         5   5101       29
## 4685           5125 2019-04-21         5   5103       14
## 4686           5125 2019-01-28         5   5102       79
## 4687           5125 2018-09-01         5   5099       80
## 4688           5125 2018-09-23         5   5100       74
## 4689           5125 2019-06-13         5   5104       23
## 4690           5126 2018-07-12         5   5105       25
## 4691           5126 2019-03-31         5   5110       18
## 4692           5126 2019-02-11         5   5108       13
## 4693           5126 2019-01-31         5   5107       48
## 4694           5126 2019-03-09         5   5109       78
## 4695           5127 2018-07-11         5   5112       21
## 4696           5127 2018-09-04         5   5113      114
## 4697           5127 2019-02-18         5   5115       60
## 4698           5127 2019-03-16         5   5116       73
## 4699           5127 2018-07-10         5   5111       95
## 4700           5127 2019-04-21         5   5117       53
## 4701           5128 2019-06-02         5   5127       19
## 4702           5128 2019-02-12         5   5124       60
## 4703           5128 2019-03-11         5   5125       95
## 4704           5128 2019-06-25         5   5128      108
## 4705           5128 2018-11-02         5   5120       20
## 4706           5128 2019-01-10         5   5123      113
## 4707           5128 2019-03-24         5   5126       86
## 4708           5128 2018-09-08         5   5119       16
## 4709           5128 2018-11-15         5   5121        2
## 4710           5129 2018-08-25         5   5130       24
## 4711           5129 2019-04-06         5   5134      106
## 4712           5129 2019-05-20         5   5135        7
## 4713           5129 2019-03-20         5   5133        3
## 4714           5129 2019-02-19         5   5132       99
## 4715           5129 2018-12-09         5   5131       86
## 4716           5130 2018-07-07         5   5136       26
## 4717           5130 2019-02-14         5   5141       50
## 4718           5130 2019-03-24         5   5142       37
## 4719           5130 2018-09-29         5   5138       82
## 4720           5130 2018-09-24         5   5137       43
## 4721           5130 2018-11-08         5   5139       74
## 4722           5131 2019-04-12         5   5147       17
## 4723           5131 2019-03-10         5   5145       87
## 4724           5131 2019-05-21         5   5148       81
## 4725           5131 2019-02-14         5   5144       20
## 4726           5131 2019-03-23         5   5146        8
## 4727           5132 2018-09-27         5   5149       72
## 4728           5132 2019-04-03         5   5152       71
## 4729           5132 2018-12-09         5   5150       62
## 4730           5132 2019-02-18         5   5151       75
## 4731           5133 2019-04-29         5   5161       50
## 4732           5133 2018-09-04         5   5153        6
## 4733           5133 2018-09-29         5   5154       79
## 4734           5133 2019-02-04         5   5159       45
## 4735           5133 2018-12-15         5   5157       47
## 4736           5133 2018-11-04         5   5155       12
## 4737           5133 2018-11-26         5   5156       91
## 4738           5133 2019-04-02         5   5160       42
## 4739           5134 2019-06-12         5   5165       70
## 4740           5134 2018-08-03         5   5162       34
## 4741           5134 2019-04-28         5   5164       24
## 4742           5134 2018-09-05         5   5163       27
## 4743           5135 2018-09-14         5   5167        7
## 4744           5135 2018-10-18         5   5168       67
## 4745           5135 2019-05-12         5   5170       49
## 4746           5135 2018-07-29         5   5166       37
## 4747           5135 2019-01-09         5   5169       50
## 4748           5135 2019-06-28         5   5171      108
## 4749           5136 2018-12-14         5   5176       48
## 4750           5136 2019-03-10         5   5177       66
## 4751           5136 2018-10-02         5   5173       33
## 4752           5136 2018-12-02         5   5175       50
## 4753           5136 2019-06-28         5   5178       95
## 4754           5136 2018-08-24         5   5172       69
## 4755           5136 2018-10-08         5   5174       14
## 4756           5137 2018-10-08         5   5180       18
## 4757           5137 2018-11-11         5   5181       42
## 4758           5137 2018-12-02         5   5182       78
## 4759           5137 2019-01-31         5   5186       50
## 4760           5137 2018-12-28         5   5183       25
## 4761           5137 2019-06-21         5   5187      114
## 4762           5137 2019-01-17         5   5184       70
## 4763           5137 2018-09-28         5   5179        4
## 4764           5137 2019-01-27         5   5185       97
## 4765           5138 2018-10-12         5   5188       90
## 4766           5138 2019-06-08         5   5193       87
## 4767           5138 2019-06-24         5   5194       45
## 4768           5138 2019-05-28         5   5192       78
## 4769           5138 2019-01-13         5   5190       71
## 4770           5138 2019-05-16         5   5191       42
## 4771           5139 2019-06-17         5   5198       96
## 4772           5139 2018-07-15         5   5195       83
## 4773           5139 2019-02-01         5   5196        4
## 4774           5139 2019-04-17         5   5197       97
## 4775           5140 2019-02-05         5   5203       43
## 4776           5140 2018-11-13         5   5202       78
## 4777           5140 2018-11-07         5   5201      102
## 4778           5140 2018-10-26         5   5200      108
## 4779           5140 2019-06-28         5   5204       98
## 4780           5141 2018-12-26         5   5206       93
## 4781           5141 2018-07-27         5   5205       16
## 4782           5141 2019-06-04         5   5208       87
## 4783           5141 2019-05-05         5   5207       14
## 4784           5142 2019-03-19         5   5213       31
## 4785           5142 2018-08-24         5   5209       27
## 4786           5142 2018-11-16         5   5210        4
## 4787           5142 2019-02-09         5   5212       93
## 4788           5143 2018-12-12         5   5217        5
## 4789           5143 2019-01-19         5   5219       61
## 4790           5143 2018-12-03         5   5216       48
## 4791           5143 2019-02-28         5   5220      104
## 4792           5143 2018-11-23         5   5215       12
## 4793           5143 2018-12-19         5   5218       81
## 4794           5144 2018-08-27         5   5222       73
## 4795           5144 2019-01-17         5   5223       96
## 4796           5144 2019-04-10         5   5224        9
## 4797           5144 2018-07-14         5   5221       87
## 4798           5145 2018-12-16         5   5229       94
## 4799           5145 2018-10-02         5   5226       45
## 4800           5145 2018-12-07         5   5228       89
## 4801           5145 2019-04-07         5   5232        1
## 4802           5145 2019-02-12         5   5230       48
## 4803           5145 2019-02-16         5   5231       31
## 4804           5145 2018-09-08         5   5225       26
## 4805           5145 2018-11-24         5   5227       93
## 4806           5145 2019-05-05         5   5234       56
## 4807           5145 2019-04-18         5   5233       52
## 4808           5146 2018-08-19         5   5235       98
## 4809           5146 2019-05-13         5   5237       78
## 4810           5146 2018-11-20         5   5236       10
## 4811           5147 2019-06-20         5   5244       81
## 4812           5147 2019-01-31         5   5241      114
## 4813           5147 2019-05-08         5   5243       52
## 4814           5147 2019-04-19         5   5242       15
## 4815           5147 2018-10-23         5   5239        7
## 4816           5147 2019-01-04         5   5240       92
## 4817           5147 2018-08-05         5   5238      110
## 4818           5148 2019-01-17         5   5248       68
## 4819           5148 2019-04-08         5   5249        8
## 4820           5148 2018-09-13         5   5245       87
## 4821           5148 2018-10-29         5   5246       29
## 4822           5149 2019-01-09         5   5251       31
## 4823           5149 2018-07-14         5   5250       98
## 4824           5150 2019-05-11         5   5254       13
## 4825           5150 2018-11-02         5   5253       67
## 4826           5151 2019-01-27         5   5257      105
## 4827           5151 2019-04-18         5   5258       55
## 4828           5151 2019-04-28         5   5259        4
## 4829           5151 2018-08-19         5   5255       31
## 4830           5151 2018-09-27         5   5256       42
## 4831           5151 2019-06-26         5   5261       58
## 4832           5151 2019-04-29         5   5260       70
## 4833           5152 2019-01-11         5   5265       31
## 4834           5152 2019-06-21         5   5267       89
## 4835           5152 2018-12-06         5   5263       55
## 4836           5152 2019-04-06         5   5266       77
## 4837           5152 2018-11-05         5   5262        5
## 4838           5153 2018-07-14         5   5270       24
## 4839           5153 2018-07-08         5   5269       81
## 4840           5153 2018-11-05         5   5272       63
## 4841           5153 2019-06-19         5   5273       13
## 4842           5153 2018-09-09         5   5271       14
## 4843           5154 2018-08-03         5   5274       56
## 4844           5154 2019-02-27         5   5278      104
## 4845           5154 2018-10-11         5   5275       93
## 4846           5154 2019-03-10         5   5279       49
## 4847           5154 2018-11-22         5   5276       67
## 4848           5154 2019-01-06         5   5277       22
## 4849           5155 2019-06-18         5   5284       17
## 4850           5155 2018-10-26         5   5281       75
## 4851           5155 2019-03-03         5   5283       78
## 4852           5155 2019-06-29         5   5285       34
## 4853           5155 2018-10-30         5   5282       15
## 4854           5155 2018-09-15         5   5280       60
## 4855           5156 2018-09-23         5   5287       90
## 4856           5156 2018-09-16         5   5286       34
## 4857           5156 2018-11-19         5   5288       79
## 4858           5157 2018-08-17         5   5290       75
## 4859           5157 2018-11-22         5   5294       19
## 4860           5157 2018-10-22         5   5291       67
## 4861           5157 2018-12-07         5   5296      102
## 4862           5157 2018-11-12         5   5293       99
## 4863           5157 2019-06-01         5   5301      108
## 4864           5157 2018-11-11         5   5292      106
## 4865           5157 2018-07-13         5   5289       25
## 4866           5157 2019-05-11         5   5298       44
## 4867           5157 2018-12-31         5   5297       85
## 4868           5158 2019-06-12         5   5310       45
## 4869           5158 2018-09-25         5   5303       97
## 4870           5158 2019-06-10         5   5309      112
## 4871           5158 2018-11-11         5   5305        7
## 4872           5158 2019-06-25         5   5311       78
## 4873           5158 2019-01-13         5   5306       11
## 4874           5158 2019-05-07         5   5308       17
## 4875           5159 2018-10-26         5   5312       66
## 4876           5159 2018-12-23         5   5314        6
## 4877           5160 2018-11-13         5   5320        5
## 4878           5160 2018-07-04         5   5316       21
## 4879           5160 2018-12-30         5   5321      112
## 4880           5160 2018-07-27         5   5317        3
## 4881           5160 2019-05-01         5   5323        9
## 4882           5160 2019-01-25         5   5322       32
## 4883           5160 2018-08-23         5   5318       78
## 4884           5161 2019-05-14         5   5331       15
## 4885           5161 2018-09-22         5   5326      107
## 4886           5161 2018-10-17         5   5327       77
## 4887           5161 2018-12-15         5   5328       55
## 4888           5161 2018-12-19         5   5329        9
## 4889           5161 2019-02-09         5   5330       31
## 4890           5161 2018-07-12         5   5324       68
## 4891           5161 2018-08-10         5   5325       91
## 4892           5162 2019-01-27         5   5335       91
## 4893           5162 2018-11-05         5   5334       79
## 4894           5162 2019-05-20         5   5336       67
## 4895           5162 2018-07-14         5   5332       74
## 4896           5163 2018-08-28         5   5338       78
## 4897           5163 2018-08-10         5   5337       12
## 4898           5163 2019-03-25         5   5339       54
## 4899           5164 2018-12-23         5   5345       66
## 4900           5164 2018-08-15         5   5340       24
## 4901           5164 2018-11-20         5   5344       74
## 4902           5164 2018-12-26         5   5346       90
## 4903           5164 2018-09-11         5   5342       61
## 4904           5164 2018-08-22         5   5341       71
## 4905           5165 2019-06-21         5   5350       21
## 4906           5165 2018-07-05         5   5347       82
## 4907           5165 2018-09-05         5   5349       18
## 4908           5165 2018-08-18         5   5348       38
## 4909           5166 2018-08-01         5   5353      100
## 4910           5166 2018-07-04         5   5351      112
## 4911           5166 2018-07-14         5   5352       37
## 4912           5166 2018-09-06         5   5354      102
## 4913           5167 2018-09-07         5   5355       24
## 4914           5168 2018-09-29         5   5359      104
## 4915           5168 2018-10-11         5   5361       88
## 4916           5168 2018-10-06         5   5360      109
## 4917           5168 2018-11-29         5   5363       81
## 4918           5168 2018-12-07         5   5364       45
## 4919           5168 2018-07-24         5   5357       52
## 4920           5168 2019-01-25         5   5368        4
## 4921           5168 2018-10-29         5   5362      114
## 4922           5168 2018-12-23         5   5365        4
## 4923           5168 2019-03-29         5   5369       10
## 4924           5168 2019-01-02         5   5367      100
## 4925           5168 2018-12-24         5   5366       90
## 4926           5168 2018-07-22         5   5356       44
## 4927           5168 2018-08-21         5   5358       22
## 4928           5169 2018-09-03         5   5370      108
## 4929           5169 2019-04-30         5   5373       82
## 4930           5169 2019-03-07         5   5372       75
## 4931           5169 2018-09-26         5   5371       36
## 4932           5169 2019-06-19         5   5375       26
## 4933           5169 2019-06-17         5   5374       91
## 4934           5170 2018-07-19         5   5377       31
## 4935           5170 2019-01-31         5   5379       50
## 4936           5170 2019-02-01         5   5380      110
## 4937           5170 2018-12-18         5   5378       78
## 4938           5171 2018-07-31         5   5382       86
## 4939           5171 2019-01-25         5   5389        3
## 4940           5171 2018-09-11         5   5384       42
## 4941           5171 2019-04-03         5   5390       96
## 4942           5171 2019-01-10         5   5388       79
## 4943           5171 2018-09-06         5   5383       13
## 4944           5171 2018-10-01         5   5385       36
## 4945           5171 2018-07-23         5   5381       40
## 4946           5172 2018-11-30         5   5391       95
## 4947           5172 2019-01-04         5   5392        1
## 4948           5172 2019-01-19         5   5394       98
## 4949           5173 2018-09-24         5   5396       85
## 4950           5173 2019-02-03         5   5398       37
## 4951           5173 2018-09-12         5   5395      104
## 4952           5173 2019-03-23         5   5400      106
## 4953           5173 2019-04-06         5   5402       13
## 4954           5173 2019-02-09         5   5399       26
## 4955           5173 2019-05-11         5   5403       97
## 4956           5173 2019-04-04         5   5401       56
## 4957           5173 2019-06-18         5   5404       87
## 4958           5173 2019-01-15         5   5397      113
## 4959           5174 2018-09-18         5   5405       18
## 4960           5174 2019-05-26         5   5408       47
## 4961           5175 2019-04-25         5   5415       83
## 4962           5175 2018-08-13         5   5410       94
## 4963           5175 2018-11-08         5   5412       96
## 4964           5175 2018-11-26         5   5413       10
## 4965           5175 2018-09-02         5   5411       83
## 4966           5176 2019-05-30         5   5419       86
## 4967           5176 2019-06-16         5   5421        3
## 4968           5176 2019-03-16         5   5418       48
## 4969           5176 2018-10-04         5   5416       91
## 4970           5176 2019-06-02         5   5420      100
## 4971           5176 2019-02-03         5   5417       74
## 4972           5177 2018-09-13         5   5422       50
## 4973           5177 2019-02-22         5   5428       30
## 4974           5177 2019-01-13         5   5426        8
## 4975           5177 2018-11-26         5   5424       78
## 4976           5177 2018-09-27         5   5423       11
## 4977           5177 2019-06-21         5   5430      106
## 4978           5177 2019-03-29         5   5429       93
## 4979           5177 2019-01-19         5   5427       36
## 4980           5177 2018-12-22         5   5425       13
## 4981           5178 2019-05-03         5   5439       88
## 4982           5178 2018-11-25         5   5433      110
## 4983           5178 2018-10-27         5   5432       43
## 4984           5178 2018-08-03         5   5431       22
## 4985           5178 2018-12-21         5   5435       98
## 4986           5178 2019-02-13         5   5437       47
## 4987           5178 2019-04-21         5   5438       46
## 4988           5178 2019-01-30         5   5436       53
## 4989           5178 2018-12-05         5   5434       52
## 4990           5178 2019-05-30         5   5440      107
## 4991           5178 2019-05-30         5   5440       10
## 4992           5179 2019-02-06         5   5446        6
## 4993           5179 2018-10-12         5   5444       16
## 4994           5179 2018-07-08         5   5441       20
## 4995           5179 2019-01-06         5   5445       26
## 4996           5179 2019-03-07         5   5447       61
## 4997           5179 2018-07-10         5   5442       67
## 4998           5179 2018-07-14         5   5443       82
## 4999           5180 2019-01-15         5   5451       25
## 5000           5180 2018-07-20         5   5449       14
## 5001           5181 2019-01-30         5   5459       14
## 5002           5181 2018-08-02         5   5454       56
## 5003           5181 2018-08-10         5   5456       74
## 5004           5181 2018-08-04         5   5455      108
## 5005           5181 2018-07-25         5   5453       44
## 5006           5181 2018-12-11         5   5458       60
## 5007           5181 2019-06-06         5   5461       43
## 5008           5181 2018-08-23         5   5457       20
## 5009           5182 2018-12-18         5   5464       66
## 5010           5182 2019-03-12         5   5467      103
## 5011           5182 2018-08-20         5   5462       52
## 5012           5182 2019-03-06         5   5466       17
## 5013           5182 2018-10-24         5   5463       86
## 5014           5182 2019-04-07         5   5468       34
## 5015           5182 2019-02-24         5   5465       48
## 5016           5183 2018-10-07         5   5470        4
## 5017           5183 2019-02-10         5   5471        5
## 5018           5183 2019-06-16         5   5473       96
## 5019           5184 2019-05-08         5   5476       70
## 5020           5184 2018-09-24         5   5474       66
## 5021           5184 2019-01-22         5   5475        6
## 5022           5185 2018-07-08         5   5478       33
## 5023           5185 2019-03-30         5   5481       61
## 5024           5185 2019-05-02         5   5482       13
## 5025           5185 2019-06-12         5   5483       88
## 5026           5185 2018-08-31         5   5479       17
## 5027           5186 2018-11-26         5   5486       31
## 5028           5186 2018-12-22         5   5488       75
## 5029           5186 2018-08-23         5   5484       25
## 5030           5186 2018-11-05         5   5485       51
## 5031           5187 2018-08-23         5   5489       26
## 5032           5187 2018-09-02         5   5490      107
## 5033           5187 2019-02-19         5   5494       68
## 5034           5187 2018-11-25         5   5493       48
## 5035           5187 2018-11-21         5   5492       85
## 5036           5187 2018-11-03         5   5491       71
## 5037           5187 2019-03-10         5   5495      108
## 5038           5188 2018-08-16         5   5496        3
## 5039           5188 2019-06-12         5   5498       22
## 5040           5188 2019-06-25         5   5499       73
## 5041           5189 2018-12-06         5   5503       23
## 5042           5189 2018-08-28         5   5502       92
## 5043           5189 2019-04-16         5   5505       84
## 5044           5189 2018-07-23         5   5501       97
## 5045           5189 2018-07-09         5   5500       28
## 5046           5189 2019-04-15         5   5504        6
## 5047           5190 2018-10-12         5   5509       25
## 5048           5190 2018-08-01         5   5507      103
## 5049           5190 2018-09-19         5   5508       81
## 5050           5190 2018-07-26         5   5506       38
## 5051           5190 2019-02-21         5   5511       98
## 5052           5190 2019-02-12         5   5510      106
## 5053           5191 2019-03-17         5   5519       94
## 5054           5191 2019-06-21         5   5524       32
## 5055           5191 2018-11-29         5   5514        3
## 5056           5191 2019-01-24         5   5517       43
## 5057           5191 2019-03-03         5   5518      103
## 5058           5191 2019-03-25         5   5520       88
## 5059           5191 2019-05-02         5   5522       81
## 5060           5191 2019-05-26         5   5523       63
## 5061           5191 2019-04-15         5   5521       92
## 5062           5191 2018-08-01         5   5513       43
## 5063           5191 2019-01-12         5   5516       55
## 5064           5192 2018-10-21         5   5526       60
## 5065           5192 2018-11-24         5   5528      111
## 5066           5192 2018-11-12         5   5527       21
## 5067           5192 2018-10-08         5   5525      106
## 5068           5193 2018-12-07         5   5531       51
## 5069           5193 2018-12-21         5   5532       78
## 5070           5193 2019-04-06         5   5535       71
## 5071           5193 2019-02-07         5   5534      111
## 5072           5193 2018-12-26         5   5533      104
## 5073           5193 2018-11-16         5   5530       96
## 5074           5194 2019-02-03         5   5540       69
## 5075           5194 2019-02-27         5   5542       97
## 5076           5194 2019-01-20         5   5539       86
## 5077           5194 2019-02-19         5   5541      104
## 5078           5194 2018-08-11         5   5537       25
## 5079           5194 2019-05-02         5   5543       98
## 5080           5195 2019-01-09         5   5545       16
## 5081           5195 2018-07-12         5   5544       11
## 5082           5197 2019-01-11         5   5550       73
## 5083           5197 2018-08-11         5   5547       75
## 5084           5197 2018-10-03         5   5549       90
## 5085           5197 2018-09-04         5   5548        3
## 5086           5197 2019-02-23         5   5551      106
## 5087           5199 2019-06-09         5   5552        3
## 5088           5200 2019-05-28         5   5558       49
## 5089           5200 2019-04-23         5   5557       79
## 5090           5200 2019-03-03         5   5556       25
## 5091           5200 2018-11-12         5   5555       55
## 5092           5200 2018-09-16         5   5553      100
## 5093           5200 2018-10-11         5   5554       66
## 5094           5201 2018-12-24         5   5559       23
## 5095           5201 2019-05-28         5   5560       56
## 5096           5202 2018-07-23         5   5561       33
## 5097           5202 2019-03-15         5   5565       75
## 5098           5202 2018-10-15         5   5562       94
## 5099           5202 2018-11-12         5   5563       45
## 5100           5202 2019-01-07         5   5564       88
## 5101           5203 2019-04-22         5   5566      105
## 5102           5204 2018-08-12         5   5568       91
## 5103           5204 2019-06-30         5   5575       97
## 5104           5204 2018-12-24         5   5570       15
## 5105           5204 2019-04-27         5   5572       45
## 5106           5204 2019-05-27         5   5574       61
## 5107           5204 2018-07-20         5   5567        8
## 5108           5204 2018-12-06         5   5569       24
## 5109           5204 2019-05-06         5   5573       12
## 5110           5205 2019-01-20         5   5581       95
## 5111           5205 2019-02-09         5   5582       53
## 5112           5205 2019-05-19         5   5583       24
## 5113           5205 2018-07-24         5   5576       66
## 5114           5205 2018-09-17         5   5577       93
## 5115           5205 2018-12-02         5   5579       12
## 5116           5205 2019-01-12         5   5580       51
## 5117           5205 2019-06-18         5   5584        8
## 5118           5205 2019-06-24         5   5585       52
## 5119           5205 2018-11-10         5   5578        3
## 5120           5206 2019-06-26         5   5589       52
## 5121           5206 2019-03-01         5   5587       63
## 5122           5206 2019-06-29         5   5590       31
## 5123           5206 2018-12-24         5   5586       43
## 5124           5206 2019-05-04         5   5588       72
## 5125           5207 2019-01-15         5   5592       79
## 5126           5207 2018-12-03         5   5591       56
## 5127           5207 2019-06-08         5   5593       18
## 5128           5208 2018-11-30         5   5595       95
## 5129           5208 2018-11-10         5   5594       74
## 5130           5208 2019-05-09         5   5599       71
## 5131           5208 2018-12-21         5   5596       10
## 5132           5208 2019-03-11         5   5598      112
## 5133           5208 2019-06-07         5   5600      110
## 5134           5209 2018-09-02         5   5603       83
## 5135           5209 2018-10-01         5   5604      111
## 5136           5209 2019-03-10         5   5607        4
## 5137           5209 2018-11-16         5   5605       95
## 5138           5209 2019-01-06         5   5606      107
## 5139           5209 2018-07-30         5   5601       87
## 5140           5209 2018-08-28         5   5602       11
## 5141           5210 2018-08-25         5   5609       60
## 5142           5210 2018-10-01         5   5611       67
## 5143           5210 2018-10-20         5   5612      106
## 5144           5210 2019-04-24         5   5614      113
## 5145           5210 2018-09-17         5   5610      107
## 5146           5210 2019-02-08         5   5613        5
## 5147           5210 2019-06-01         5   5615      106
## 5148           5210 2018-07-08         5   5608      112
## 5149           5211 2018-07-16         5   5616       38
## 5150           5211 2018-12-29         5   5618       87
## 5151           5211 2018-10-03         5   5617      112
## 5152           5212 2018-08-26         5   5619       71
## 5153           5212 2019-06-23         5   5622       82
## 5154           5212 2019-03-23         5   5621       79
## 5155           5213 2019-01-06         5   5625       45
## 5156           5213 2019-02-17         5   5626        7
## 5157           5214 2019-03-09         5   5629      113
## 5158           5214 2019-04-16         5   5630       80
## 5159           5214 2019-04-27         5   5631       20
## 5160           5214 2019-01-29         5   5628       26
## 5161           5215 2018-09-25         5   5633       62
## 5162           5215 2019-06-01         5   5636       19
## 5163           5215 2018-07-04         5   5632       34
## 5164           5215 2018-10-18         5   5634       26
## 5165           5215 2019-02-27         5   5635       86
## 5166           5216 2019-01-29         5   5637       73
## 5167           5217 2018-12-31         5   5640       51
## 5168           5217 2018-07-10         5   5638       99
## 5169           5217 2018-09-20         5   5639       55
## 5170           5217 2019-02-15         5   5642       95
## 5171           5218 2019-03-20         5   5645      113
## 5172           5218 2019-01-26         5   5644       42
## 5173           5218 2018-09-05         5   5643       32
## 5174           5218 2019-05-18         5   5646       78
## 5175           5219 2018-10-27         5   5649        9
## 5176           5219 2019-02-10         5   5652       84
## 5177           5219 2019-06-27         5   5655       93
## 5178           5219 2019-04-23         5   5654       19
## 5179           5219 2018-12-17         5   5650      109
## 5180           5219 2018-09-13         5   5648       23
## 5181           5219 2019-04-18         5   5653       47
## 5182           5220 2018-07-25         5   5656       23
## 5183           5220 2018-11-15         5   5657       44
## 5184           5221 2019-04-04         5   5664       92
## 5185           5221 2018-11-16         5   5660      111
## 5186           5221 2018-12-03         5   5661       23
## 5187           5221 2018-08-29         5   5659       61
## 5188           5221 2019-02-08         5   5663        3
## 5189           5221 2019-01-04         5   5662      111
## 5190           5222 2018-11-29         5   5665       15
## 5191           5223 2018-08-19         5   5666       19
## 5192           5223 2019-02-21         5   5668       87
## 5193           5223 2019-06-15         5   5669       47
## 5194           5224 2018-07-07         5   5670       32
## 5195           5224 2019-02-23         5   5675       44
## 5196           5224 2018-12-04         5   5673        3
## 5197           5224 2019-02-12         5   5674       84
## 5198           5224 2018-11-22         5   5672        9
## 5199           5225 2018-10-01         5   5677       58
## 5200           5225 2019-06-14         5   5680        9
## 5201           5225 2018-08-05         5   5676       72
## 5202           5225 2019-05-17         5   5679       73
## 5203           5225 2018-11-16         5   5678      103
## 5204           5226 2019-05-12         5   5684       38
## 5205           5226 2018-08-01         5   5681       96
## 5206           5226 2018-11-09         5   5682       23
## 5207           5227 2019-05-01         5   5688       61
## 5208           5227 2018-07-16         5   5685       15
## 5209           5227 2018-11-21         5   5686       96
## 5210           5228 2019-06-05         5   5692       98
## 5211           5228 2018-10-08         5   5690       46
## 5212           5228 2018-07-06         5   5689       61
## 5213           5228 2018-12-29         5   5691       67
## 5214           5229 2018-08-02         5   5694      107
## 5215           5229 2019-01-17         5   5696       60
## 5216           5229 2018-07-22         5   5693       33
## 5217           5229 2018-09-19         5   5695       62
## 5218           5229 2019-05-27         5   5697       34
## 5219           5229 2019-06-11         5   5698       70
## 5220           5230 2018-09-04         5   5699       29
## 5221           5230 2019-02-25         5   5701       36
## 5222           5230 2019-06-23         5   5703       49
## 5223           5230 2019-03-08         5   5702      113
## 5224           5230 2019-01-10         5   5700       52
## 5225           5231 2019-02-04         5   5708       44
## 5226           5231 2018-09-09         5   5705       87
## 5227           5231 2018-12-20         5   5707       33
## 5228           5231 2018-12-02         5   5706        2
## 5229           5232 2019-03-04         5   5713       33
## 5230           5232 2018-07-04         5   5709       51
## 5231           5232 2018-09-24         5   5711       13
## 5232           5232 2018-12-21         5   5712       74
## 5233           5232 2019-03-29         5   5715       77
## 5234           5232 2019-03-19         5   5714       14
## 5235           5233 2019-04-21         5   5723       15
## 5236           5233 2019-06-19         5   5725       80
## 5237           5233 2019-04-18         5   5722      102
## 5238           5233 2018-11-25         5   5718       78
## 5239           5233 2018-07-12         5   5716       13
## 5240           5233 2019-03-03         5   5721       75
## 5241           5233 2018-12-22         5   5720       94
## 5242           5233 2019-05-16         5   5724       67
## 5243           5233 2018-08-16         5   5717       32
## 5244           5234 2019-05-10         5   5729       12
## 5245           5234 2018-09-12         5   5727       38
## 5246           5234 2019-06-24         5   5730       89
## 5247           5234 2018-09-01         5   5726      104
## 5248           5235 2018-10-09         5   5732       80
## 5249           5235 2018-12-12         5   5735       47
## 5250           5235 2019-01-29         5   5736       33
## 5251           5235 2019-05-17         5   5739       66
## 5252           5235 2019-04-15         5   5737       97
## 5253           5235 2019-05-24         5   5740       80
## 5254           5236 2019-02-26         5   5746       31
## 5255           5236 2018-07-28         5   5741       33
## 5256           5236 2018-11-10         5   5744       96
## 5257           5236 2018-09-15         5   5743       52
## 5258           5236 2019-04-06         5   5747       45
## 5259           5236 2018-09-14         5   5742       15
## 5260           5236 2019-02-15         5   5745       87
## 5261           5237 2018-09-03         5   5750      107
## 5262           5237 2018-07-25         5   5749       11
## 5263           5237 2018-12-23         5   5752       13
## 5264           5237 2018-10-11         5   5751       77
## 5265           5237 2019-06-10         5   5753       67
## 5266           5238 2018-07-07         5   5754       96
## 5267           5238 2018-12-29         5   5756       42
## 5268           5238 2019-01-14         5   5757      109
## 5269           5238 2019-02-19         5   5759       69
## 5270           5238 2019-03-21         5   5760       27
## 5271           5238 2019-01-17         5   5758       36
## 5272           5238 2019-04-03         5   5761       73
## 5273           5238 2018-07-17         5   5755       92
## 5274           6000 2019-04-21         6   5763       18
## 5275           6002 2018-08-20         6   5764      113
## 5276           6004 2018-10-20         6   5766       67
## 5277           6004 2018-07-22         6   5765       21
## 5278           6005 2019-06-16         6   5770       97
## 5279           6005 2018-11-19         6   5769       54
## 5280           6005 2018-07-14         6   5768       68
## 5281           6006 2019-01-04         6   5771       79
## 5282           6008 2019-03-27         6   5773       25
## 5283           6008 2018-08-15         6   5772       68
## 5284           6009 2019-05-23         6   5774       12
## 5285           6009 2019-06-29         6   5775       73
## 5286           6012 2018-09-08         6   5776      109
## 5287           6013 2018-11-18         6   5777       89
## 5288           6016 2019-04-03         6   5778       10
## 5289           6017 2019-02-26         6   5779       52
## 5290           6017 2019-06-11         6   5780       75
## 5291           6023 2018-12-20         6   5781       68
## 5292           6024 2018-07-04         6   5782       47
## 5293           6025 2018-10-12         6   5783       13
## 5294           6025 2019-05-30         6   5784      102
## 5295           6026 2019-01-15         6   5787      102
## 5296           6026 2018-07-22         6   5785       68
## 5297           6026 2018-09-23         6   5786       89
## 5298           6028 2019-04-21         6   5788       93
## 5299           6030 2018-11-30         6   5789       25
## 5300           6032 2019-02-17         6   5791        7
## 5301           6035 2018-08-21         6   5792       83
## 5302           6035 2018-10-21         6   5793      100
## 5303           6035 2019-05-04         6   5795      100
## 5304           6036 2018-07-31         6   5796       88
## 5305           6037 2018-12-14         6   5798       49
## 5306           6037 2019-05-23         6   5800       30
## 5307           6037 2019-05-22         6   5799      112
## 5308           6038 2019-03-23         6   5801      103
## 5309           6039 2019-05-06         6   5802       66
## 5310           6040 2018-11-16         6   5803       95
## 5311           6041 2019-03-12         6   5804       23
## 5312           6042 2018-08-17         6   5805        2
## 5313           6042 2019-05-20         6   5806       51
## 5314           6042 2019-06-15         6   5807       80
## 5315           6043 2018-07-16         6   5808       12
## 5316           6044 2019-03-24         6   5809       22
## 5317           6045 2019-01-05         6   5811      114
## 5318           6045 2018-10-31         6   5810       20
## 5319           6046 2018-11-22         6   5812       45
## 5320           6046 2019-05-21         6   5813      106
## 5321           6047 2018-08-25         6   5814       94
## 5322           6048 2018-11-09         6   5817       37
## 5323           6048 2018-07-13         6   5816       12
## 5324           6049 2018-09-30         6   5818       79
## 5325           6049 2019-02-10         6   5819       55
## 5326           6050 2019-06-17         6   5820       15
## 5327           6050 2019-06-30         6   5821      112
## 5328           6053 2018-11-02         6   5823       69
## 5329           6053 2018-09-21         6   5822       66
## 5330           6055 2019-01-12         6   5825       74
## 5331           6056 2018-08-19         6   5826       63
## 5332           6056 2018-09-01         6   5827       47
## 5333           6057 2019-04-21         6   5832       53
## 5334           6057 2018-12-17         6   5830       66
## 5335           6057 2018-10-29         6   5828      103
## 5336           6057 2019-01-26         6   5831       82
## 5337           6060 2019-02-19         6   5835       62
## 5338           6060 2018-11-02         6   5834       16
## 5339           6061 2019-03-13         6   5837      109
## 5340           6061 2019-02-04         6   5836      104
## 5341           6062 2018-12-23         6   5839       53
## 5342           6062 2018-10-16         6   5838       88
## 5343           6063 2018-08-21         6   5841       90
## 5344           6063 2018-08-02         6   5840       25
## 5345           6065 2018-10-31         6   5843       58
## 5346           6065 2018-10-28         6   5842       62
## 5347           6066 2018-11-22         6   5844       33
## 5348           6066 2019-03-24         6   5846       11
## 5349           6066 2019-02-11         6   5845      110
## 5350           6067 2018-11-27         6   5847       96
## 5351           6069 2019-06-29         6   5848       24
## 5352           6071 2019-04-11         6   5849      106
## 5353           6073 2019-06-27         6   5851       58
## 5354           6073 2019-03-04         6   5850        6
## 5355           6075 2019-01-14         6   5854      110
## 5356           6075 2018-07-07         6   5853       49
## 5357           6076 2018-12-24         6   5856       72
## 5358           6076 2018-11-24         6   5855       14
## 5359           6077 2019-01-24         6   5857        6
## 5360           6078 2019-04-10         6   5858       74
## 5361           6079 2019-05-01         6   5861       96
## 5362           6079 2018-11-09         6   5859       19
## 5363           6079 2019-03-09         6   5860       91
## 5364           6080 2018-07-21         6   5862       32
## 5365           6083 2019-02-02         6   5864       74
## 5366           6083 2019-05-11         6   5865       11
## 5367           6084 2018-10-28         6   5866       53
## 5368           6085 2019-02-26         6   5867       14
## 5369           6085 2019-06-28         6   5868       16
## 5370           6086 2019-02-13         6   5869      114
## 5371           6087 2019-03-26         6   5872       20
## 5372           6087 2018-09-20         6   5870        5
## 5373           6087 2018-11-22         6   5871       40
## 5374           6090 2018-12-16         6   5874       47
## 5375           6090 2018-08-01         6   5873       45
## 5376           6091 2019-06-30         6   5877       16
## 5377           6091 2018-07-20         6   5875      110
## 5378           6091 2018-11-01         6   5876       44
## 5379           6092 2018-12-29         6   5879      102
## 5380           6092 2018-10-13         6   5878       44
## 5381           6096 2018-11-11         6   5881        4
## 5382           6097 2019-04-12         6   5882      113
## 5383           6099 2019-06-14         6   5885       88
## 5384           6099 2018-09-17         6   5884      114
## 5385           6100 2018-08-16         6   5886       55
## 5386           6101 2018-11-28         6   5887       26
## 5387           6101 2019-01-18         6   5888       11
## 5388           6102 2019-01-28         6   5889       31
## 5389           6103 2018-10-05         6   5890        3
## 5390           6104 2019-04-15         6   5891       60
## 5391           6105 2018-09-09         6   5893       90
## 5392           6105 2018-07-31         6   5892      111
## 5393           6106 2019-01-28         6   5896      114
## 5394           6106 2018-12-15         6   5895       14
## 5395           6107 2019-03-04         6   5899      111
## 5396           6108 2018-08-26         6   5900       30
## 5397           6109 2018-09-05         6   5901       58
## 5398           6111 2018-10-28         6   5903       49
## 5399           6111 2018-08-27         6   5902       70
## 5400           6112 2018-09-03         6   5904       72
## 5401           6113 2019-01-03         6   5905       50
## 5402           6114 2018-09-12         6   5906       71
## 5403           6115 2018-08-07         6   5907       56
## 5404           6115 2018-08-28         6   5908       54
## 5405           6117 2018-07-26         6   5909       44
## 5406           6118 2019-02-12         6   5911       53
## 5407           6119 2018-08-13         6   5912       83
## 5408           6120 2019-03-31         6   5913       92
## 5409           6123 2019-06-12         6   5914      111
## 5410           6124 2018-07-25         6   5915       94
## 5411           6126 2018-07-27         6   5916      109
## 5412           6129 2018-07-23         6   5917       89
## 5413           6130 2019-03-16         6   5919      102
## 5414           6130 2019-04-11         6   5920       14
## 5415           6130 2018-12-07         6   5918      100
## 5416           6132 2019-05-15         6   5923       23
## 5417           6132 2019-05-13         6   5922       70
## 5418           6132 2018-08-06         6   5921      103
## 5419           6133 2019-04-05         6   5926       29
## 5420           6133 2018-09-02         6   5925       24
## 5421           6133 2018-08-31         6   5924       23
## 5422           6134 2018-07-27         6   5927       88
## 5423           6134 2019-06-08         6   5930       73
## 5424           6134 2019-03-05         6   5929       47
## 5425           6137 2019-02-09         6   5931        7
## 5426           6138 2018-10-27         6   5932       77
## 5427           6140 2018-11-27         6   5933       34
## 5428           6144 2018-08-31         6   5934        7
## 5429           6145 2019-01-17         6   5936       29
## 5430           6145 2018-09-03         6   5935       82
## 5431           6147 2019-04-19         6   5938      108
## 5432           6148 2018-10-20         6   5939       71
## 5433           6149 2019-05-18         6   5941       72
## 5434           6149 2018-09-09         6   5940       78
## 5435           6152 2018-12-30         6   5944      113
## 5436           6152 2018-12-20         6   5943       45
## 5437           6153 2019-05-03         6   5945       15
## 5438           6155 2018-11-24         6   5946       37
## 5439           6155 2019-04-24         6   5947      102
## 5440           6157 2019-02-06         6   5950       55
## 5441           6157 2018-12-09         6   5949      109
## 5442           6157 2018-08-20         6   5948       72
## 5443           6158 2018-11-20         6   5951       20
## 5444           6158 2018-12-23         6   5953       51
## 5445           6160 2018-11-24         6   5954       90
## 5446           6160 2019-05-05         6   5955       37
## 5447           6165 2019-02-03         6   5956       83
## 5448           6166 2018-07-15         6   5957       50
## 5449           6168 2018-12-23         6   5959       38
## 5450           6168 2018-09-20         6   5958       48
## 5451           6171 2018-11-30         6   5961       84
## 5452           6171 2018-09-06         6   5960       36
## 5453           6172 2019-05-31         6   5962       97
## 5454           6177 2018-10-22         6   5963       75
## 5455           6178 2019-04-21         6   5965      108
## 5456           6178 2018-08-17         6   5964       18
## 5457           6179 2019-05-25         6   5967      109
## 5458           6181 2018-10-18         6   5968       70
## 5459           6185 2018-08-18         6   5970        6
## 5460           6185 2019-05-22         6   5971       42
## 5461           6187 2019-02-06         6   5973       86
## 5462           6187 2018-07-12         6   5972      110
## 5463           6189 2019-05-10         6   5974       69
## 5464           6191 2019-02-26         6   5977       13
## 5465           6191 2018-12-09         6   5975        7
## 5466           6191 2018-12-11         6   5976       52
## 5467           6192 2018-11-07         6   5979       66
## 5468           6193 2018-07-20         6   5980       48
## 5469           6193 2019-03-01         6   5981        8
## 5470           6194 2018-12-10         6   5982      104
## 5471           6195 2019-06-24         6   5984       73
## 5472           6195 2019-05-29         6   5983       72
## 5473           6196 2018-10-23         6   5987       30
## 5474           6196 2019-03-02         6   5988       97
## 5475           6196 2018-07-04         6   5985       62
## 5476           6196 2018-09-15         6   5986        7
## 5477           6197 2018-10-05         6   5989      105
## 5478           6198 2019-03-10         6   5991       28
## 5479           6198 2018-07-08         6   5990       87
## 5480           6199 2019-03-19         6   5992       51
## 5481           6200 2019-05-22         6   5993       86
## 5482           6202 2018-07-06         6   5995       82
## 5483           6202 2019-02-06         6   5996       34
## 5484           6203 2018-11-25         6   5998       36
## 5485           6203 2018-09-30         6   5997       90
## 5486           6204 2019-04-02         6   5999       12
## 5487           6206 2018-07-03         6   6000      108
## 5488           6208 2019-04-09         6   6001       86
## 5489           6209 2018-07-02         6   6002       55
## 5490           6214 2019-06-21         6   6004       91
## 5491           6215 2019-02-28         6   6005       22
## 5492           6217 2019-03-19         6   6007       37
## 5493           6217 2018-07-22         6   6006       26
## 5494           6220 2019-02-24         6   6011       42
## 5495           6220 2018-11-14         6   6009       78
## 5496           6220 2018-12-01         6   6010       52
## 5497           6220 2018-10-19         6   6008       80
## 5498           6221 2019-03-02         6   6013      110
## 5499           6221 2018-11-03         6   6012      110
## 5500           6222 2018-11-18         6   6014      105
## 5501           6222 2019-05-22         6   6015       53
## 5502           6225 2018-12-23         6   6016       99
## 5503           6225 2019-03-01         6   6017       22
## 5504           6225 2019-03-15         6   6018       47
## 5505           6226 2018-09-21         6   6019       45
## 5506           6226 2018-12-20         6   6020       19
## 5507           6227 2019-04-09         6   6021       69
## 5508           6230 2019-03-03         6   6022       77
## 5509           6230 2019-05-02         6   6023       43
## 5510           6232 2019-02-08         6   6024       68
## 5511           6234 2018-07-09         6   6025       78
## 5512           6235 2018-10-29         6   6027       99
## 5513           6236 2018-11-18         6   6028       32
## 5514           6236 2019-04-08         6   6029       19
## 5515           6237 2019-03-14         6   6030       55
## 5516           6239 2019-01-05         6   6031       38
## 5517           6242 2018-10-20         6   6033       70
## 5518           6244 2019-05-04         6   6034       66
## 5519           6244 2019-05-19         6   6035       74
## 5520           6245 2019-02-12         6   6036       37
## 5521           6246 2019-06-23         6   6038       29
## 5522           6246 2019-04-04         6   6037       81
## 5523           6248 2018-10-11         6   6039       94
## 5524           6248 2019-04-09         6   6040      108
## 5525           6250 2019-01-31         6   6042       83
## 5526           6251 2019-05-06         6   6043       80
## 5527           6253 2019-05-20         6   6044       96
## 5528           6255 2018-10-12         6   6045       15
## 5529           6258 2019-06-30         6   6047       29
## 5530           6258 2018-09-12         6   6046        6
## 5531           6259 2019-04-21         6   6048       82
## 5532           6261 2018-10-11         6   6049       95
## 5533           6262 2019-04-27         6   6050       83
## 5534           6263 2019-01-24         6   6052       36
## 5535           6263 2019-01-19         6   6051       12
## 5536           6265 2019-05-15         6   6053       75
## 5537           6267 2019-05-01         6   6055       78
## 5538           6267 2018-10-18         6   6054      105
## 5539           6268 2018-12-29         6   6058        2
## 5540           6268 2018-12-24         6   6057      113
## 5541           6269 2019-06-02         6   6059       85
## 5542           6270 2019-03-24         6   6061       52
## 5543           6270 2018-11-16         6   6060      107
## 5544           6272 2019-03-24         6   6063       75
## 5545           6273 2018-09-08         6   6064      102
## 5546           6274 2018-11-10         6   6065       21
## 5547           6274 2019-03-20         6   6066       79
## 5548           6276 2019-01-03         6   6069       99
## 5549           6277 2019-03-30         6   6071       18
## 5550           6277 2018-09-04         6   6070       93
## 5551           6278 2019-03-14         6   6073       89
## 5552           6279 2018-09-03         6   6074       55
## 5553           6280 2019-01-23         6   6075       50
## 5554           6281 2018-08-06         6   6077       43
## 5555           6283 2018-11-05         6   6078      107
## 5556           6285 2018-08-06         6   6079       34
## 5557           6285 2019-05-27         6   6081       91
## 5558           6285 2019-04-12         6   6080       19
## 5559           6288 2018-07-07         6   6082      111
## 5560           6290 2019-01-10         6   6085        9
## 5561           6292 2018-10-18         6   6086       49
## 5562           6292 2018-12-15         6   6087       27
## 5563           6293 2019-03-30         6   6088       94
## 5564           6294 2019-01-03         6   6089       70
## 5565           6296 2019-01-01         6   6091       58
## 5566           6299 2019-04-03         6   6092       68
## 5567           6301 2019-05-31         6   6094        5
## 5568           6301 2019-05-01         6   6093      100
## 5569           6306 2018-09-27         6   6095       44
## 5570           6308 2019-06-09         6   6096       53
## 5571           6309 2018-10-13         6   6097       68
## 5572           6310 2018-07-18         6   6098       46
## 5573           6310 2019-02-09         6   6100       87
## 5574           6310 2018-08-19         6   6099       53
## 5575           6311 2018-11-21         6   6101       68
## 5576           6312 2018-07-17         6   6103       56
## 5577           6318 2019-04-01         6   6105       10
## 5578           6319 2018-08-15         6   6106       69
## 5579           6320 2019-04-23         6   6107       83
## 5580           6321 2018-10-05         6   6108      109
## 5581           6322 2019-02-09         6   6109       69
## 5582           6322 2019-04-05         6   6110        2
## 5583           6323 2019-04-11         6   6112        8
## 5584           6323 2018-07-28         6   6111        3
## 5585           6325 2019-01-26         6   6113       61
## 5586           6325 2019-06-05         6   6114       58
## 5587           6326 2018-07-29         6   6115       85
## 5588           6326 2019-06-28         6   6116        8
## 5589           6329 2018-07-12         6   6117       74
## 5590           6333 2018-10-15         6   6118       53
## 5591           6334 2019-05-09         6   6120       26
## 5592           6334 2018-09-17         6   6119       52
## 5593           6335 2018-10-08         6   6121      114
## 5594           6335 2019-03-15         6   6122       20
## 5595           6337 2019-03-19         6   6124       34
## 5596           6338 2018-07-01         6   6125       56
## 5597           6340 2019-05-22         6   6126       14
## 5598           6341 2019-02-04         6   6127        7
## 5599           6342 2018-08-30         6   6130       93
## 5600           6342 2018-08-16         6   6129       10
## 5601           6342 2018-07-15         6   6128       70
## 5602           6343 2018-10-02         6   6131       20
## 5603           6343 2019-05-06         6   6132        8
## 5604           6344 2018-09-06         6   6133       81
## 5605           6345 2018-07-05         6   6134       96
## 5606           6346 2018-11-18         6   6135       88
## 5607           6347 2018-09-11         6   6136       69
## 5608           6347 2019-05-06         6   6137       86
## 5609           6348 2018-07-09         6   6138       40
## 5610           6349 2019-01-27         6   6139       40
## 5611           6353 2019-02-09         6   6141       75
## 5612           6354 2018-07-05         6   6142       68
## 5613           6356 2019-05-20         6   6143       62
## 5614           6358 2019-06-30         6   6145       87
## 5615           6359 2018-10-03         6   6146       53
## 5616           6360 2018-12-19         6   6147       53
## 5617           6361 2018-10-26         6   6148       62
## 5618           6362 2018-07-27         6   6149       10
## 5619           6364 2019-01-20         6   6150       16
## 5620           6365 2019-02-08         6   6151       91
## 5621           6367 2018-11-01         6   6152        3
## 5622           6368 2018-10-29         6   6153       43
## 5623           6369 2018-12-03         6   6154       81
## 5624           6372 2018-10-09         6   6156       48
## 5625           6373 2019-02-07         6   6158       13
## 5626           6373 2019-05-03         6   6159       21
## 5627           6373 2018-08-15         6   6157       72
## 5628           6374 2019-04-06         6   6162       29
## 5629           6374 2018-09-13         6   6160        8
## 5630           6374 2018-10-16         6   6161       84
## 5631           6375 2019-01-20         6   6163      112
## 5632           6377 2019-02-14         6   6165        6
## 5633           6377 2018-08-22         6   6164        5
## 5634           6379 2019-04-28         6   6167       19
## 5635           6379 2018-09-15         6   6166      100
## 5636           6381 2018-11-03         6   6168       93
## 5637           6382 2018-12-09         6   6169       85
## 5638           6383 2019-02-15         6   6170      106
## 5639           6383 2019-06-16         6   6171       13
## 5640           6384 2019-01-10         6   6173       88
## 5641           6384 2019-06-10         6   6174       52
## 5642           6384 2018-12-13         6   6172       71
## 5643           6386 2019-06-14         6   6176       42
## 5644           6386 2018-11-25         6   6175       58
## 5645           6388 2018-07-14         6   6177      109
## 5646           6388 2019-05-03         6   6182       62
## 5647           6388 2018-07-18         6   6178       17
## 5648           6388 2018-08-12         6   6180       94
## 5649           6388 2018-07-20         6   6179       69
## 5650           6388 2019-01-13         6   6181       25
## 5651           6391 2019-03-08         6   6183       52
## 5652           6391 2019-04-07         6   6184        5
## 5653           6392 2019-04-16         6   6185       60
## 5654           6395 2018-10-24         6   6187       66
## 5655           6395 2019-02-11         6   6188        4
## 5656           6396 2018-10-08         6   6189       86
## 5657           6398 2018-10-11         6   6191       89
## 5658           6399 2018-10-28         6   6193       88
## 5659           6399 2018-09-21         6   6192      102
## 5660           6400 2018-10-27         6   6194       96
## 5661           6401 2018-12-12         6   6195       93
## 5662           6401 2019-04-14         6   6196       90
## 5663           6403 2019-01-03         6   6198       55
## 5664           6404 2018-11-21         6   6199       54
## 5665           6404 2019-03-28         6   6201       80
## 5666           6404 2018-11-22         6   6200       92
## 5667           6405 2019-06-15         6   6205       54
## 5668           6405 2019-03-30         6   6204       46
## 5669           6405 2018-07-11         6   6202       23
## 5670           6405 2018-11-22         6   6203       98
## 5671           6406 2019-04-29         6   6207       46
## 5672           6407 2018-12-18         6   6208       56
## 5673           6409 2019-01-11         6   6209      110
## 5674           6412 2018-12-12         6   6211      109
## 5675           6413 2019-01-09         6   6212       14
## 5676           6415 2019-03-01         6   6213      100
## 5677           6417 2019-05-17         6   6214        2
## 5678           6420 2019-05-03         6   6216       11
## 5679           6420 2018-12-05         6   6215       16
## 5680           6421 2018-08-07         6   6217       55
## 5681           6421 2018-10-22         6   6218       29
## 5682           6423 2019-06-03         6   6222       74
## 5683           6423 2018-08-15         6   6219       18
## 5684           6423 2018-09-03         6   6220       12
## 5685           6423 2018-12-10         6   6221       54
## 5686           6424 2018-08-11         6   6223       49
## 5687           6425 2019-02-22         6   6225       31
## 5688           6425 2018-12-20         6   6224        3
## 5689           6426 2018-10-30         6   6226       91
## 5690           6426 2018-11-23         6   6227       22
## 5691           6427 2018-11-26         6   6228       29
## 5692           6429 2019-01-02         6   6229       51
## 5693           6432 2019-04-03         6   6231       30
## 5694           6432 2018-11-09         6   6230       38
## 5695           6434 2018-11-21         6   6232       88
## 5696           6435 2018-09-11         6   6233       89
## 5697           6437 2018-12-02         6   6235       58
## 5698           6437 2018-08-14         6   6234       29
## 5699           6437 2019-02-07         6   6236       16
## 5700           6438 2018-09-13         6   6237       22
## 5701           6438 2018-12-28         6   6238       90
## 5702           6438 2019-05-14         6   6239       45
## 5703           6439 2019-05-21         6   6242        8
## 5704           6439 2018-08-23         6   6240       72
## 5705           6439 2018-09-23         6   6241      110
## 5706           6441 2018-08-05         6   6243       40
## 5707           6443 2018-07-20         6   6245       43
## 5708           6443 2019-06-03         6   6249       17
## 5709           6443 2018-07-12         6   6244       30
## 5710           6443 2019-05-05         6   6248       63
## 5711           6443 2019-03-10         6   6247       94
## 5712           6443 2018-10-31         6   6246       75
## 5713           6444 2019-02-16         6   6250       17
## 5714           6445 2018-11-05         6   6251      111
## 5715           6446 2019-05-30         6   6254       40
## 5716           6446 2018-11-20         6   6253       67
## 5717           6447 2018-10-23         6   6255       69
## 5718           6447 2018-12-26         6   6256       52
## 5719           6448 2019-05-06         6   6259       61
## 5720           6448 2019-01-01         6   6258       83
## 5721           6448 2018-10-26         6   6257       84
## 5722           6449 2018-10-29         6   6260       49
## 5723           6450 2019-02-27         6   6261       89
## 5724           6451 2019-01-10         6   6263      102
## 5725           6451 2019-01-02         6   6262       44
## 5726           6452 2019-06-29         6   6265       77
## 5727           6452 2018-09-01         6   6264       78
## 5728           6454 2018-07-03         6   6266       71
## 5729           6455 2019-06-29         6   6267       80
## 5730           6457 2019-04-22         6   6268       75
## 5731           6459 2019-06-10         6   6270       25
## 5732           6459 2018-10-17         6   6269       24
## 5733           6461 2018-11-20         6   6271       50
## 5734           6462 2018-12-23         6   6272        5
## 5735           6462 2019-06-22         6   6273       44
## 5736           6465 2018-11-23         6   6275       34
## 5737           6465 2018-08-21         6   6274       33
## 5738           6466 2019-03-11         6   6277       45
## 5739           6467 2018-08-17         6   6278       17
## 5740           6467 2019-03-17         6   6279      103
## 5741           6471 2018-10-20         6   6280       88
## 5742           6473 2018-11-07         6   6281       38
## 5743           6473 2019-06-27         6   6284       38
## 5744           6474 2018-10-06         6   6285       75
## 5745           6476 2018-07-09         6   6286       10
## 5746           6479 2019-06-25         6   6288       52
## 5747           6479 2019-02-13         6   6287      100
## 5748           6481 2019-02-18         6   6291       80
## 5749           6481 2018-08-05         6   6289       15
## 5750           6484 2018-11-04         6   6292       62
## 5751           6484 2018-12-22         6   6293       15
## 5752           6486 2019-06-09         6   6294       10
## 5753           6487 2019-05-31         6   6295       37
## 5754           6489 2019-03-22         6   6297       45
## 5755           6490 2019-06-20         6   6299       48
## 5756           6492 2018-11-10         6   6300       66
## 5757           6493 2019-01-21         6   6301       96
## 5758           6493 2019-05-08         6   6302        9
## 5759           6494 2018-07-31         6   6303       63
## 5760           7000 2018-10-23         7   6306       46
## 5761           7000 2019-04-03         7   6308      102
## 5762           7000 2018-09-19         7   6305       77
## 5763           7000 2019-06-14         7   6309      108
## 5764           7000 2018-09-10         7   6304      112
## 5765           7001 2019-06-21         7   6311      114
## 5766           7001 2019-02-03         7   6310       78
## 5767           7002 2019-06-28         7   6313      113
## 5768           7002 2018-10-11         7   6312       23
## 5769           7003 2019-04-23         7   6319       51
## 5770           7003 2018-09-11         7   6314       25
## 5771           7003 2019-04-09         7   6318      112
## 5772           7003 2018-11-02         7   6316       87
## 5773           7003 2019-02-06         7   6317       40
## 5774           7004 2018-10-02         7   6321        3
## 5775           7004 2018-08-14         7   6320       31
## 5776           7004 2019-03-19         7   6324       74
## 5777           7004 2019-04-07         7   6325       31
## 5778           7004 2018-10-29         7   6322       87
## 5779           7005 2019-01-29         7   6326      108
## 5780           7006 2019-02-09         7   6330       14
## 5781           7006 2018-09-11         7   6328       88
## 5782           7006 2018-08-17         7   6327      114
## 5783           7006 2019-01-04         7   6329       75
## 5784           7007 2019-06-07         7   6332       77
## 5785           7007 2019-05-04         7   6331       36
## 5786           7008 2018-12-30         7   6338       31
## 5787           7008 2018-08-20         7   6334       71
## 5788           7008 2019-03-02         7   6339      102
## 5789           7008 2019-04-05         7   6340       16
## 5790           7008 2018-08-06         7   6333       31
## 5791           7008 2018-10-17         7   6336       42
## 5792           7008 2018-11-29         7   6337      108
## 5793           7008 2018-09-17         7   6335      108
## 5794           7009 2019-06-08         7   6343       14
## 5795           7009 2018-10-30         7   6341       60
## 5796           7009 2019-06-21         7   6344       70
## 5797           7009 2019-06-28         7   6345       60
## 5798           7010 2018-07-22         7   6346       89
## 5799           7010 2018-08-24         7   6347       34
## 5800           7010 2019-03-25         7   6349        2
## 5801           7010 2018-11-18         7   6348        4
## 5802           7011 2018-08-19         7   6351       51
## 5803           7011 2018-10-14         7   6352       89
## 5804           7011 2019-03-10         7   6354       46
## 5805           7011 2019-01-13         7   6353       17
## 5806           7012 2019-02-14         7   6359       90
## 5807           7012 2018-07-11         7   6355      109
## 5808           7012 2019-05-06         7   6360      104
## 5809           7012 2018-08-20         7   6357      108
## 5810           7012 2018-07-26         7   6356      114
## 5811           7013 2019-04-26         7   6369      113
## 5812           7013 2019-03-31         7   6368        4
## 5813           7013 2019-02-28         7   6367      108
## 5814           7013 2019-06-11         7   6370       49
## 5815           7013 2018-09-02         7   6362       46
## 5816           7013 2019-02-27         7   6366      112
## 5817           7013 2019-06-22         7   6371       99
## 5818           7013 2018-10-24         7   6363       77
## 5819           7013 2019-02-13         7   6365       99
## 5820           7013 2018-08-18         7   6361       20
## 5821           7014 2018-12-08         7   6372       99
## 5822           7014 2019-06-12         7   6373       47
## 5823           7015 2019-03-29         7   6376       71
## 5824           7015 2019-01-13         7   6374      108
## 5825           7015 2019-01-24         7   6375       52
## 5826           7016 2018-12-16         7   6377       34
## 5827           7016 2019-04-24         7   6379       46
## 5828           7018 2019-04-14         7   6384       23
## 5829           7018 2018-12-18         7   6381      112
## 5830           7018 2019-03-13         7   6383       75
## 5831           7019 2018-10-04         7   6385       42
## 5832           7020 2018-08-19         7   6386      114
## 5833           7020 2019-04-16         7   6389       50
## 5834           7020 2018-09-04         7   6387      102
## 5835           7020 2019-03-10         7   6388       16
## 5836           7021 2018-12-31         7   6391       78
## 5837           7022 2018-11-28         7   6394       90
## 5838           7022 2019-02-25         7   6395       74
## 5839           7022 2019-06-12         7   6396       30
## 5840           7022 2018-08-17         7   6392       25
## 5841           7022 2018-10-30         7   6393       62
## 5842           7023 2018-08-21         7   6398       16
## 5843           7023 2018-07-26         7   6397       31
## 5844           7024 2018-12-12         7   6401       15
## 5845           7024 2019-06-28         7   6406       44
## 5846           7024 2018-10-19         7   6399       44
## 5847           7024 2019-06-07         7   6405       99
## 5848           7024 2018-12-30         7   6402       25
## 5849           7024 2019-04-06         7   6404       34
## 5850           7024 2019-04-04         7   6403       89
## 5851           7024 2018-11-17         7   6400       62
## 5852           7025 2019-04-04         7   6407        4
## 5853           7026 2019-01-04         7   6410       81
## 5854           7026 2019-02-22         7   6411        7
## 5855           7026 2018-08-21         7   6408       40
## 5856           7026 2018-10-27         7   6409       36
## 5857           7027 2018-09-18         7   6412       33
## 5858           7027 2018-12-07         7   6413       47
## 5859           7027 2019-06-14         7   6414      113
## 5860           7028 2018-09-07         7   6415       14
## 5861           7028 2018-10-08         7   6416       62
## 5862           7028 2019-06-04         7   6420      112
## 5863           7028 2019-06-25         7   6421       28
## 5864           7028 2019-04-14         7   6419       62
## 5865           7028 2019-03-02         7   6418       33
## 5866           7028 2018-11-10         7   6417       77
## 5867           7029 2018-09-05         7   6424       47
## 5868           7029 2018-07-03         7   6422        7
## 5869           7029 2018-07-31         7   6423       23
## 5870           7030 2018-11-16         7   6425      112
## 5871           7030 2018-12-12         7   6426       50
## 5872           7030 2018-12-30         7   6427       33
## 5873           7031 2018-08-19         7   6428       32
## 5874           7032 2019-03-24         7   6436       87
## 5875           7032 2018-07-23         7   6431      112
## 5876           7032 2019-01-12         7   6434       15
## 5877           7032 2019-05-10         7   6437        2
## 5878           7032 2018-09-28         7   6433       23
## 5879           7032 2019-02-11         7   6435       30
## 5880           7032 2018-07-27         7   6432       93
## 5881           7033 2018-12-18         7   6441       44
## 5882           7033 2018-07-20         7   6438      112
## 5883           7033 2018-08-27         7   6439       14
## 5884           7033 2018-11-04         7   6440       50
## 5885           7034 2018-08-23         7   6442       71
## 5886           7034 2019-03-05         7   6444       99
## 5887           7034 2018-11-18         7   6443       51
## 5888           7035 2018-10-06         7   6446       20
## 5889           7035 2018-08-09         7   6445       49
## 5890           7036 2018-08-19         7   6447      114
## 5891           7036 2019-05-05         7   6450       23
## 5892           7036 2019-05-21         7   6451        9
## 5893           7036 2019-06-25         7   6452       68
## 5894           7036 2019-03-07         7   6449       40
## 5895           7036 2019-02-12         7   6448       26
## 5896           7037 2019-06-18         7   6458       20
## 5897           7037 2019-05-31         7   6457       42
## 5898           7037 2019-03-01         7   6455       78
## 5899           7037 2018-08-20         7   6453       17
## 5900           7037 2019-03-19         7   6456       42
## 5901           7037 2018-11-06         7   6454       30
## 5902           7038 2018-11-28         7   6460       26
## 5903           7038 2018-08-17         7   6459       32
## 5904           7038 2019-01-19         7   6461       89
## 5905           7038 2019-03-20         7   6462       90
## 5906           7038 2019-04-26         7   6463       71
## 5907           7039 2018-10-05         7   6464       16
## 5908           7039 2019-03-28         7   6465       47
## 5909           7039 2019-04-08         7   6466       46
## 5910           7039 2019-06-26         7   6468       49
## 5911           7039 2019-05-13         7   6467       20
## 5912           7040 2019-02-21         7   6469       14
## 5913           7041 2018-10-11         7   6471        4
## 5914           7041 2019-02-04         7   6472        4
## 5915           7041 2019-02-21         7   6473       44
## 5916           7041 2019-04-23         7   6474       42
## 5917           7041 2018-10-06         7   6470        4
## 5918           7042 2019-03-20         7   6478       34
## 5919           7042 2019-03-24         7   6479       34
## 5920           7042 2019-05-16         7   6482        9
## 5921           7042 2019-05-01         7   6480       42
## 5922           7042 2019-05-28         7   6483       23
## 5923           7042 2018-11-03         7   6476       81
## 5924           7042 2019-05-06         7   6481       90
## 5925           7042 2018-08-17         7   6475       44
## 5926           7042 2018-11-06         7   6477       49
## 5927           7043 2019-05-10         7   6486      102
## 5928           7043 2019-06-21         7   6487       36
## 5929           7043 2019-03-01         7   6485       62
## 5930           7043 2019-01-08         7   6484       63
## 5931           7044 2018-07-12         7   6488       40
## 5932           7044 2019-06-22         7   6491       50
## 5933           7044 2019-06-16         7   6490       88
## 5934           7044 2019-03-26         7   6489       87
## 5935           7045 2018-08-07         7   6492       49
## 5936           7045 2019-03-07         7   6493       52
## 5937           7045 2019-04-05         7   6494       74
## 5938           7045 2019-04-26         7   6495       63
## 5939           7046 2019-05-19         7   6500       20
## 5940           7046 2018-07-21         7   6496       32
## 5941           7046 2019-01-31         7   6499       60
## 5942           7046 2018-10-12         7   6497       81
## 5943           7046 2018-12-16         7   6498       60
## 5944           7047 2019-03-28         7   6501       88
## 5945           7048 2019-03-24         7   6504        7
## 5946           7048 2018-10-06         7   6502        7
## 5947           7048 2019-03-05         7   6503      109
## 5948           7048 2019-04-09         7   6505      102
## 5949           7049 2019-01-05         7   6507       42
## 5950           7049 2018-08-26         7   6506       70
## 5951           7049 2019-06-13         7   6508      109
## 5952           7050 2019-03-05         7   6510       36
## 5953           7050 2019-05-09         7   6511       26
## 5954           7051 2018-12-31         7   6513       26
## 5955           7052 2018-07-06         7   6514       15
## 5956           7052 2018-10-26         7   6515       32
## 5957           7053 2018-07-15         7   6516        4
## 5958           7053 2019-05-11         7   6519       89
## 5959           7053 2018-10-02         7   6517       52
## 5960           7054 2019-03-02         7   6523       14
## 5961           7054 2019-04-15         7   6524       52
## 5962           7054 2018-08-04         7   6520       52
## 5963           7054 2019-02-17         7   6522       20
## 5964           7054 2018-12-19         7   6521      104
## 5965           7055 2018-11-19         7   6525       20
## 5966           7056 2019-06-30         7   6529       20
## 5967           7056 2018-07-28         7   6526       50
## 5968           7056 2019-05-09         7   6528       25
## 5969           7057 2019-05-22         7   6531       33
## 5970           7057 2018-11-01         7   6530       30
## 5971           7058 2019-02-12         7   6535       15
## 5972           7058 2018-07-24         7   6533       62
## 5973           7058 2018-07-15         7   6532       42
## 5974           7058 2018-08-21         7   6534       75
## 5975           7059 2019-04-07         7   6539        3
## 5976           7059 2018-07-25         7   6536       71
## 5977           7059 2019-02-24         7   6537       81
## 5978           7059 2019-03-12         7   6538       32
## 5979           7059 2019-06-22         7   6540       33
## 5980           7060 2019-03-25         7   6543       36
## 5981           7060 2018-12-09         7   6541       44
## 5982           7060 2019-02-27         7   6542       40
## 5983           7061 2019-02-27         7   6544       16
## 5984           7062 2019-06-08         7   6546       50
## 5985           7062 2018-12-08         7   6545       42
## 5986           7063 2018-12-16         7   6548      113
## 5987           7063 2019-05-13         7   6550      109
## 5988           7063 2019-05-02         7   6549       74
## 5989           7063 2018-12-02         7   6547       28
## 5990           7064 2019-05-30         7   6552       87
## 5991           7064 2018-11-23         7   6551       77
## 5992           7064 2019-06-10         7   6553        7
## 5993           7065 2018-07-13         7   6554        7
## 5994           7065 2018-09-02         7   6555       52
## 5995           7065 2018-11-12         7   6556       28
## 5996           7066 2019-03-04         7   6561       24
## 5997           7066 2019-01-18         7   6560       17
## 5998           7066 2018-10-10         7   6558       51
## 5999           7066 2019-03-05         7   6562       50
## 6000           7066 2018-12-19         7   6559       71
## 6001           7066 2018-08-15         7   6557       34
## 6002           7066 2019-04-16         7   6563       60
## 6003           7067 2018-07-06         7   6564      108
## 6004           7067 2019-03-31         7   6567       17
## 6005           7067 2019-02-14         7   6566       50
## 6006           7067 2019-06-06         7   6568       99
## 6007           7068 2018-12-02         7   6569       44
## 6008           7069 2019-03-14         7   6572      102
## 6009           7069 2018-09-28         7   6571        2
## 6010           7069 2018-08-29         7   6570       49
## 6011           7069 2019-03-14         7   6572       25
## 6012           7070 2019-06-11         7   6575        2
## 6013           7070 2019-03-03         7   6574       24
## 6014           7070 2019-01-01         7   6573       20
## 6015           7071 2019-06-06         7   6582       25
## 6016           7071 2019-06-15         7   6583        7
## 6017           7071 2019-01-12         7   6580       26
## 6018           7071 2018-10-27         7   6577       60
## 6019           7071 2018-08-28         7   6576       40
## 6020           7071 2018-10-30         7   6578       51
## 6021           7071 2019-03-29         7   6581       26
## 6022           7071 2018-12-07         7   6579       34
## 6023           7072 2019-05-08         7   6586       99
## 6024           7072 2019-05-14         7   6587      104
## 6025           7072 2019-02-11         7   6585       81
## 6026           7072 2018-08-30         7   6584       20
## 6027           7073 2019-01-19         7   6589       23
## 6028           7073 2019-01-22         7   6590       63
## 6029           7074 2018-11-18         7   6591       50
## 6030           7074 2019-01-10         7   6592       77
## 6031           7074 2019-01-24         7   6593       17
## 6032           7074 2019-06-29         7   6594       51
## 6033           7075 2018-09-22         7   6595       15
## 6034           7075 2019-02-06         7   6596       46
## 6035           7075 2019-05-22         7   6597        3
## 6036           7076 2018-10-04         7   6598       17
## 6037           7076 2019-05-01         7   6599       62
## 6038           7077 2018-07-21         7   6601       28
## 6039           7077 2018-08-06         7   6602       99
## 6040           7077 2018-10-14         7   6603       15
## 6041           7077 2019-03-12         7   6606       40
## 6042           7077 2018-11-08         7   6605       74
## 6043           7077 2018-10-26         7   6604       63
## 6044           7078 2019-01-07         7   6607       26
## 6045           7078 2019-04-22         7   6608        7
## 6046           7079 2019-02-23         7   6609        3
## 6047           7080 2018-09-16         7   6611       51
## 6048           7080 2019-04-14         7   6612       46
## 6049           7080 2019-05-29         7   6613       17
## 6050           7080 2018-08-18         7   6610       60
## 6051           7081 2019-03-14         7   6615       52
## 6052           7081 2018-09-02         7   6614       87
## 6053           7081 2019-06-10         7   6616      114
## 6054           7082 2019-05-14         7   6624       34
## 6055           7082 2018-08-18         7   6617       60
## 6056           7082 2018-08-19         7   6618       60
## 6057           7082 2018-12-19         7   6623       31
## 6058           7082 2018-11-19         7   6622       68
## 6059           7082 2018-08-20         7   6619       52
## 6060           7082 2018-11-18         7   6621       34
## 6061           7083 2018-10-21         7   6625       70
## 6062           7083 2019-03-31         7   6627        4
## 6063           7083 2019-05-27         7   6628       71
## 6064           7083 2018-11-02         7   6626       32
## 6065           7084 2019-02-19         7   6633       63
## 6066           7084 2019-02-03         7   6632      113
## 6067           7084 2018-11-20         7   6629       40
## 6068           7084 2019-01-29         7   6631       20
## 6069           7084 2019-05-23         7   6634       36
## 6070           7086 2018-11-09         7   6638       87
## 6071           7086 2018-10-05         7   6637       71
## 6072           7086 2018-07-28         7   6636        9
## 6073           7086 2019-05-22         7   6639       40
## 6074           7087 2019-05-11         7   6643       16
## 6075           7087 2019-05-24         7   6644       40
## 6076           7087 2018-11-19         7   6641       49
## 6077           7087 2019-03-08         7   6642       93
## 6078           7087 2018-08-30         7   6640       49
## 6079           7087 2019-05-24         7   6644       24
## 6080           7088 2018-08-08         7   6645       28
## 6081           7088 2019-03-28         7   6646        3
## 6082           7089 2018-07-08         7   6647       24
## 6083           7089 2018-10-09         7   6648      114
## 6084           7090 2018-08-08         7   6650      104
## 6085           7090 2018-08-21         7   6652       23
## 6086           7090 2018-07-13         7   6649       36
## 6087           7090 2018-08-10         7   6651       24
## 6088           7091 2019-02-22         7   6656       90
## 6089           7091 2019-05-23         7   6659       30
## 6090           7091 2019-02-28         7   6657       20
## 6091           7091 2018-11-08         7   6654      108
## 6092           7091 2018-07-05         7   6653       42
## 6093           7091 2019-01-15         7   6655       93
## 6094           7091 2019-03-03         7   6658       74
## 6095           7092 2019-06-19         7   6665       89
## 6096           7092 2019-01-31         7   6662       60
## 6097           7092 2019-05-30         7   6664       89
## 6098           7092 2018-10-08         7   6660       47
## 6099           7092 2019-05-07         7   6663       40
## 6100           7093 2018-09-10         7   6667      104
## 6101           7093 2019-04-21         7   6672       14
## 6102           7093 2019-06-02         7   6674       28
## 6103           7093 2018-11-18         7   6669        3
## 6104           7093 2019-04-10         7   6671       60
## 6105           7093 2019-04-27         7   6673       70
## 6106           7093 2018-10-01         7   6668      102
## 6107           7093 2018-09-07         7   6666       23
## 6108           7093 2019-02-11         7   6670       87
## 6109           7094 2018-11-20         7   6675       68
## 6110           7094 2019-01-03         7   6676       14
## 6111           7095 2019-06-09         7   6677       42
## 6112           7096 2019-04-14         7   6678       14
## 6113           7097 2018-11-26         7   6679      104
## 6114           7097 2019-03-05         7   6682       51
## 6115           7097 2018-12-24         7   6681       87
## 6116           7097 2018-12-20         7   6680       15
## 6117           7098 2018-09-04         7   6683       78
## 6118           7098 2018-11-05         7   6684       40
## 6119           7099 2018-10-06         7   6688       81
## 6120           7099 2018-08-15         7   6686       89
## 6121           7099 2018-09-21         7   6687        3
## 6122           7099 2019-06-11         7   6689       42
## 6123           7100 2019-05-16         7   6691       51
## 6124           7100 2019-06-26         7   6692       50
## 6125           7100 2018-07-23         7   6690      108
## 6126           7101 2019-02-24         7   6694       44
## 6127           7101 2018-07-26         7   6693       31
## 6128           7102 2018-08-30         7   6696       17
## 6129           7102 2018-10-07         7   6697        3
## 6130           7102 2018-11-29         7   6698       87
## 6131           7102 2019-03-27         7   6699      102
## 6132           7102 2018-08-16         7   6695       89
## 6133           7103 2018-09-25         7   6702       15
## 6134           7103 2019-06-07         7   6703       44
## 6135           7103 2018-08-28         7   6701       60
## 6136           7104 2019-03-27         7   6705       15
## 6137           7105 2018-07-14         7   6706       81
## 6138           7105 2019-04-28         7   6708       26
## 6139           7105 2019-06-14         7   6709       99
## 6140           7105 2019-03-10         7   6707       44
## 6141           7106 2018-11-16         7   6710       20
## 6142           7106 2019-01-03         7   6712       74
## 6143           7106 2019-04-01         7   6713       49
## 6144           7106 2018-12-03         7   6711       71
## 6145           7107 2019-04-05         7   6716       90
## 6146           7108 2018-09-17         7   6717       14
## 6147           7108 2018-11-30         7   6718       71
## 6148           7108 2019-01-16         7   6719       14
## 6149           7108 2019-03-15         7   6720       30
## 6150           7109 2018-12-20         7   6721       71
## 6151           7110 2019-01-29         7   6725       16
## 6152           7110 2018-07-25         7   6722       47
## 6153           7110 2018-12-20         7   6724       26
## 6154           7110 2018-07-30         7   6723        3
## 6155           7111 2018-09-07         7   6727       15
## 6156           7111 2018-09-03         7   6726      114
## 6157           7111 2019-05-31         7   6730        7
## 6158           7111 2018-11-22         7   6728       63
## 6159           7111 2019-01-04         7   6729       30
## 6160           7111 2019-01-04         7   6729       24
## 6161           7112 2019-01-04         7   6736       25
## 6162           7112 2018-08-29         7   6733       49
## 6163           7112 2018-12-20         7   6734       46
## 6164           7112 2019-06-10         7   6738       31
## 6165           7112 2018-12-29         7   6735       70
## 6166           7112 2019-02-12         7   6737       99
## 6167           7112 2018-08-27         7   6732       70
## 6168           7112 2018-07-23         7   6731       49
## 6169           7113 2018-11-18         7   6741      108
## 6170           7113 2018-07-31         7   6739      114
## 6171           7113 2019-04-09         7   6744       40
## 6172           7113 2018-11-25         7   6742       63
## 6173           7113 2019-03-17         7   6743       90
## 6174           7114 2018-09-13         7   6746        4
## 6175           7114 2018-07-09         7   6745       28
## 6176           7114 2019-05-03         7   6747       90
## 6177           7115 2019-04-20         7   6749       99
## 6178           7115 2019-05-23         7   6750       99
## 6179           7115 2018-10-04         7   6748       75
## 6180           7116 2018-09-07         7   6751       44
## 6181           7116 2018-11-12         7   6752       20
## 6182           7117 2018-10-25         7   6754        7
## 6183           7117 2018-09-30         7   6753       99
## 6184           7117 2019-05-04         7   6756       17
## 6185           7117 2019-06-18         7   6757       75
## 6186           7118 2019-01-10         7   6758      113
## 6187           7118 2019-02-08         7   6759       70
## 6188           7118 2019-05-13         7   6760       28
## 6189           7119 2018-07-05         7   6761       68
## 6190           7120 2019-02-06         7   6763       16
## 6191           7120 2019-02-23         7   6765       71
## 6192           7120 2019-02-18         7   6764        9
## 6193           7120 2018-10-11         7   6762        4
## 6194           7121 2018-10-19         7   6766       42
## 6195           7122 2019-06-09         7   6769       26
## 6196           7122 2019-05-27         7   6768       20
## 6197           7122 2018-09-05         7   6767      113
## 6198           7123 2018-12-17         7   6771       93
## 6199           7123 2018-12-17         7   6771       74
## 6200           7124 2018-12-17         7   6774       68
## 6201           7124 2019-04-27         7   6777       47
## 6202           7124 2019-06-23         7   6778       30
## 6203           7124 2018-08-16         7   6772       15
## 6204           7124 2019-03-28         7   6775       17
## 6205           7124 2018-09-24         7   6773       62
## 6206           7124 2019-03-31         7   6776       78
## 6207           7125 2018-11-06         7   6780       63
## 6208           7125 2018-12-19         7   6781       32
## 6209           7125 2019-03-18         7   6782       74
## 6210           7125 2018-08-30         7   6779      114
## 6211           7126 2018-10-11         7   6784       63
## 6212           7126 2018-09-07         7   6783       14
## 6213           7126 2018-10-12         7   6785       32
## 6214           7126 2019-03-13         7   6786       28
## 6215           7127 2018-07-29         7   6787       89
## 6216           7127 2018-09-22         7   6789       78
## 6217           7127 2018-09-09         7   6788       26
## 6218           7128 2018-09-13         7   6790       88
## 6219           7128 2019-01-26         7   6794      102
## 6220           7128 2018-12-26         7   6792      113
## 6221           7128 2018-10-04         7   6791      112
## 6222           7129 2018-09-16         7   6795       74
## 6223           7129 2019-02-19         7   6798       14
## 6224           7129 2019-05-27         7   6799        3
## 6225           7129 2018-12-22         7   6797      109
## 6226           7129 2018-12-15         7   6796       74
## 6227           7130 2018-07-11         7   6800       40
## 6228           7130 2018-07-13         7   6801       36
## 6229           7130 2018-12-22         7   6802       40
## 6230           7131 2018-11-24         7   6804       30
## 6231           7131 2018-09-02         7   6803       36
## 6232           7131 2019-05-18         7   6805       16
## 6233           7131 2019-06-06         7   6807       16
## 6234           7131 2019-05-25         7   6806      113
## 6235           7132 2018-12-30         7   6808       14
## 6236           7132 2019-05-03         7   6811      109
## 6237           7132 2019-03-08         7   6810      112
## 6238           7132 2019-01-26         7   6809       51
## 6239           7132 2019-06-17         7   6812      113
## 6240           7133 2018-10-14         7   6814       75
## 6241           7133 2019-03-26         7   6817       87
## 6242           7133 2018-07-27         7   6813      102
## 6243           7133 2018-11-24         7   6815       71
## 6244           7133 2019-01-19         7   6816       25
## 6245           7134 2019-04-16         7   6820       31
## 6246           7134 2019-05-28         7   6823       51
## 6247           7134 2018-07-29         7   6819       20
## 6248           7134 2019-05-06         7   6822       50
## 6249           7134 2019-04-29         7   6821       90
## 6250           7134 2018-07-13         7   6818        7
## 6251           7135 2018-08-12         7   6824       75
## 6252           7135 2019-01-16         7   6827      109
## 6253           7135 2019-01-15         7   6826       63
## 6254           7135 2018-09-03         7   6825       30
## 6255           7135 2019-03-25         7   6829       40
## 6256           7136 2018-09-13         7   6831       47
## 6257           7136 2018-07-14         7   6830       32
## 6258           7136 2018-12-12         7   6832        3
## 6259           7136 2019-01-13         7   6834       36
## 6260           7137 2018-07-06         7   6835      102
## 6261           7137 2019-04-03         7   6839       78
## 6262           7137 2019-02-09         7   6837        2
## 6263           7137 2018-07-24         7   6836       26
## 6264           7137 2019-03-28         7   6838       33
## 6265           7138 2018-11-19         7   6842       81
## 6266           7139 2018-07-01         7   6843       75
## 6267           7139 2018-11-16         7   6846       89
## 6268           7139 2018-10-06         7   6844       47
## 6269           7139 2019-06-28         7   6850       42
## 6270           7139 2019-05-01         7   6849       34
## 6271           7139 2018-10-07         7   6845       77
## 6272           7139 2018-12-07         7   6848       26
## 6273           7139 2018-12-05         7   6847       32
## 6274           7140 2018-12-30         7   6855      113
## 6275           7140 2018-07-18         7   6853       44
## 6276           7140 2019-04-18         7   6856      112
## 6277           7140 2018-07-02         7   6852       52
## 6278           7140 2018-12-29         7   6854       87
## 6279           7140 2019-04-27         7   6857       33
## 6280           7141 2019-05-28         7   6861       40
## 6281           7141 2019-02-23         7   6860       63
## 6282           7141 2019-01-22         7   6859      104
## 6283           7141 2018-10-28         7   6858        4
## 6284           7142 2018-09-27         7   6865       34
## 6285           7142 2018-08-07         7   6863       46
## 6286           7142 2018-09-14         7   6864       46
## 6287           7142 2018-11-10         7   6866       33
## 6288           7142 2019-01-19         7   6867      114
## 6289           7142 2018-07-06         7   6862       24
## 6290           7143 2018-12-22         7   6870       74
## 6291           7143 2018-08-09         7   6868       44
## 6292           7143 2019-01-12         7   6871       40
## 6293           7143 2019-04-05         7   6873       78
## 6294           7143 2018-08-29         7   6869       32
## 6295           7144 2018-10-22         7   6876        3
## 6296           7144 2018-12-16         7   6878       44
## 6297           7144 2018-09-01         7   6875       52
## 6298           7144 2018-07-01         7   6874       49
## 6299           7144 2018-10-31         7   6877       15
## 6300           7145 2018-10-21         7   6880       60
## 6301           7145 2019-06-16         7   6882       40
## 6302           7145 2019-02-02         7   6881       93
## 6303           7145 2018-09-13         7   6879       32
## 6304           7146 2018-07-24         7   6884       33
## 6305           7146 2018-12-24         7   6885        7
## 6306           7146 2019-05-23         7   6888       30
## 6307           7146 2019-04-01         7   6887      109
## 6308           7146 2019-01-09         7   6886       63
## 6309           7147 2018-11-04         7   6892       40
## 6310           7147 2018-07-22         7   6890       25
## 6311           7147 2018-07-15         7   6889       60
## 6312           7147 2019-02-19         7   6893       14
## 6313           7147 2018-08-04         7   6891       51
## 6314           7148 2019-06-19         7   6895      104
## 6315           7148 2019-02-16         7   6894       70
## 6316           7149 2019-05-17         7   6898      108
## 6317           7149 2018-07-11         7   6896      109
## 6318           7149 2018-12-23         7   6897       51
## 6319           7150 2019-01-05         7   6903      104
## 6320           7150 2019-04-17         7   6904      114
## 6321           7150 2018-08-04         7   6899       90
## 6322           7150 2018-10-31         7   6901       87
## 6323           7150 2018-11-01         7   6902       87
## 6324           7150 2018-08-18         7   6900       52
## 6325           7151 2019-02-17         7   6909       16
## 6326           7151 2019-02-01         7   6908       32
## 6327           7151 2018-08-08         7   6905       81
## 6328           7151 2018-10-19         7   6906       17
## 6329           7152 2019-02-15         7   6915       25
## 6330           7152 2019-05-17         7   6916       75
## 6331           7152 2018-09-28         7   6913       16
## 6332           7152 2018-08-19         7   6912       30
## 6333           7152 2019-01-08         7   6914       30
## 6334           7152 2018-07-07         7   6911      112
## 6335           7153 2018-07-05         7   6917        7
## 6336           7153 2018-11-24         7   6920       24
## 6337           7153 2018-11-09         7   6919       14
## 6338           7153 2018-09-17         7   6918       93
## 6339           7154 2018-09-26         7   6923        7
## 6340           7154 2019-01-01         7   6924       62
## 6341           7154 2019-02-20         7   6926       99
## 6342           7154 2019-04-29         7   6927       17
## 6343           7154 2019-01-31         7   6925        9
## 6344           7154 2018-09-16         7   6922       60
## 6345           7154 2018-09-02         7   6921       50
## 6346           7154 2019-06-03         7   6928       70
## 6347           7155 2018-11-28         7   6929       63
## 6348           7155 2019-03-16         7   6930       81
## 6349           7156 2018-09-28         7   6932       89
## 6350           7156 2018-07-27         7   6931      102
## 6351           7156 2019-06-15         7   6934       78
## 6352           7157 2019-05-25         7   6937       34
## 6353           7157 2018-08-11         7   6935       68
## 6354           7157 2019-05-18         7   6936       99
## 6355           7158 2019-05-11         7   6940       47
## 6356           7158 2019-03-12         7   6938       93
## 6357           7158 2019-04-14         7   6939       71
## 6358           7159 2019-04-21         7   6948       90
## 6359           7159 2018-08-19         7   6941       46
## 6360           7159 2019-04-26         7   6949       51
## 6361           7159 2019-06-20         7   6951       30
## 6362           7159 2019-01-29         7   6945       49
## 6363           7159 2019-04-11         7   6947       31
## 6364           7159 2018-08-20         7   6942       24
## 6365           7159 2019-05-17         7   6950      114
## 6366           7159 2018-08-25         7   6943      112
## 6367           7159 2018-11-05         7   6944       87
## 6368           7160 2019-06-14         7   6952      112
## 6369           7161 2018-10-19         7   6954        7
## 6370           7161 2018-08-26         7   6953        4
## 6371           7161 2019-02-07         7   6955        4
## 6372           7161 2018-08-26         7   6953       33
## 6373           7162 2018-10-01         7   6958       15
## 6374           7162 2018-09-28         7   6957       32
## 6375           7162 2018-08-12         7   6956      102
## 6376           7162 2019-03-15         7   6959       62
## 6377           7163 2018-07-19         7   6960       99
## 6378           7163 2019-02-05         7   6963        9
## 6379           7163 2018-08-10         7   6961       14
## 6380           7163 2019-02-19         7   6964       93
## 6381           7163 2018-09-08         7   6962      112
## 6382           7163 2019-06-10         7   6966      102
## 6383           7163 2019-02-05         7   6963       36
## 6384           7163 2019-03-21         7   6965       28
## 6385           7164 2019-06-18         7   6969       28
## 6386           7164 2018-09-21         7   6967       20
## 6387           7164 2018-11-07         7   6968       32
## 6388           7165 2018-09-11         7   6970       75
## 6389           7165 2018-11-23         7   6973       60
## 6390           7165 2018-10-05         7   6972       68
## 6391           7165 2018-12-06         7   6974       30
## 6392           7165 2018-09-14         7   6971       28
## 6393           7166 2018-08-11         7   6976       47
## 6394           7166 2018-07-04         7   6975       89
## 6395           7166 2019-01-10         7   6977       24
## 6396           7167 2019-01-07         7   6979       40
## 6397           7167 2018-12-16         7   6978       93
## 6398           7168 2019-04-23         7   6981       17
## 6399           7168 2018-11-15         7   6980      109
## 6400           7169 2019-03-11         7   6982       17
## 6401           7169 2019-06-28         7   6983       60
## 6402           7170 2018-09-25         7   6984       42
## 6403           7170 2019-01-18         7   6985       14
## 6404           7170 2019-06-09         7   6987       20
## 6405           7170 2019-02-26         7   6986       87
## 6406           7171 2018-11-18         7   6991       42
## 6407           7171 2019-01-02         7   6992       93
## 6408           7171 2018-08-17         7   6989       14
## 6409           7171 2018-09-30         7   6990        7
## 6410           7171 2018-07-21         7   6988       63
## 6411           7172 2019-01-20         7   6995       49
## 6412           7172 2018-11-05         7   6994       44
## 6413           7172 2019-06-07         7   6998       36
## 6414           7172 2018-10-03         7   6993       44
## 6415           7172 2019-03-27         7   6996       93
## 6416           7172 2019-04-25         7   6997        3
## 6417           7173 2018-09-12         7   6999       62
## 6418           7173 2018-10-29         7   7000       31
## 6419           7173 2019-04-16         7   7003       28
## 6420           7173 2019-01-16         7   7001      109
## 6421           7173 2019-04-24         7   7004       16
## 6422           7173 2019-03-15         7   7002       14
## 6423           7174 2018-07-19         7   7005       89
## 6424           7174 2018-10-15         7   7006       87
## 6425           7174 2019-01-21         7   7008       32
## 6426           7174 2019-06-06         7   7010      113
## 6427           7174 2018-11-09         7   7007        4
## 6428           7174 2019-06-18         7   7011       15
## 6429           7174 2019-02-08         7   7009       47
## 6430           7175 2018-11-30         7   7012       99
## 6431           7176 2018-09-22         7   7016       16
## 6432           7176 2018-08-27         7   7015      104
## 6433           7176 2019-06-11         7   7017        7
## 6434           7177 2019-02-08         7   7020       63
## 6435           7177 2019-01-27         7   7019       77
## 6436           7177 2018-10-02         7   7018       36
## 6437           7178 2019-01-06         7   7023        4
## 6438           7178 2019-05-12         7   7024       77
## 6439           7178 2018-08-12         7   7021       93
## 6440           7178 2018-12-19         7   7022       68
## 6441           7179 2019-05-27         7   7028       60
## 6442           7179 2018-12-19         7   7026       30
## 6443           7179 2019-05-31         7   7029       81
## 6444           7179 2018-09-23         7   7025       47
## 6445           7179 2019-06-12         7   7030       50
## 6446           7179 2019-02-01         7   7027       16
## 6447           7180 2019-01-29         7   7035       74
## 6448           7180 2019-03-28         7   7036       74
## 6449           7180 2018-08-29         7   7032        2
## 6450           7180 2018-08-14         7   7031       52
## 6451           7180 2019-05-23         7   7037       90
## 6452           7181 2019-05-19         7   7041       87
## 6453           7181 2018-09-02         7   7038       60
## 6454           7181 2019-05-13         7   7040      109
## 6455           7181 2019-01-07         7   7039       44
## 6456           7182 2019-06-14         7   7045       87
## 6457           7182 2018-10-08         7   7042       50
## 6458           7182 2018-11-05         7   7043       50
## 6459           7182 2019-05-05         7   7044       14
## 6460           7183 2018-08-03         7   7046       17
## 6461           7183 2018-12-22         7   7049       24
## 6462           7183 2018-09-26         7   7047       99
## 6463           7183 2018-10-18         7   7048       78
## 6464           7184 2019-01-30         7   7052       16
## 6465           7184 2018-08-07         7   7050       17
## 6466           7184 2018-09-05         7   7051       36
## 6467           7184 2019-03-29         7   7053       15
## 6468           7185 2018-09-06         7   7054       78
## 6469           7185 2019-02-15         7   7055       40
## 6470           7186 2019-03-27         7   7057       87
## 6471           7186 2018-12-15         7   7056       90
## 6472           7187 2019-05-01         7   7063       17
## 6473           7187 2018-10-20         7   7059      102
## 6474           7187 2019-04-09         7   7062        9
## 6475           7187 2018-09-06         7   7058       70
## 6476           7187 2019-04-07         7   7060        9
## 6477           7187 2019-04-08         7   7061       23
## 6478           7188 2019-05-16         7   7070       87
## 6479           7188 2019-04-09         7   7068       44
## 6480           7188 2018-10-28         7   7066       87
## 6481           7188 2019-03-04         7   7067       25
## 6482           7188 2018-09-02         7   7064       78
## 6483           7188 2018-09-16         7   7065        3
## 6484           7189 2018-07-19         7   7071      114
## 6485           7189 2019-04-29         7   7074       78
## 6486           7189 2019-03-15         7   7073       89
## 6487           7189 2019-01-22         7   7072       32
## 6488           7190 2018-12-03         7   7075      113
## 6489           7191 2019-04-01         7   7077      113
## 6490           7191 2018-12-24         7   7076       33
## 6491           7192 2018-07-31         7   7078       74
## 6492           7192 2018-11-22         7   7080       33
## 6493           7192 2018-11-14         7   7079        3
## 6494           7192 2019-01-01         7   7081        2
## 6495           7193 2018-11-08         7   7083       60
## 6496           7193 2018-10-18         7   7082       89
## 6497           7193 2019-01-03         7   7084       15
## 6498           7194 2019-02-09         7   7085       93
## 6499           7195 2019-02-19         7   7086      104
## 6500           7195 2019-03-31         7   7087       31
## 6501           7196 2018-12-27         7   7089       87
## 6502           7196 2019-02-28         7   7091       46
## 6503           7196 2019-03-26         7   7092        9
## 6504           7196 2018-07-15         7   7088       30
## 6505           7196 2019-02-15         7   7090      108
## 6506           7197 2019-06-03         7   7098       34
## 6507           7197 2019-05-03         7   7097       71
## 6508           7197 2018-09-17         7   7094      112
## 6509           7197 2018-09-12         7   7093       20
## 6510           7198 2019-03-26         7   7104       81
## 6511           7198 2018-09-07         7   7099       36
## 6512           7198 2019-02-12         7   7102       36
## 6513           7198 2018-12-13         7   7100       49
## 6514           7198 2019-02-28         7   7103       81
## 6515           7199 2019-01-15         7   7106       99
## 6516           7199 2018-09-27         7   7105       32
## 6517           7199 2019-05-13         7   7107       17
## 6518           7200 2018-07-01         7   7108       33
## 6519           7200 2019-01-03         7   7110       93
## 6520           7200 2019-02-02         7   7111       44
## 6521           7200 2019-05-15         7   7112        2
## 6522           7200 2018-08-22         7   7109       23
## 6523           7201 2018-07-29         7   7113       93
## 6524           7201 2019-01-14         7   7116       77
## 6525           7201 2019-04-06         7   7118       87
## 6526           7201 2018-10-21         7   7115       42
## 6527           7201 2019-05-14         7   7119       15
## 6528           7201 2018-10-07         7   7114       31
## 6529           7202 2019-06-26         7   7121       71
## 6530           7202 2019-03-21         7   7120        7
## 6531           7203 2018-08-28         7   7122       60
## 6532           7203 2019-03-02         7   7125       33
## 6533           7203 2019-01-28         7   7124       46
## 6534           7203 2018-11-09         7   7123      109
## 6535           7204 2019-04-28         7   7128       60
## 6536           7204 2019-05-31         7   7129        4
## 6537           7204 2018-09-06         7   7127       16
## 6538           7205 2019-01-30         7   7131        7
## 6539           7205 2019-06-25         7   7134      112
## 6540           7205 2019-01-24         7   7130      113
## 6541           7205 2019-06-20         7   7133       33
## 6542           7206 2019-01-19         7   7136        7
## 6543           7206 2019-02-11         7   7137      108
## 6544           7207 2019-01-11         7   7139       31
## 6545           7207 2019-03-09         7   7140       36
## 6546           7207 2019-06-19         7   7141       40
## 6547           7207 2019-06-25         7   7142       63
## 6548           7207 2018-09-21         7   7138       30
## 6549           7208 2019-05-26         7   7143       71
## 6550           7209 2019-03-20         7   7150       93
## 6551           7209 2018-08-23         7   7144       78
## 6552           7209 2019-01-24         7   7148       28
## 6553           7209 2018-09-18         7   7146       51
## 6554           7209 2019-01-29         7   7149       33
## 6555           7209 2018-08-25         7   7145        4
## 6556           7209 2018-11-10         7   7147       87
## 6557           7210 2019-06-09         7   7155       51
## 6558           7210 2018-11-22         7   7151       52
## 6559           7210 2019-06-03         7   7154       25
## 6560           7211 2018-07-03         7   7156      104
## 6561           7211 2018-10-06         7   7158       30
## 6562           7211 2018-10-17         7   7159       44
## 6563           7211 2018-09-22         7   7157       20
## 6564           7212 2018-07-12         7   7160      113
## 6565           7212 2018-11-20         7   7161       90
## 6566           7213 2018-07-22         7   7162       23
## 6567           7213 2018-09-23         7   7163        2
## 6568           7213 2018-10-02         7   7164       24
## 6569           7213 2019-02-26         7   7166       40
## 6570           7214 2019-06-02         7   7171       52
## 6571           7214 2018-12-12         7   7169       70
## 6572           7214 2018-12-27         7   7170       50
## 6573           7214 2019-06-02         7   7171       89
## 6574           7214 2018-07-22         7   7167       36
## 6575           7214 2018-09-12         7   7168       62
## 6576           7215 2019-03-02         7   7174      114
## 6577           7215 2019-05-17         7   7176       16
## 6578           7215 2018-09-01         7   7172       46
## 6579           7215 2019-05-05         7   7175       68
## 6580           7215 2018-09-18         7   7173      114
## 6581           7216 2018-12-29         7   7180       87
## 6582           7216 2018-07-12         7   7179       33
## 6583           7216 2018-12-31         7   7181       47
## 6584           7216 2018-07-03         7   7177       71
## 6585           7216 2018-07-08         7   7178       74
## 6586           7216 2019-05-16         7   7182       88
## 6587           7217 2019-03-15         7   7184       78
## 6588           7217 2019-06-10         7   7185      102
## 6589           7217 2019-03-01         7   7183        2
## 6590           7218 2019-03-02         7   7187       62
## 6591           7218 2019-03-17         7   7189       31
## 6592           7218 2019-03-12         7   7188        2
## 6593           7218 2018-09-02         7   7186       71
## 6594           7219 2019-04-21         7   7198      113
## 6595           7219 2019-03-10         7   7197       71
## 6596           7219 2019-01-30         7   7196      109
## 6597           7219 2018-12-16         7   7195      104
## 6598           7219 2018-09-22         7   7192       87
## 6599           7219 2018-12-15         7   7194       49
## 6600           7219 2018-08-06         7   7191       30
## 6601           7219 2018-11-17         7   7193       26
## 6602           7219 2018-07-08         7   7190      102
## 6603           7220 2019-03-17         7   7203      114
## 6604           7220 2019-06-04         7   7204       68
## 6605           7220 2018-07-30         7   7199       62
## 6606           7220 2018-12-29         7   7201       81
## 6607           7220 2019-02-16         7   7202       44
## 6608           7220 2018-08-24         7   7200       75
## 6609           7221 2019-02-23         7   7207       70
## 6610           7221 2018-11-13         7   7206       93
## 6611           7221 2018-09-08         7   7205       17
## 6612           7222 2018-07-09         7   7209       87
## 6613           7222 2019-05-23         7   7214       88
## 6614           7222 2019-06-03         7   7215       50
## 6615           7222 2018-12-05         7   7210       60
## 6616           7222 2018-12-15         7   7211       50
## 6617           7222 2019-05-03         7   7213       34
## 6618           7222 2019-02-23         7   7212       34
## 6619           7223 2019-02-18         7   7217       42
## 6620           7223 2019-06-04         7   7218       52
## 6621           7224 2018-11-11         7   7223       17
## 6622           7224 2018-09-16         7   7220       49
## 6623           7224 2019-01-28         7   7225       77
## 6624           7224 2018-11-19         7   7224       26
## 6625           7224 2018-10-24         7   7222       31
## 6626           7224 2018-10-08         7   7221       46
## 6627           7224 2019-03-15         7   7226       44
## 6628           7225 2019-05-12         7   7230       42
## 6629           7225 2018-08-06         7   7227       77
## 6630           7225 2019-02-08         7   7229       46
## 6631           7225 2018-08-15         7   7228       87
## 6632           7226 2018-08-03         7   7231       30
## 6633           7226 2018-11-01         7   7232       33
## 6634           7226 2019-05-14         7   7233       36
## 6635           7227 2018-08-05         7   7234       23
## 6636           7227 2019-03-08         7   7235       90
## 6637           7228 2019-03-26         7   7236       34
## 6638           7229 2018-11-07         7   7238       62
## 6639           7229 2019-04-14         7   7241      109
## 6640           7229 2018-07-06         7   7237       16
## 6641           7229 2018-11-22         7   7239        7
## 6642           7229 2018-12-17         7   7240       32
## 6643           7230 2018-11-29         7   7243      109
## 6644           7230 2019-06-29         7   7244       74
## 6645           7230 2018-09-10         7   7242       88
## 6646           7231 2019-04-03         7   7247       20
## 6647           7231 2019-01-13         7   7246       60
## 6648           7231 2018-08-26         7   7245       20
## 6649           7232 2018-09-30         7   7250       51
## 6650           7232 2018-10-28         7   7251       75
## 6651           7232 2018-07-16         7   7248       42
## 6652           7232 2019-04-27         7   7252       30
## 6653           7232 2018-08-06         7   7249       36
## 6654           7234 2019-05-30         7   7256      108
## 6655           7234 2018-07-28         7   7255        7
## 6656           7235 2019-01-28         7   7259       50
## 6657           7235 2018-08-19         7   7257       23
## 6658           7235 2019-05-15         7   7263       60
## 6659           7235 2019-04-28         7   7262       51
## 6660           7235 2019-03-13         7   7261       26
## 6661           7235 2019-02-09         7   7260       32
## 6662           7236 2019-04-11         7   7269       50
## 6663           7236 2018-08-06         7   7265       81
## 6664           7236 2018-10-19         7   7268      114
## 6665           7236 2018-09-14         7   7267       25
## 6666           7236 2018-07-26         7   7264       36
## 6667           7237 2019-04-16         7   7274       23
## 6668           7237 2018-11-01         7   7271       47
## 6669           7237 2019-04-08         7   7273       16
## 6670           7237 2018-08-06         7   7270       31
## 6671           7237 2018-11-30         7   7272       70
## 6672           7238 2018-11-07         7   7277       24
## 6673           7238 2019-02-05         7   7278       81
## 6674           7238 2018-08-18         7   7275       68
## 6675           7238 2018-09-26         7   7276       15
## 6676           7238 2019-02-11         7   7279       40
## 6677           7238 2019-05-30         7   7280       70
## 6678           7239 2019-01-09         7   7282       33
## 6679           7239 2018-07-31         7   7281       31
## 6680           7240 2018-12-08         7   7283       25
## 6681           7240 2019-03-05         7   7285       60
## 6682           7240 2019-02-21         7   7284       40
## 6683           7240 2019-06-25         7   7286        9
## 6684           7241 2018-11-02         7   7289       70
## 6685           7241 2019-01-30         7   7290       33
## 6686           7241 2018-10-18         7   7288       31
## 6687           7241 2018-10-13         7   7287      113
## 6688           7242 2018-12-18         7   7293       87
## 6689           7242 2018-09-08         7   7292       23
## 6690           7242 2018-08-13         7   7291      114
## 6691           7242 2019-05-21         7   7294       26
## 6692           7243 2018-07-04         7   7295       74
## 6693           7243 2018-07-20         7   7297       99
## 6694           7243 2019-06-29         7   7299       93
## 6695           7243 2018-11-20         7   7298       75
## 6696           7244 2018-07-07         7   7300        7
## 6697           7244 2019-04-08         7   7302       60
## 6698           7244 2018-07-18         7   7301       99
## 6699           7244 2019-05-10         7   7303      113
## 6700           7245 2018-10-03         7   7305       36
## 6701           7245 2018-12-16         7   7306       81
## 6702           7245 2019-06-06         7   7307       26
## 6703           7245 2018-09-06         7   7304       52
## 6704           7246 2018-11-02         7   7309       89
## 6705           7246 2018-09-04         7   7308       88
## 6706           7246 2019-03-31         7   7312       17
## 6707           7246 2019-03-23         7   7311       34
## 6708           7246 2019-01-27         7   7310      104
## 6709           7247 2019-06-03         7   7316       81
## 6710           7247 2019-03-08         7   7315       25
## 6711           7247 2018-08-08         7   7313       60
## 6712           7247 2018-08-16         7   7314        4
## 6713           7248 2019-01-17         7   7318       46
## 6714           7248 2018-10-31         7   7317       47
## 6715           7248 2019-06-08         7   7319       47
## 6716           7250 2018-12-29         7   7322       33
## 6717           7250 2019-03-27         7   7324      114
## 6718           7250 2019-01-05         7   7323       89
## 6719           7250 2018-07-09         7   7320       75
## 6720           7250 2018-12-01         7   7321       81
## 6721           7251 2019-04-07         7   7328       77
## 6722           7251 2018-09-04         7   7325        3
## 6723           7251 2019-02-23         7   7326       63
## 6724           7251 2019-03-30         7   7327       89
## 6725           7252 2019-02-02         7   7332       78
## 6726           7252 2018-11-20         7   7331      112
## 6727           7252 2019-05-02         7   7333      112
## 6728           7252 2018-11-07         7   7330       44
## 6729           7253 2019-04-06         7   7337       40
## 6730           7253 2018-07-24         7   7334       52
## 6731           7253 2019-03-22         7   7336       51
## 6732           7253 2019-04-20         7   7338       87
## 6733           7254 2018-09-28         7   7339       77
## 6734           7254 2019-02-10         7   7341       70
## 6735           7254 2019-03-24         7   7343       25
## 6736           7254 2019-02-11         7   7342       30
## 6737           7255 2018-09-18         7   7345       77
## 6738           7255 2019-03-27         7   7346      113
## 6739           7255 2018-08-09         7   7344       25
## 6740           7256 2019-02-28         7   7348       34
## 6741           7257 2018-10-17         7   7351       93
## 6742           7257 2018-09-19         7   7350       49
## 6743           7257 2019-02-27         7   7352       24
## 6744           7258 2018-12-07         7   7355      113
## 6745           7258 2018-10-25         7   7353       14
## 6746           7258 2019-06-09         7   7357      102
## 6747           7258 2019-03-03         7   7356       70
## 6748           7258 2018-11-05         7   7354       40
## 6749           7259 2019-02-23         7   7361       26
## 6750           7259 2019-04-17         7   7363       36
## 6751           7259 2019-04-12         7   7362        7
## 6752           7259 2019-02-19         7   7360      114
## 6753           7259 2018-11-02         7   7358       88
## 6754           7259 2019-05-19         7   7364       77
## 6755           7260 2019-06-04         7   7369       88
## 6756           7260 2018-11-22         7   7365       71
## 6757           7260 2019-02-09         7   7367       49
## 6758           7260 2019-02-04         7   7366       77
## 6759           7260 2019-04-28         7   7368       52
## 6760           7260 2019-06-10         7   7370       50
## 6761           7261 2019-05-09         7   7372      109
## 6762           7261 2019-03-13         7   7371       26
## 6763           7262 2018-12-22         7   7373       49
## 6764           7263 2018-12-05         7   7375       90
## 6765           7263 2019-04-28         7   7376       77
## 6766           7263 2018-10-15         7   7374       34
## 6767           7264 2018-11-07         7   7379       20
## 6768           7264 2018-11-28         7   7380       90
## 6769           7264 2018-10-30         7   7378       71
## 6770           7264 2018-08-06         7   7377       89
## 6771           7265 2019-01-30         7   7381      104
## 6772           7266 2018-12-02         7   7383       33
## 6773           7266 2018-09-25         7   7382        7
## 6774           7266 2018-12-08         7   7384       31
## 6775           7267 2018-11-18         7   7387        4
## 6776           7267 2018-10-01         7   7386       33
## 6777           7267 2018-09-26         7   7385      113
## 6778           7267 2019-05-07         7   7389       89
## 6779           7267 2018-11-21         7   7388      113
## 6780           7268 2019-02-13         7   7391        9
## 6781           7268 2019-05-26         7   7393       14
## 6782           7268 2018-11-25         7   7390       62
## 6783           7268 2019-05-09         7   7392       52
## 6784           7269 2019-05-04         7   7397       87
## 6785           7269 2019-01-28         7   7396        2
## 6786           7269 2018-11-23         7   7395       88
## 6787           7269 2019-05-10         7   7398       81
## 6788           7269 2018-11-11         7   7394       16
## 6789           7270 2018-09-13         7   7400       70
## 6790           7270 2018-08-06         7   7399        4
## 6791           7270 2019-06-07         7   7401        7
## 6792           7270 2019-06-18         7   7402       16
## 6793           7271 2018-07-07         7   7403       14
## 6794           7271 2018-08-29         7   7404       24
## 6795           7271 2019-04-06         7   7407       52
## 6796           7273 2018-12-12         7   7410       52
## 6797           7273 2018-07-17         7   7408        3
## 6798           7273 2018-08-09         7   7409      113
## 6799           7274 2018-07-15         7   7411       20
## 6800           7274 2018-12-08         7   7412      102
## 6801           7275 2018-08-21         7   7413       40
## 6802           7275 2019-05-14         7   7416      112
## 6803           7275 2019-03-03         7   7414       75
## 6804           7275 2019-05-04         7   7415       88
## 6805           7276 2019-01-09         7   7418       74
## 6806           7277 2018-11-15         7   7420       17
## 6807           7277 2019-06-23         7   7423        9
## 6808           7277 2018-09-21         7   7419       49
## 6809           7277 2019-04-16         7   7422       81
## 6810           7277 2019-02-10         7   7421       52
## 6811           7278 2018-12-03         7   7424        9
## 6812           7279 2019-02-17         7   7428      109
## 6813           7279 2018-08-08         7   7425       71
## 6814           7279 2018-09-27         7   7426       36
## 6815           7280 2018-08-13         7   7430       24
## 6816           7281 2018-11-11         7   7433       28
## 6817           7281 2019-02-23         7   7435       42
## 6818           7281 2019-03-02         7   7436       42
## 6819           7281 2018-07-24         7   7432       52
## 6820           7281 2019-06-14         7   7437       44
## 6821           7281 2019-02-19         7   7434       46
## 6822           7282 2018-12-09         7   7439       52
## 6823           7282 2018-11-27         7   7438       30
## 6824           7282 2019-04-18         7   7441       31
## 6825           7282 2019-04-26         7   7442      102
## 6826           7282 2019-02-07         7   7440       52
## 6827           7282 2019-06-05         7   7445       28
## 6828           7282 2019-06-03         7   7444       31
## 6829           7282 2019-04-30         7   7443       32
## 6830           7283 2018-08-24         7   7446      114
## 6831           7284 2018-09-27         7   7447       51
## 6832           7285 2019-02-03         7   7450      112
## 6833           7285 2018-11-14         7   7449       42
## 6834           7285 2019-06-22         7   7451      113
## 6835           7285 2018-07-14         7   7448       71
## 6836           7286 2019-01-05         7   7452       17
## 6837           7287 2019-04-18         7   7456      114
## 6838           7287 2018-12-14         7   7454       63
## 6839           7288 2019-03-25         7   7458       75
## 6840           7288 2019-06-22         7   7459       14
## 6841           7288 2019-03-24         7   7457       78
## 6842           7289 2019-03-16         7   7461       87
## 6843           7289 2019-02-04         7   7460       16
## 6844           7289 2019-05-13         7   7462       25
## 6845           7290 2018-07-11         7   7463        4
## 6846           7290 2018-07-26         7   7464       44
## 6847           7290 2018-09-16         7   7465       28
## 6848           7290 2018-11-21         7   7466       63
## 6849           7291 2019-06-21         7   7470       25
## 6850           7291 2018-12-18         7   7469      104
## 6851           7291 2018-10-19         7   7467        9
## 6852           7291 2018-11-05         7   7468       89
## 6853           7292 2019-05-27         7   7474       25
## 6854           7292 2018-08-08         7   7471       74
## 6855           7292 2019-05-31         7   7475       90
## 6856           7292 2018-08-13         7   7472       25
## 6857           7293 2019-05-09         7   7476       93
## 6858           7294 2018-09-19         7   7477       93
## 6859           7294 2018-10-31         7   7478       88
## 6860           7294 2018-11-18         7   7479       51
## 6861           7294 2019-03-26         7   7480       88
## 6862           7294 2019-05-06         7   7481       68
## 6863           7294 2019-05-23         7   7482       77
## 6864           7295 2018-10-23         7   7484       99
## 6865           7295 2018-08-30         7   7483        9
## 6866           7295 2018-12-16         7   7485       70
## 6867           7296 2019-06-05         7   7489       46
## 6868           7296 2018-09-23         7   7487       40
## 6869           7296 2018-09-21         7   7486       81
## 6870           7296 2018-10-19         7   7488       87
## 6871           7296 2019-06-20         7   7490       40
## 6872           7297 2019-03-23         7   7492       74
## 6873           7298 2019-02-05         7   7494       74
## 6874           7298 2019-01-01         7   7493       26
## 6875           7298 2019-04-23         7   7495       74
## 6876           7298 2019-04-23         7   7495       36
## 6877           7299 2018-10-02         7   7496       81
## 6878           7299 2019-02-09         7   7498        9
## 6879           7299 2019-04-09         7   7499       52
## 6880           7299 2018-10-07         7   7497      104
## 6881           7301 2019-02-07         7   7504       34
## 6882           7301 2019-02-03         7   7503      102
## 6883           7301 2019-01-16         7   7502       88
## 6884           7301 2019-04-20         7   7506       24
## 6885           7301 2018-10-01         7   7501       24
## 6886           7301 2019-04-10         7   7505       60
## 6887           7301 2018-09-20         7   7500       71
## 6888           7302 2018-07-24         7   7508        7
## 6889           7302 2018-10-15         7   7510       75
## 6890           7302 2018-11-13         7   7511       75
## 6891           7302 2018-12-22         7   7512       63
## 6892           7303 2018-10-28         7   7513        4
## 6893           7303 2019-01-21         7   7515       26
## 6894           7303 2019-06-29         7   7516       49
## 6895           7303 2018-12-04         7   7514        9
## 6896           7304 2018-10-19         7   7517       46
## 6897           7305 2018-10-16         7   7519       24
## 6898           7306 2018-10-26         7   7520       28
## 6899           7306 2018-12-05         7   7522       14
## 6900           7306 2019-01-18         7   7523       28
## 6901           7306 2018-11-03         7   7521        7
## 6902           7306 2019-04-19         7   7524       46
## 6903           7307 2018-09-18         7   7526       62
## 6904           7307 2018-10-19         7   7527       44
## 6905           7307 2018-12-14         7   7528       26
## 6906           7308 2019-04-02         7   7532       34
## 6907           7308 2018-11-22         7   7530       68
## 6908           7308 2018-10-17         7   7529       75
## 6909           7308 2019-02-28         7   7531       44
## 6910           7309 2018-07-30         7   7533       70
## 6911           7309 2019-04-07         7   7535       81
## 6912           7309 2019-03-23         7   7534      104
## 6913           7310 2019-02-09         7   7537       47
## 6914           7310 2019-06-20         7   7538        9
## 6915           7310 2018-11-24         7   7536      104
## 6916           7311 2018-07-21         7   7539       31
## 6917           7311 2019-04-04         7   7542       24
## 6918           7311 2019-01-06         7   7540       24
## 6919           7311 2019-02-08         7   7541       70
## 6920           7312 2019-04-20         7   7544       77
## 6921           7312 2018-07-17         7   7543       30
## 6922           7313 2019-05-22         7   7546        3
## 6923           7313 2018-08-05         7   7545       25
## 6924           7314 2019-01-28         7   7550       87
## 6925           7314 2018-10-01         7   7549        3
## 6926           7314 2018-07-13         7   7547      113
## 6927           7314 2019-02-25         7   7551        2
## 6928           7314 2019-05-31         7   7552      109
## 6929           7315 2019-02-14         7   7556      109
## 6930           7315 2018-11-27         7   7553       33
## 6931           7315 2019-02-13         7   7555       87
## 6932           7315 2018-12-17         7   7554      113
## 6933           7316 2018-07-04         7   7558      109
## 6934           7316 2018-07-21         7   7559       75
## 6935           7316 2018-07-03         7   7557       51
## 6936           7316 2019-02-13         7   7562       60
## 6937           7316 2019-02-09         7   7561       32
## 6938           7316 2019-03-19         7   7563       20
## 6939           7317 2019-03-24         7   7565       15
## 6940           7317 2019-03-09         7   7564       14
## 6941           7318 2019-06-05         7   7567       23
## 6942           7318 2019-04-05         7   7566       46
## 6943           7319 2018-08-01         7   7569       44
## 6944           7319 2018-10-06         7   7572       20
## 6945           7319 2018-08-24         7   7570        3
## 6946           7319 2018-07-11         7   7568      108
## 6947           7319 2019-03-01         7   7573        3
## 6948           7320 2018-10-29         7   7574      112
## 6949           7321 2019-03-21         7   7578       71
## 6950           7321 2018-11-16         7   7575       87
## 6951           7321 2019-06-07         7   7579       89
## 6952           7321 2019-01-02         7   7576       16
## 6953           7321 2019-02-28         7   7577       17
## 6954           7322 2019-01-26         7   7581       63
## 6955           7322 2019-03-01         7   7582      109
## 6956           7322 2018-12-06         7   7580        9
## 6957           7323 2019-01-21         7   7585       74
## 6958           7323 2019-04-03         7   7586       17
## 6959           7323 2019-04-26         7   7587       42
## 6960           7323 2019-06-20         7   7588       75
## 6961           7323 2018-08-02         7   7583       23
## 6962           7324 2018-11-07         7   7589       74
## 6963           7324 2019-06-21         7   7591       50
## 6964           7324 2019-06-05         7   7590      102
## 6965           7325 2018-11-11         7   7592      104
## 6966           7325 2018-11-22         7   7593       34
## 6967           7325 2019-01-22         7   7594      108
## 6968           7326 2018-08-22         7   7596       24
## 6969           7326 2018-12-20         7   7598       87
## 6970           7326 2019-05-27         7   7601       51
## 6971           7326 2019-03-23         7   7600      113
## 6972           7326 2019-01-29         7   7599      113
## 6973           7326 2018-07-11         7   7595       32
## 6974           7326 2018-09-05         7   7597       15
## 6975           7327 2018-12-27         7   7603       25
## 6976           7327 2018-08-11         7   7602       70
## 6977           7328 2018-09-17         7   7604       93
## 6978           7329 2018-09-13         7   7608       52
## 6979           7329 2018-10-08         7   7610       30
## 6980           7329 2018-08-30         7   7607      113
## 6981           7329 2018-07-30         7   7606       49
## 6982           7329 2018-09-17         7   7609       23
## 6983           7329 2019-01-04         7   7612       74
## 6984           7329 2018-11-14         7   7611      114
## 6985           7330 2018-08-29         7   7614      114
## 6986           7330 2019-03-20         7   7615        2
## 6987           7331 2019-03-17         7   7621       28
## 6988           7331 2019-05-06         7   7622       51
## 6989           7331 2019-03-13         7   7620       51
## 6990           7331 2018-07-25         7   7616       74
## 6991           7331 2018-08-05         7   7617        2
## 6992           7331 2019-06-12         7   7623       88
## 6993           7331 2019-03-01         7   7619       99
## 6994           7332 2018-11-27         7   7627       88
## 6995           7332 2018-11-10         7   7625       68
## 6996           7332 2018-11-22         7   7626        9
## 6997           7332 2018-11-04         7   7624       36
## 6998           7333 2019-05-31         7   7632      102
## 6999           7333 2019-04-15         7   7631      112
## 7000           7333 2018-10-28         7   7628       70
## 7001           7333 2018-12-31         7   7629      113
## 7002           7334 2019-04-07         7   7634       30
## 7003           7334 2019-06-10         7   7635       34
## 7004           7334 2019-03-26         7   7633      112
## 7005           7335 2019-05-20         7   7639       75
## 7006           7335 2018-09-05         7   7637       32
## 7007           7335 2018-09-15         7   7638       46
## 7008           7335 2018-08-02         7   7636      102
## 7009           7336 2018-11-28         7   7641      112
## 7010           7336 2019-06-05         7   7643       32
## 7011           7336 2019-01-16         7   7642       47
## 7012           7336 2018-07-02         7   7640       89
## 7013           7337 2019-01-02         7   7647      109
## 7014           7337 2018-12-06         7   7645       42
## 7015           7337 2019-06-19         7   7649       88
## 7016           7337 2018-09-09         7   7644       34
## 7017           7337 2018-12-13         7   7646       51
## 7018           7337 2019-02-22         7   7648       71
## 7019           7338 2018-11-22         7   7652       47
## 7020           7338 2018-07-10         7   7650       87
## 7021           7339 2018-12-20         7   7654       33
## 7022           7339 2018-09-12         7   7653       42
## 7023           7340 2018-11-01         7   7656       47
## 7024           7340 2018-09-13         7   7655       87
## 7025           7341 2019-03-04         7   7660       63
## 7026           7341 2018-08-11         7   7657      113
## 7027           7341 2018-12-19         7   7658       17
## 7028           7341 2019-01-13         7   7659       40
## 7029           7342 2018-08-30         7   7662       89
## 7030           7342 2018-08-03         7   7661      113
## 7031           7342 2018-10-07         7   7663       20
## 7032           7342 2018-11-26         7   7664      112
## 7033           7342 2019-06-06         7   7670       63
## 7034           7342 2019-02-18         7   7666       49
## 7035           7342 2019-02-07         7   7665       46
## 7036           7342 2019-04-15         7   7668       78
## 7037           7342 2019-03-29         7   7667       50
## 7038           7342 2019-05-02         7   7669       70
## 7039           7343 2018-08-01         7   7671       68
## 7040           7343 2018-10-28         7   7672       89
## 7041           7343 2019-01-12         7   7673       71
## 7042           7344 2019-06-23         7   7677        4
## 7043           7344 2018-10-21         7   7675       46
## 7044           7344 2018-08-13         7   7674       30
## 7045           7344 2019-01-13         7   7676       52
## 7046           7345 2019-05-07         7   7681       81
## 7047           7345 2018-12-15         7   7679       93
## 7048           7345 2019-06-09         7   7683      112
## 7049           7345 2019-03-13         7   7680        4
## 7050           7345 2018-11-06         7   7678      104
## 7051           7345 2019-05-25         7   7682       50
## 7052           7346 2018-12-15         7   7688      113
## 7053           7346 2019-04-22         7   7691       40
## 7054           7346 2019-05-29         7   7692       28
## 7055           7346 2019-04-17         7   7689      108
## 7056           7346 2018-07-20         7   7685       16
## 7057           7346 2019-04-20         7   7690       51
## 7058           7346 2018-07-05         7   7684       30
## 7059           7346 2018-08-06         7   7686       24
## 7060           7346 2018-11-18         7   7687       93
## 7061           7347 2019-02-23         7   7693       46
## 7062           7347 2019-03-03         7   7694       78
## 7063           7348 2018-09-30         7   7696       88
## 7064           7348 2019-02-07         7   7699       99
## 7065           7348 2019-02-03         7   7698       90
## 7066           7348 2018-11-09         7   7697       28
## 7067           7348 2018-07-16         7   7695       36
## 7068           7349 2019-03-15         7   7702      108
## 7069           7349 2018-07-08         7   7700       70
## 7070           7349 2018-07-22         7   7701       26
## 7071           7350 2018-12-06         7   7703       88
## 7072           7350 2019-06-10         7   7705      102
## 7073           7350 2019-06-29         7   7706       99
## 7074           7350 2019-03-10         7   7704      104
## 7075           7351 2018-07-21         7   7707       26
## 7076           7351 2019-05-22         7   7709      114
## 7077           7351 2018-09-19         7   7708        7
## 7078           7352 2019-01-22         7   7714        2
## 7079           7352 2018-08-06         7   7711       40
## 7080           7352 2019-01-16         7   7713       30
## 7081           7352 2018-08-04         7   7710       25
## 7082           7352 2019-04-25         7   7715        7
## 7083           7353 2018-11-27         7   7716       50
## 7084           7354 2019-05-19         7   7718       14
## 7085           7354 2018-07-06         7   7717       51
## 7086           7355 2019-06-28         7   7721      112
## 7087           7355 2018-10-29         7   7719       81
## 7088           7355 2018-10-31         7   7720       40
## 7089           7356 2019-06-25         7   7722       49
## 7090           7357 2018-08-06         7   7723        7
## 7091           7357 2018-12-20         7   7724       60
## 7092           7357 2019-06-07         7   7725       20
## 7093           7358 2018-08-26         7   7726       14
## 7094           7358 2018-09-09         7   7727      102
## 7095           7358 2018-09-11         7   7728       46
## 7096           7358 2019-02-01         7   7730       99
## 7097           7358 2018-09-19         7   7729       24
## 7098           7359 2018-10-29         7   7732       34
## 7099           7359 2018-07-10         7   7731       31
## 7100           7359 2018-12-11         7   7733      112
## 7101           7360 2019-03-21         7   7734      108
## 7102           7360 2019-04-27         7   7735       42
## 7103           7361 2018-10-31         7   7736        9
## 7104           7363 2018-11-07         7   7738      104
## 7105           7364 2019-03-23         7   7741       78
## 7106           7364 2019-02-11         7   7740       60
## 7107           7364 2019-01-10         7   7739       50
## 7108           7364 2019-01-10         7   7739       20
## 7109           7365 2019-01-31         7   7742      114
## 7110           7365 2019-05-01         7   7743        7
## 7111           7366 2018-09-11         7   7744       34
## 7112           7366 2018-12-01         7   7745        3
## 7113           7366 2019-02-01         7   7747       20
## 7114           7367 2019-06-27         7   7749       71
## 7115           7367 2018-09-22         7   7748       15
## 7116           7368 2018-12-24         7   7753        3
## 7117           7368 2019-03-12         7   7754       16
## 7118           7368 2018-09-06         7   7750      114
## 7119           7368 2018-10-22         7   7752      102
## 7120           7368 2019-06-17         7   7756      113
## 7121           7368 2019-06-12         7   7755        2
## 7122           7368 2018-10-15         7   7751       32
## 7123           7369 2019-03-28         7   7759       88
## 7124           7369 2019-02-11         7   7758       31
## 7125           7370 2019-02-24         7   7762       63
## 7126           7370 2018-10-15         7   7761       33
## 7127           7370 2018-10-12         7   7760       46
## 7128           7371 2019-04-21         7   7763       33
## 7129           7372 2019-05-01         7   7764       74
## 7130           7373 2019-05-27         7   7768       87
## 7131           7373 2018-07-09         7   7765       89
## 7132           7373 2019-06-10         7   7769       68
## 7133           7373 2018-11-17         7   7766      113
## 7134           7373 2019-01-24         7   7767      112
## 7135           7374 2018-07-30         7   7770       26
## 7136           7374 2018-12-12         7   7771      108
## 7137           7374 2019-02-28         7   7772       93
## 7138           7375 2018-11-29         7   7776      113
## 7139           7375 2018-07-26         7   7773       46
## 7140           7375 2018-08-14         7   7774       16
## 7141           7375 2019-02-09         7   7777       28
## 7142           7375 2018-10-30         7   7775       46
## 7143           7376 2018-07-02         7   7778       31
## 7144           7376 2018-09-15         7   7779      114
## 7145           7376 2019-03-22         7   7783       15
## 7146           7376 2019-01-14         7   7782        2
## 7147           7376 2018-12-24         7   7781       20
## 7148           7376 2018-11-24         7   7780       81
## 7149           7376 2019-03-28         7   7784        2
## 7150           7377 2019-01-22         7   7787       90
## 7151           7377 2019-06-13         7   7790       15
## 7152           7377 2019-06-04         7   7789      104
## 7153           7377 2018-11-05         7   7786       32
## 7154           7377 2019-06-29         7   7791       93
## 7155           7377 2018-09-28         7   7785       15
## 7156           7377 2019-05-13         7   7788       63
## 7157           7378 2019-02-02         7   7795       36
## 7158           7378 2018-08-15         7   7792       20
## 7159           7378 2018-10-26         7   7793       30
## 7160           7378 2019-01-09         7   7794       47
## 7161           7378 2019-06-01         7   7798        4
## 7162           7378 2019-04-21         7   7797       51
## 7163           7378 2019-02-12         7   7796       62
## 7164           7379 2018-10-28         7   7800      109
## 7165           7379 2019-04-09         7   7801       60
## 7166           7380 2018-10-07         7   7803       31
## 7167           7380 2019-05-01         7   7804       33
## 7168           7380 2018-09-19         7   7802       49
## 7169           7381 2019-05-17         7   7807      109
## 7170           7381 2019-03-14         7   7806        7
## 7171           7381 2019-01-12         7   7805       52
## 7172           7382 2018-07-12         7   7808      113
## 7173           7382 2018-08-25         7   7809       26
## 7174           7383 2019-02-20         7   7813       71
## 7175           7383 2018-10-01         7   7811        4
## 7176           7383 2018-12-26         7   7812      109
## 7177           8000 2018-08-28         8   7814       34
## 7178           8001 2019-04-04         8   7815       36
## 7179           8003 2018-10-10         8   7816      108
## 7180           8005 2019-01-09         8   7817       51
## 7181           8006 2019-04-02         8   7818      113
## 7182           8007 2018-08-11         8   7819       36
## 7183           8007 2018-10-05         8   7820       63
## 7184           8008 2018-10-26         8   7821       63
## 7185           8012 2019-03-21         8   7822       50
## 7186           8013 2018-09-03         8   7823       23
## 7187           8014 2018-08-29         8   7824      109
## 7188           8014 2019-01-22         8   7825       17
## 7189           8015 2018-08-18         8   7826       60
## 7190           8015 2019-01-02         8   7827       99
## 7191           8016 2018-07-14         8   7828       40
## 7192           8017 2018-12-13         8   7829       17
## 7193           8017 2019-06-13         8   7831       44
## 7194           8017 2019-03-13         8   7830       34
## 7195           8018 2018-07-04         8   7832        4
## 7196           8019 2019-05-24         8   7833       87
## 7197           8021 2018-10-02         8   7834       46
## 7198           8021 2019-03-21         8   7835       81
## 7199           8022 2019-03-10         8   7837      114
## 7200           8022 2019-04-10         8   7838       20
## 7201           8022 2018-11-20         8   7836       74
## 7202           8023 2018-12-15         8   7839       60
## 7203           8024 2018-12-09         8   7840       26
## 7204           8025 2019-05-18         8   7841        3
## 7205           8026 2019-03-09         8   7843       47
## 7206           8026 2019-04-16         8   7844       17
## 7207           8026 2019-02-08         8   7842       89
## 7208           8027 2019-01-23         8   7845       28
## 7209           8028 2018-10-03         8   7849       15
## 7210           8028 2018-07-11         8   7847       36
## 7211           8030 2018-07-05         8   7850       40
## 7212           8031 2019-04-01         8   7851        7
## 7213           8032 2018-12-24         8   7853       88
## 7214           8032 2018-12-23         8   7852        2
## 7215           8033 2019-06-02         8   7855      112
## 7216           8034 2019-03-12         8   7858       24
## 7217           8034 2018-11-20         8   7857      114
## 7218           8034 2018-08-08         8   7856       60
## 7219           8035 2019-02-11         8   7860       20
## 7220           8036 2018-08-19         8   7861       89
## 7221           8037 2019-05-17         8   7864       81
## 7222           8037 2019-06-26         8   7865       36
## 7223           8037 2018-10-07         8   7863       17
## 7224           8039 2019-01-31         8   7866        4
## 7225           8039 2019-03-24         8   7867       31
## 7226           8040 2018-11-28         8   7868       46
## 7227           8041 2018-12-11         8   7870       47
## 7228           8041 2018-08-27         8   7869       40
## 7229           8042 2018-07-15         8   7871      108
## 7230           8043 2019-05-17         8   7874      113
## 7231           8043 2019-05-07         8   7873       30
## 7232           8044 2019-02-12         8   7876       28
## 7233           8044 2019-01-15         8   7875       30
## 7234           8045 2019-01-22         8   7878       20
## 7235           8046 2018-12-09         8   7880       36
## 7236           8046 2018-07-01         8   7879       50
## 7237           8047 2018-08-05         8   7881       52
## 7238           8048 2019-03-20         8   7884      112
## 7239           8048 2018-08-26         8   7882       33
## 7240           8048 2019-02-05         8   7883       34
## 7241           8049 2019-03-31         8   7885       34
## 7242           8050 2018-11-19         8   7886       87
## 7243           8051 2019-05-29         8   7887       30
## 7244           8053 2019-03-13         8   7888       93
## 7245           8053 2019-06-29         8   7889       33
## 7246           8054 2019-03-29         8   7890       17
## 7247           8055 2019-01-11         8   7891       49
## 7248           8056 2019-01-29         8   7894       46
## 7249           8056 2018-08-22         8   7893       68
## 7250           8056 2018-07-24         8   7892       75
## 7251           8058 2018-08-20         8   7895       77
## 7252           8058 2019-05-02         8   7897       93
## 7253           8058 2019-03-09         8   7896       47
## 7254           8061 2019-02-11         8   7899       70
## 7255           8061 2019-03-06         8   7900       26
## 7256           8061 2018-09-30         8   7898       24
## 7257           8064 2019-05-23         8   7903      108
## 7258           8064 2018-11-20         8   7901       42
## 7259           8064 2018-12-19         8   7902       62
## 7260           8066 2019-05-25         8   7905       24
## 7261           8066 2018-08-17         8   7904       17
## 7262           8070 2018-09-25         8   7906       88
## 7263           8071 2019-04-15         8   7907       44
## 7264           8072 2018-10-17         8   7908       70
## 7265           8072 2019-05-22         8   7909        3
## 7266           8073 2019-04-17         8   7911       70
## 7267           8073 2019-01-18         8   7910        4
## 7268           8074 2018-12-06         8   7912        3
## 7269           8074 2018-12-23         8   7913       42
## 7270           8076 2018-08-11         8   7914       70
## 7271           8077 2018-09-30         8   7915       78
## 7272           8077 2019-02-26         8   7916      109
## 7273           8078 2018-08-05         8   7917       26
## 7274           8078 2019-03-12         8   7918       70
## 7275           8079 2018-09-05         8   7919       25
## 7276           8080 2018-07-05         8   7920       42
## 7277           8080 2018-09-08         8   7921       24
## 7278           8081 2019-05-18         8   7922       20
## 7279           8083 2019-01-01         8   7924       60
## 7280           8083 2018-08-14         8   7923       99
## 7281           8084 2019-01-01         8   7925       50
## 7282           8085 2019-04-06         8   7926      114
## 7283           8086 2019-02-26         8   7927      102
## 7284           8090 2018-07-28         8   7928       15
## 7285           8090 2019-03-02         8   7929       14
## 7286           8091 2019-01-23         8   7930       75
## 7287           8092 2018-12-05         8   7931      108
## 7288           8094 2018-07-02         8   7932      104
## 7289           8095 2018-07-30         8   7933       71
## 7290           8097 2018-11-03         8   7934      113
## 7291           8098 2019-03-03         8   7935       32
## 7292           8098 2019-03-15         8   7936       31
## 7293           8099 2018-10-09         8   7937       87
## 7294           8099 2019-03-21         8   7938       40
## 7295           8100 2019-05-05         8   7942       62
## 7296           8100 2018-07-16         8   7940       20
## 7297           8100 2019-04-15         8   7941       63
## 7298           8100 2018-07-03         8   7939       15
## 7299           8102 2019-06-08         8   7943       62
## 7300           8103 2019-05-02         8   7945       25
## 7301           8104 2019-05-06         8   7948      113
## 7302           8104 2018-11-14         8   7946       34
## 7303           8105 2019-05-08         8   7949       99
## 7304           8106 2018-07-25         8   7950       20
## 7305           8108 2019-04-13         8   7953        2
## 7306           8109 2019-01-23         8   7956       25
## 7307           8109 2019-06-20         8   7957       62
## 7308           8109 2018-12-20         8   7955       28
## 7309           8109 2018-10-15         8   7954       42
## 7310           8110 2019-06-02         8   7958       78
## 7311           8110 2019-06-16         8   7959      102
## 7312           8111 2019-05-30         8   7960      108
## 7313           8114 2018-09-01         8   7961       25
## 7314           8114 2019-06-08         8   7964       14
## 7315           8114 2019-01-18         8   7963      104
## 7316           8116 2019-05-25         8   7966       99
## 7317           8116 2019-03-08         8   7965       23
## 7318           8117 2019-05-17         8   7968       32
## 7319           8117 2018-09-06         8   7967      114
## 7320           8118 2019-03-21         8   7970        2
## 7321           8118 2018-09-07         8   7969       25
## 7322           8119 2019-01-16         8   7971       60
## 7323           8120 2019-04-10         8   7972       60
## 7324           8122 2019-02-07         8   7974      109
## 7325           8122 2018-11-24         8   7973      104
## 7326           8123 2018-10-13         8   7975       40
## 7327           8124 2019-04-20         8   7976       60
## 7328           8125 2019-05-01         8   7978       62
## 7329           8125 2019-06-05         8   7979      108
## 7330           8125 2018-09-03         8   7977      113
## 7331           8126 2019-02-06         8   7981       78
## 7332           8126 2019-04-22         8   7982       26
## 7333           8126 2018-11-09         8   7980       71
## 7334           8127 2018-12-07         8   7983       62
## 7335           8129 2019-04-28         8   7985       24
## 7336           8129 2019-01-19         8   7984       63
## 7337           8130 2018-12-01         8   7986        2
## 7338           8130 2019-02-18         8   7987       47
## 7339           8131 2019-01-16         8   7988       16
## 7340           8133 2019-06-14         8   7990       81
## 7341           8133 2018-08-11         8   7989       68
## 7342           8135 2018-10-18         8   7991       74
## 7343           8135 2019-01-08         8   7992       34
## 7344           8136 2018-09-17         8   7993       40
## 7345           8136 2019-02-27         8   7994       89
## 7346           8137 2019-05-07         8   7996       44
## 7347           8137 2018-07-15         8   7995       30
## 7348           8138 2019-02-12         8   7997      104
## 7349           8139 2018-08-10         8   7998        4
## 7350           8139 2019-01-12         8   7999       75
## 7351           8142 2019-01-07         8   8001       44
## 7352           8142 2019-06-08         8   8002       90
## 7353           8142 2018-07-27         8   8000       46
## 7354           8142 2019-06-27         8   8003        9
## 7355           8143 2018-09-03         8   8004       50
## 7356           8144 2018-10-22         8   8005       34
## 7357           8145 2019-04-07         8   8007       88
## 7358           8146 2019-05-08         8   8009       46
## 7359           8146 2019-02-02         8   8008       42
## 7360           8147 2019-01-17         8   8011       14
## 7361           8147 2018-11-09         8   8010       24
## 7362           8149 2018-09-30         8   8012      109
## 7363           8150 2019-05-28         8   8015       49
## 7364           8150 2019-06-29         8   8016      112
## 7365           8150 2019-02-13         8   8014      114
## 7366           8150 2019-01-09         8   8013      104
## 7367           8151 2018-12-29         8   8017       88
## 7368           8152 2019-03-09         8   8018      104
## 7369           8153 2019-05-17         8   8021       50
## 7370           8153 2018-12-14         8   8020        9
## 7371           8153 2018-11-03         8   8019       34
## 7372           8154 2019-04-08         8   8022       89
## 7373           8155 2019-03-04         8   8024       77
## 7374           8155 2019-05-06         8   8025       49
## 7375           8155 2018-10-24         8   8023      108
## 7376           8156 2019-01-05         8   8026       60
## 7377           8157 2018-09-21         8   8027       36
## 7378           8157 2018-10-21         8   8029       17
## 7379           8157 2019-01-12         8   8030       20
## 7380           8157 2018-10-03         8   8028      109
## 7381           8157 2019-02-02         8   8031       24
## 7382           8158 2019-02-13         8   8032       16
## 7383           8159 2018-09-12         8   8033       31
## 7384           8160 2019-05-14         8   8035        3
## 7385           8160 2018-12-22         8   8034       47
## 7386           8161 2019-01-12         8   8039       74
## 7387           8161 2018-10-23         8   8036        3
## 7388           8161 2019-01-05         8   8038       74
## 7389           8161 2018-12-05         8   8037       36
## 7390           8162 2019-05-12         8   8040       78
## 7391           8163 2019-01-12         8   8041      109
## 7392           8163 2019-05-25         8   8042        3
## 7393           8164 2018-11-09         8   8043       26
## 7394           8168 2018-09-27         8   8045       26
## 7395           8168 2018-08-11         8   8044       68
## 7396           8169 2018-12-19         8   8047       34
## 7397           8169 2018-07-10         8   8046       24
## 7398           8171 2019-02-24         8   8048       68
## 7399           8171 2019-04-13         8   8049        9
## 7400           8172 2018-10-31         8   8051       46
## 7401           8172 2018-10-25         8   8050       44
## 7402           8174 2018-11-17         8   8052      113
## 7403           8175 2019-03-11         8   8053        2
## 7404           8175 2019-04-01         8   8054       16
## 7405           8176 2018-10-23         8   8055       90
## 7406           8180 2018-09-20         8   8056       75
## 7407           8182 2019-04-27         8   8057       88
## 7408           8183 2018-10-18         8   8058      104
## 7409           8184 2019-05-14         8   8059       74
## 7410           8185 2018-12-05         8   8060        4
## 7411           8185 2019-01-03         8   8062       71
## 7412           8186 2018-10-27         8   8063        7
## 7413           8186 2018-11-16         8   8064       16
## 7414           8187 2019-03-23         8   8066       32
## 7415           8187 2019-01-06         8   8065       50
## 7416           8189 2019-02-22         8   8067      109
## 7417           8189 2019-06-10         8   8068       77
## 7418           8192 2019-03-16         8   8069       87
## 7419           8193 2019-01-08         8   8070      108
## 7420           8194 2019-03-02         8   8072       99
## 7421           8195 2018-07-27         8   8073      104
## 7422           8196 2018-07-20         8   8074       31
## 7423           8197 2019-02-07         8   8075       30
## 7424           8197 2019-04-26         8   8077       62
## 7425           8197 2019-06-26         8   8078       81
## 7426           8198 2019-06-23         8   8080       30
## 7427           8198 2019-05-02         8   8079       52
## 7428           8199 2018-12-17         8   8081       46
## 7429           8199 2019-06-20         8   8082       44
## 7430           8200 2019-05-31         8   8083       50
## 7431           8201 2018-10-30         8   8084       14
## 7432           8202 2018-11-01         8   8085       17
## 7433           8202 2019-06-20         8   8086       14
## 7434           8203 2018-07-18         8   8087      108
## 7435           8203 2019-04-03         8   8088       99
## 7436           8204 2018-12-12         8   8090        4
## 7437           8204 2018-08-05         8   8089       75
## 7438           8205 2018-10-26         8   8091       70
## 7439           8208 2018-08-27         8   8092      109
## 7440           8210 2018-10-13         8   8093       68
## 7441           8211 2019-01-01         8   8095       62
## 7442           8211 2019-05-04         8   8096       70
## 7443           8211 2018-08-30         8   8094       62
## 7444           8212 2019-06-02         8   8097       71
## 7445           8213 2018-10-04         8   8100       99
## 7446           8213 2018-09-18         8   8099      113
## 7447           8213 2018-08-09         8   8098       77
## 7448           8213 2019-02-16         8   8101        7
## 7449           8214 2019-03-18         8   8102       68
## 7450           8215 2018-07-10         8   8103       36
## 7451           8217 2019-05-01         8   8107       60
## 7452           8217 2018-10-17         8   8104      114
## 7453           8217 2019-02-08         8   8106      108
## 7454           8217 2018-11-11         8   8105       34
## 7455           8218 2019-04-23         8   8109       87
## 7456           8218 2018-08-15         8   8108       30
## 7457           8220 2018-10-12         8   8110      104
## 7458           8221 2018-07-23         8   8111       70
## 7459           8222 2018-12-29         8   8112      109
## 7460           8224 2019-03-21         8   8113       36
## 7461           8225 2018-08-10         8   8114        9
## 7462           8226 2019-03-10         8   8115       42
## 7463           8227 2019-03-21         8   8116        2
## 7464           8228 2019-05-16         8   8118       32
## 7465           8229 2019-05-22         8   8120       33
## 7466           8229 2018-07-29         8   8119       51
## 7467           8232 2018-08-03         8   8122       71
## 7468           8234 2018-08-27         8   8123       88
## 7469           8234 2019-02-09         8   8125       47
## 7470           8234 2018-11-20         8   8124       31
## 7471           8234 2019-04-28         8   8126       25
## 7472           8236 2018-11-10         8   8127        4
## 7473           8237 2018-10-12         8   8128       52
## 7474           8237 2019-04-22         8   8129       52
## 7475           8239 2019-05-06         8   8131       46
## 7476           8243 2019-01-02         8   8133      102
## 7477           8243 2019-01-03         8   8134       62
## 7478           8243 2019-03-14         8   8136       15
## 7479           8244 2018-07-01         8   8137        9
## 7480           8245 2018-07-05         8   8138       63
## 7481           8245 2018-10-21         8   8139      114
## 7482           8246 2018-07-04         8   8140       34
## 7483           8246 2018-11-03         8   8141       46
## 7484           8246 2018-12-06         8   8142       62
## 7485           8247 2019-01-03         8   8143       34
## 7486           8248 2019-02-04         8   8145       81
## 7487           8248 2018-10-26         8   8144      114
## 7488           8249 2018-11-26         8   8147       47
## 7489           8249 2018-09-20         8   8146       52
## 7490           8250 2019-04-17         8   8148       87
## 7491           8251 2018-08-28         8   8149      112
## 7492           8251 2019-04-28         8   8151      114
## 7493           8251 2018-11-09         8   8150       78
## 7494           8252 2019-02-06         8   8152       60
## 7495           8252 2019-03-01         8   8154       32
## 7496           8252 2019-02-14         8   8153       17
## 7497           8253 2019-03-30         8   8159       42
## 7498           8253 2019-01-18         8   8157       34
## 7499           8253 2019-02-25         8   8158       36
## 7500           8253 2018-09-13         8   8155       75
## 7501           8254 2018-12-18         8   8160       52
## 7502           8256 2018-08-15         8   8161       60
## 7503           8257 2018-11-03         8   8162       17
## 7504           8259 2018-11-20         8   8164       89
## 7505           8260 2018-11-17         8   8165      104
## 7506           8261 2018-08-08         8   8166       24
## 7507           8264 2018-09-05         8   8169       28
## 7508           8264 2019-02-05         8   8170       23
## 7509           8265 2019-03-28         8   8173        2
## 7510           8265 2019-04-18         8   8174       77
## 7511           8265 2019-01-15         8   8172       62
## 7512           8265 2018-11-27         8   8171        2
## 7513           8266 2018-11-21         8   8175       34
## 7514           8268 2019-02-11         8   8178      113
## 7515           8268 2019-01-06         8   8177      102
## 7516           8268 2018-07-08         8   8176       15
## 7517           8269 2018-09-20         8   8179       75
## 7518           8269 2018-10-05         8   8180       62
## 7519           8270 2019-03-15         8   8182       14
## 7520           8271 2018-09-10         8   8183       81
## 7521           8271 2019-01-28         8   8186        2
## 7522           8271 2019-03-04         8   8187       24
## 7523           8271 2018-12-17         8   8185       15
## 7524           8271 2019-03-04         8   8187       63
## 7525           8271 2018-12-12         8   8184      104
## 7526           8273 2018-10-20         8   8188       99
## 7527           8274 2018-09-23         8   8189       90
## 7528           8276 2018-07-13         8   8190       17
## 7529           8276 2019-01-13         8   8193       88
## 7530           8276 2018-09-27         8   8192       17
## 7531           8276 2018-08-13         8   8191       71
## 7532           8277 2019-06-13         8   8196       50
## 7533           8277 2018-09-28         8   8194       15
## 7534           8277 2018-12-08         8   8195       32
## 7535           8278 2018-08-09         8   8197       51
## 7536           8279 2019-04-17         8   8200       24
## 7537           8279 2019-03-16         8   8199      108
## 7538           8281 2018-11-25         8   8201       25
## 7539           8281 2018-12-17         8   8202      104
## 7540           8281 2019-06-21         8   8203        7
## 7541           8281 2019-06-29         8   8204       32
## 7542           8282 2018-11-04         8   8205        2
## 7543           8283 2018-09-07         8   8206        3
## 7544           8284 2018-09-25         8   8207       71
## 7545           8285 2018-10-12         8   8208       28
## 7546           8286 2019-01-12         8   8212      108
## 7547           8286 2019-01-04         8   8211       81
## 7548           8286 2018-07-28         8   8209       52
## 7549           8286 2018-10-13         8   8210        3
## 7550           8288 2019-04-01         8   8213       89
## 7551           8289 2018-12-27         8   8215       90
## 7552           8289 2019-06-29         8   8216       34
## 7553           8289 2018-11-26         8   8214        3
## 7554           8290 2018-08-05         8   8217      114
## 7555           8290 2019-04-19         8   8218       51
## 7556           8291 2018-07-14         8   8219       70
## 7557           8293 2019-03-12         8   8220       50
## 7558           8294 2018-08-20         8   8221      114
## 7559           8294 2019-06-27         8   8223       33
## 7560           8294 2019-03-11         8   8222       78
## 7561           8295 2018-11-22         8   8224       16
## 7562           8297 2019-04-03         8   8225       42
## 7563           8298 2019-01-31         8   8226       40
## 7564           8301 2019-04-02         8   8229       60
## 7565           8301 2019-02-27         8   8227       63
## 7566           8301 2019-05-21         8   8230       23
## 7567           8301 2019-03-22         8   8228       70
## 7568           8302 2018-08-11         8   8233       60
## 7569           8302 2018-07-01         8   8231      104
## 7570           8302 2018-07-24         8   8232       30
## 7571           8303 2019-01-06         8   8234       17
## 7572           8303 2019-06-15         8   8235       50
## 7573           8304 2019-03-14         8   8236       26
## 7574           8304 2019-04-17         8   8237       89
## 7575           8305 2018-09-28         8   8239      104
## 7576           8305 2018-08-27         8   8238       93
## 7577           8305 2019-05-31         8   8240       15
## 7578           8306 2019-04-22         8   8241       71
## 7579           8307 2018-12-29         8   8244      102
## 7580           8307 2018-08-04         8   8243        3
## 7581           8308 2019-03-01         8   8246      113
## 7582           8308 2019-03-18         8   8247       25
## 7583           8309 2018-11-10         8   8248        2
## 7584           8310 2019-06-18         8   8250        4
## 7585           8310 2019-04-12         8   8249       93
## 7586           8311 2018-08-29         8   8252       52
## 7587           8311 2018-07-19         8   8251       46
## 7588           8312 2019-04-20         8   8255       74
## 7589           8312 2018-12-16         8   8253        2
## 7590           8312 2019-02-03         8   8254       49
## 7591           8314 2019-03-10         8   8256       90
## 7592           8315 2019-01-15         8   8259       26
## 7593           8315 2018-12-23         8   8258       28
## 7594           8315 2018-08-30         8   8257       16
## 7595           8315 2019-02-27         8   8260       74
## 7596           8316 2019-05-10         8   8262       81
## 7597           8316 2018-10-01         8   8261       20
## 7598           8317 2018-07-25         8   8263       81
## 7599           8323 2018-12-03         8   8265       16
## 7600           8323 2018-10-30         8   8264       42
## 7601           8323 2019-06-04         8   8266       49
## 7602           8325 2019-05-08         8   8268        9
## 7603           8326 2018-11-24         8   8270       49
## 7604           8326 2018-11-29         8   8271       25
## 7605           8326 2019-04-10         8   8273       81
## 7606           8326 2018-08-07         8   8269       16
## 7607           8326 2019-01-03         8   8272       46
## 7608           8327 2019-01-27         8   8274       33
## 7609           8328 2018-11-07         8   8275      109
## 7610           8328 2019-01-13         8   8276       30
## 7611           8328 2019-06-24         8   8277      104
## 7612           8329 2019-03-12         8   8278      108
## 7613           8330 2019-02-18         8   8279        7
## 7614           8332 2019-06-25         8   8280        3
## 7615           8333 2019-06-25         8   8281       20
## 7616           8334 2018-07-22         8   8282       81
## 7617           8334 2018-08-15         8   8283       63
## 7618           8335 2018-07-02         8   8285       20
## 7619           8335 2018-10-20         8   8286       90
## 7620           8337 2018-08-18         8   8287        7
## 7621           8337 2018-10-04         8   8288       47
## 7622           8338 2019-05-19         8   8291      102
## 7623           8338 2019-03-28         8   8290       74
## 7624           8338 2019-01-03         8   8289      102
## 7625           8339 2018-12-27         8   8292       60
## 7626           8343 2018-07-23         8   8293       42
## 7627           8344 2019-05-18         8   8296       36
## 7628           8344 2018-12-12         8   8295       42
## 7629           8344 2018-09-16         8   8294       49
## 7630           8345 2019-05-29         8   8298       14
## 7631           8345 2018-08-31         8   8297       93
## 7632           8347 2019-02-01         8   8301       31
## 7633           8347 2019-03-01         8   8302       99
## 7634           8347 2018-09-24         8   8299       14
## 7635           8347 2018-12-11         8   8300        9
## 7636           8349 2018-09-25         8   8303       68
## 7637           8349 2018-11-18         8   8304       30
## 7638           8350 2018-11-02         8   8305       30
## 7639           8351 2019-02-03         8   8307      108
## 7640           8351 2018-09-09         8   8306       40
## 7641           8352 2019-06-07         8   8311       30
## 7642           8352 2018-07-08         8   8308       90
## 7643           8352 2018-07-20         8   8309        3
## 7644           8353 2019-01-17         8   8312       36
## 7645           8356 2018-10-28         8   8314       99
## 7646           8356 2019-03-30         8   8315       24
## 7647           8356 2019-05-19         8   8316        3
## 7648           8357 2018-10-18         8   8318        7
## 7649           8357 2018-10-08         8   8317      109
## 7650           8358 2018-09-05         8   8319       26
## 7651           8358 2019-02-04         8   8320       46
## 7652           8359 2019-02-28         8   8321       16
## 7653           8360 2018-10-27         8   8322       99
## 7654           8361 2018-07-19         8   8323        4
## 7655           8361 2018-11-21         8   8325       36
## 7656           8362 2018-08-21         8   8327       33
## 7657           8362 2018-07-17         8   8326       31
## 7658           8364 2019-06-16         8   8330       78
## 7659           8364 2019-03-17         8   8329       50
## 7660           8364 2018-10-18         8   8328       36
## 7661           8365 2018-10-30         8   8331      104
## 7662           8365 2019-04-08         8   8332       20
## 7663           8366 2019-03-20         8   8334       87
## 7664           8366 2018-11-11         8   8333      114
## 7665           8366 2019-03-29         8   8335       32
## 7666           8367 2019-04-11         8   8336       75
## 7667           8367 2019-04-12         8   8337       23
## 7668           8369 2018-10-14         8   8338       78
## 7669           8371 2018-09-30         8   8339       32
## 7670           8372 2019-06-11         8   8342       90
## 7671           8372 2018-10-27         8   8341       24
## 7672           8372 2018-10-06         8   8340       46
## 7673           8373 2018-12-26         8   8343       17
## 7674           8374 2018-08-28         8   8344       14
## 7675           8375 2018-10-01         8   8345        3
## 7676           9000 2019-06-19         9   8348       42
## 7677           9000 2019-05-12         9   8347      113
## 7678           9000 2018-11-13         9   8346       82
## 7679           9002 2019-03-26         9   8349       73
## 7680           9010 2018-11-11         9   8351       52
## 7681           9011 2019-06-13         9   8352       12
## 7682           9012 2019-02-09         9   8354       43
## 7683           9012 2018-12-17         9   8353       10
## 7684           9013 2018-12-27         9   8356       96
## 7685           9013 2018-12-03         9   8355       13
## 7686           9014 2019-01-25         9   8358        1
## 7687           9014 2018-11-03         9   8357       56
## 7688           9016 2019-05-22         9   8364      100
## 7689           9016 2018-11-10         9   8359       49
## 7690           9016 2018-12-04         9   8360       28
## 7691           9016 2018-12-22         9   8362       62
## 7692           9016 2019-02-27         9   8363        3
## 7693           9018 2019-01-28         9   8365       17
## 7694           9020 2019-05-27         9   8367      105
## 7695           9020 2019-04-29         9   8366      114
## 7696           9021 2019-06-05         9   8368      103
## 7697           9021 2019-06-20         9   8369       53
## 7698           9022 2019-01-08         9   8372        7
## 7699           9022 2018-11-27         9   8370       54
## 7700           9022 2019-05-02         9   8374       85
## 7701           9022 2019-01-23         9   8373       81
## 7702           9022 2018-12-09         9   8371       96
## 7703           9023 2018-11-13         9   8376       17
## 7704           9023 2019-05-26         9   8377      102
## 7705           9023 2018-09-23         9   8375       10
## 7706           9024 2018-08-14         9   8378      100
## 7707           9025 2019-05-10         9   8382      113
## 7708           9025 2019-01-10         9   8380       71
## 7709           9025 2019-02-27         9   8381       56
## 7710           9026 2018-09-22         9   8383      102
## 7711           9027 2019-04-26         9   8385       25
## 7712           9027 2018-11-01         9   8384      111
## 7713           9028 2018-08-05         9   8386       88
## 7714           9028 2019-03-22         9   8389      110
## 7715           9028 2018-08-12         9   8387       68
## 7716           9028 2019-01-04         9   8388       69
## 7717           9029 2018-07-02         9   8390       36
## 7718           9030 2019-03-21         9   8393       88
## 7719           9030 2019-03-06         9   8392       36
## 7720           9030 2019-02-23         9   8391       38
## 7721           9031 2018-11-10         9   8395       26
## 7722           9031 2018-09-19         9   8394       45
## 7723           9033 2018-12-30         9   8396      102
## 7724           9035 2019-06-21         9   8397       92
## 7725           9039 2018-08-27         9   8399       53
## 7726           9040 2019-05-18         9   8400       34
## 7727           9041 2018-10-24         9   8401      108
## 7728           9042 2018-08-05         9   8403       54
## 7729           9042 2019-01-07         9   8406        9
## 7730           9042 2018-07-25         9   8402       25
## 7731           9042 2019-03-27         9   8408      102
## 7732           9042 2018-11-24         9   8404      100
## 7733           9044 2018-10-18         9   8410       88
## 7734           9045 2018-08-11         9   8411       87
## 7735           9046 2018-09-01         9   8413       63
## 7736           9046 2018-08-22         9   8412       77
## 7737           9047 2019-03-02         9   8416       66
## 7738           9047 2018-08-03         9   8415       18
## 7739           9047 2018-07-01         9   8414       11
## 7740           9050 2018-07-10         9   8418       74
## 7741           9052 2018-10-12         9   8420       20
## 7742           9052 2019-04-08         9   8422       23
## 7743           9052 2019-02-03         9   8421      113
## 7744           9052 2019-06-19         9   8423       66
## 7745           9053 2019-05-11         9   8424      100
## 7746           9054 2018-07-14         9   8425       55
## 7747           9054 2019-04-17         9   8427       42
## 7748           9054 2018-07-24         9   8426      103
## 7749           9055 2019-06-29         9   8428      110
## 7750           9056 2018-09-17         9   8429       61
## 7751           9056 2019-05-04         9   8431       84
## 7752           9056 2019-02-21         9   8430      110
## 7753           9058 2018-07-08         9   8432       74
## 7754           9058 2019-01-29         9   8433       50
## 7755           9059 2019-05-14         9   8435       95
## 7756           9059 2019-03-21         9   8434       43
## 7757           9060 2019-05-11         9   8436       43
## 7758           9061 2019-02-12         9   8437       36
## 7759           9062 2019-03-29         9   8439       99
## 7760           9062 2019-02-21         9   8438       18
## 7761           9064 2019-03-02         9   8441      112
## 7762           9064 2018-12-17         9   8440       34
## 7763           9066 2018-08-06         9   8442       81
## 7764           9067 2019-04-05         9   8445      108
## 7765           9067 2019-01-13         9   8443      106
## 7766           9067 2019-02-12         9   8444       53
## 7767           9068 2018-11-06         9   8447       24
## 7768           9069 2019-01-31         9   8448       24
## 7769           9070 2019-04-21         9   8450       22
## 7770           9070 2018-09-26         9   8449      114
## 7771           9071 2018-08-21         9   8451       48
## 7772           9072 2019-06-24         9   8454       11
## 7773           9072 2018-08-04         9   8452       56
## 7774           9072 2018-08-10         9   8453       25
## 7775           9073 2018-10-13         9   8455        5
## 7776           9074 2019-04-28         9   8456       44
## 7777           9075 2019-06-20         9   8457       11
## 7778           9077 2019-04-21         9   8462       55
## 7779           9077 2018-09-11         9   8459       79
## 7780           9077 2019-01-28         9   8461       72
## 7781           9077 2018-12-22         9   8460       28
## 7782           9080 2018-11-03         9   8463       32
## 7783           9081 2018-11-13         9   8464       82
## 7784           9082 2018-07-16         9   8466       67
## 7785           9082 2019-02-26         9   8467       20
## 7786           9083 2018-12-23         9   8468       80
## 7787           9086 2018-10-19         9   8469       91
## 7788           9087 2019-02-26         9   8472       43
## 7789           9087 2018-12-07         9   8471      111
## 7790           9088 2019-03-04         9   8473       16
## 7791           9089 2019-01-31         9   8475        3
## 7792           9089 2018-10-11         9   8474       73
## 7793           9091 2018-10-15         9   8477        2
## 7794           9091 2018-07-16         9   8476       73
## 7795           9093 2019-06-07         9   8478       27
## 7796           9094 2019-04-25         9   8479       81
## 7797           9096 2018-08-21         9   8480       72
## 7798           9096 2019-01-04         9   8481       25
## 7799           9097 2019-05-10         9   8482       30
## 7800           9103 2018-11-27         9   8484       82
## 7801           9107 2019-01-23         9   8490       27
## 7802           9107 2018-11-12         9   8489       27
## 7803           9108 2018-09-05         9   8491       94
## 7804           9109 2018-11-18         9   8492      107
## 7805           9111 2018-12-11         9   8494       10
## 7806           9114 2019-05-08         9   8498       92
## 7807           9114 2019-01-11         9   8496      106
## 7808           9114 2018-11-17         9   8495       96
## 7809           9115 2019-06-01         9   8500       95
## 7810           9115 2018-09-18         9   8499       50
## 7811           9116 2018-12-06         9   8503      105
## 7812           9116 2018-10-19         9   8502      112
## 7813           9116 2019-01-21         9   8504       12
## 7814           9116 2018-08-15         9   8501       27
## 7815           9117 2019-02-26         9   8505       53
## 7816           9118 2018-09-12         9   8506       82
## 7817           9118 2019-03-09         9   8507      104
## 7818           9119 2019-03-22         9   8509       66
## 7819           9119 2018-09-06         9   8508       82
## 7820           9120 2019-05-10         9   8513       44
## 7821           9120 2019-03-20         9   8512      107
## 7822           9120 2018-12-04         9   8511      113
## 7823           9121 2019-01-14         9   8514        2
## 7824           9122 2018-10-18         9   8515       91
## 7825           9123 2018-11-15         9   8516       61
## 7826           9124 2019-06-10         9   8517       28
## 7827           9126 2018-12-02         9   8519       17
## 7828           9126 2018-10-26         9   8518       22
## 7829           9127 2018-10-12         9   8520        4
## 7830           9128 2018-09-13         9   8521       34
## 7831           9128 2018-12-12         9   8522       30
## 7832           9128 2019-01-31         9   8523       44
## 7833           9130 2019-03-07         9   8526      111
## 7834           9130 2018-07-30         9   8525      113
## 7835           9132 2018-11-22         9   8528        9
## 7836           9135 2018-12-09         9   8531       19
## 7837           9136 2019-02-08         9   8532       52
## 7838           9137 2019-02-26         9   8533       14
## 7839           9138 2018-10-11         9   8534       30
## 7840           9139 2019-03-12         9   8535        3
## 7841           9140 2019-03-07         9   8536       84
## 7842           9142 2018-11-29         9   8538       33
## 7843           9143 2018-08-03         9   8539       11
## 7844           9144 2018-12-24         9   8541       61
## 7845           9144 2019-01-18         9   8542       54
## 7846           9144 2018-09-24         9   8540       80
## 7847           9145 2019-03-25         9   8545       21
## 7848           9145 2018-07-19         9   8543      110
## 7849           9147 2019-03-04         9   8548      114
## 7850           9147 2019-01-25         9   8547       84
## 7851           9149 2019-05-27         9   8550        5
## 7852           9149 2019-06-16         9   8551      106
## 7853           9149 2019-02-11         9   8549      114
## 7854           9150 2018-11-10         9   8552        9
## 7855           9152 2019-06-24         9   8554       50
## 7856           9152 2019-05-25         9   8553       19
## 7857           9153 2019-03-13         9   8555       48
## 7858           9154 2019-01-18         9   8556       27
## 7859           9156 2018-10-20         9   8557       97
## 7860           9157 2019-04-06         9   8558       30
## 7861           9158 2019-04-12         9   8560       31
## 7862           9159 2019-06-05         9   8563       42
## 7863           9159 2019-03-14         9   8561       28
## 7864           9159 2019-05-18         9   8562       28
## 7865           9161 2018-09-01         9   8564       22
## 7866           9162 2019-03-01         9   8565       49
## 7867           9166 2019-05-28         9   8566       74
## 7868           9167 2018-11-26         9   8567       21
## 7869           9168 2019-05-31         9   8568       22
## 7870           9169 2019-04-21         9   8569       70
## 7871           9170 2019-05-27         9   8570       90
## 7872           9171 2018-08-29         9   8571       95
## 7873           9173 2019-04-21         9   8574       95
## 7874           9173 2019-01-08         9   8573       92
## 7875           9174 2019-06-23         9   8576      104
## 7876           9174 2018-11-03         9   8575       69
## 7877           9175 2018-11-04         9   8578       68
## 7878           9175 2018-08-14         9   8577       53
## 7879           9176 2019-01-06         9   8579       91
## 7880           9177 2019-01-21         9   8583       49
## 7881           9177 2018-12-24         9   8582       80
## 7882           9177 2018-10-14         9   8581       20
## 7883           9177 2018-07-03         9   8580       83
## 7884           9179 2019-05-31         9   8588       14
## 7885           9179 2018-11-19         9   8585        3
## 7886           9179 2019-04-21         9   8586       69
## 7887           9180 2018-10-01         9   8589       25
## 7888           9182 2018-10-11         9   8590       83
## 7889           9183 2018-10-17         9   8592       11
## 7890           9183 2018-07-30         9   8591       71
## 7891           9185 2018-12-05         9   8593       20
## 7892           9186 2019-05-06         9   8594       90
## 7893           9186 2019-06-01         9   8595      102
## 7894           9187 2018-09-01         9   8597        6
## 7895           9187 2019-02-22         9   8599      106
## 7896           9187 2019-02-19         9   8598       29
## 7897           9187 2018-07-05         9   8596       62
## 7898           9188 2018-11-02         9   8600       80
## 7899           9189 2019-02-02         9   8604      108
## 7900           9189 2019-01-16         9   8603       85
## 7901           9190 2019-05-11         9   8605       20
## 7902           9191 2019-03-24         9   8606       90
## 7903           9193 2019-06-08         9   8607       29
## 7904           9194 2019-01-28         9   8608       42
## 7905           9195 2018-10-11         9   8609       66
## 7906           9195 2019-04-10         9   8610       21
## 7907           9196 2018-12-21         9   8612       93
## 7908           9196 2018-11-15         9   8611       92
## 7909           9196 2019-05-22         9   8613       77
## 7910           9197 2018-09-16         9   8614       27
## 7911           9199 2018-11-19         9   8618       96
## 7912           9199 2018-08-25         9   8617       73
## 7913           9199 2019-01-08         9   8619       80
## 7914           9199 2018-07-18         9   8616       98
## 7915           9200 2018-12-05         9   8620       11
## 7916           9200 2019-03-04         9   8621      108
## 7917           9201 2019-05-31         9   8625       95
## 7918           9201 2018-08-18         9   8623       83
## 7919           9201 2018-10-01         9   8624       97
## 7920           9203 2019-03-26         9   8627       74
## 7921           9203 2019-05-23         9   8628       96
## 7922           9203 2018-08-03         9   8626       88
## 7923           9204 2019-02-04         9   8629       12
## 7924           9205 2018-11-26         9   8630       50
## 7925           9207 2018-07-27         9   8631       44
## 7926           9207 2018-11-24         9   8632      104
## 7927           9208 2019-05-18         9   8634       15
## 7928           9208 2018-12-28         9   8633       24
## 7929           9210 2018-10-10         9   8635      100
## 7930           9211 2019-02-03         9   8636      105
## 7931           9212 2018-07-28         9   8637       49
## 7932           9216 2019-05-14         9   8640       84
## 7933           9216 2018-09-12         9   8639       47
## 7934           9217 2018-10-23         9   8641       87
## 7935           9220 2019-05-19         9   8644       15
## 7936           9220 2019-01-05         9   8643       87
## 7937           9221 2018-08-12         9   8645       96
## 7938           9221 2019-01-02         9   8646       18
## 7939           9222 2019-01-25         9   8648       82
## 7940           9222 2018-08-02         9   8647        5
## 7941           9224 2018-09-25         9   8649       18
## 7942           9225 2018-12-11         9   8651       25
## 7943           9227 2019-04-25         9   8653      103
## 7944           9227 2018-07-23         9   8652       48
## 7945           9228 2019-05-01         9   8655       73
## 7946           9228 2018-10-09         9   8654       19
## 7947           9229 2018-11-02         9   8656       13
## 7948           9231 2018-10-13         9   8657       60
## 7949           9232 2018-11-27         9   8658       28
## 7950           9233 2019-05-19         9   8660       30
## 7951           9233 2018-11-09         9   8659       20
## 7952           9234 2018-10-04         9   8661        7
## 7953           9234 2019-02-04         9   8662       17
## 7954           9235 2018-09-12         9   8663       11
## 7955           9237 2019-01-25         9   8665       79
## 7956           9239 2019-01-06         9   8667       24
## 7957           9239 2018-08-06         9   8666       89
## 7958           9240 2019-03-21         9   8668       37
## 7959           9242 2018-07-31         9   8669       31
## 7960           9242 2019-05-24         9   8672       98
## 7961           9242 2019-03-10         9   8671       37
## 7962           9244 2019-06-22         9   8674      105
## 7963           9244 2019-04-04         9   8673      110
## 7964           9246 2019-06-20         9   8675      109
## 7965           9247 2018-09-08         9   8676      111
## 7966           9248 2018-10-30         9   8678       68
## 7967           9248 2018-09-03         9   8677       99
## 7968           9248 2018-11-06         9   8679       90
## 7969           9253 2018-12-03         9   8680       37
## 7970           9254 2018-12-09         9   8681       38
## 7971           9254 2019-05-21         9   8682       79
## 7972           9255 2019-05-12         9   8685      108
## 7973           9255 2019-06-17         9   8686       42
## 7974           9255 2018-10-05         9   8684       49
## 7975           9256 2018-12-22         9   8689       88
## 7976           9256 2018-07-27         9   8687       13
## 7977           9256 2018-10-02         9   8688       80
## 7978           9257 2018-10-09         9   8690       61
## 7979           9259 2018-07-09         9   8691       26
## 7980           9259 2018-09-07         9   8692       23
## 7981           9260 2018-11-25         9   8693       36
## 7982           9261 2019-06-29         9   8696       74
## 7983           9261 2018-12-23         9   8695       75
## 7984           9262 2018-08-18         9   8697       20
## 7985           9263 2019-06-11         9   8699       46
## 7986           9263 2018-08-24         9   8698       32
## 7987           9264 2019-05-11         9   8700      103
## 7988           9265 2019-03-19         9   8701       10
## 7989           9266 2018-11-11         9   8703       43
## 7990           9266 2018-10-03         9   8702       71
## 7991           9267 2019-01-30         9   8705       21
## 7992           9268 2018-10-16         9   8706       67
## 7993           9268 2019-06-04         9   8708       49
## 7994           9270 2019-02-24         9   8710       36
## 7995           9270 2018-09-09         9   8709       93
## 7996           9270 2019-03-16         9   8711       34
## 7997           9271 2019-05-11         9   8713       66
## 7998           9271 2018-08-30         9   8712       32
## 7999           9272 2018-09-04         9   8714       56
## 8000           9273 2018-11-24         9   8715       33
## 8001           9273 2019-04-16         9   8716       20
## 8002           9275 2019-04-05         9   8717       80
## 8003           9276 2019-01-21         9   8718      102
## 8004           9278 2019-06-18         9   8721       23
## 8005           9278 2019-01-02         9   8720      107
## 8006           9279 2019-03-11         9   8724       63
## 8007           9279 2019-02-13         9   8723       81
## 8008           9279 2018-08-06         9   8722       47
## 8009           9282 2018-09-30         9   8726       24
## 8010           9282 2018-07-25         9   8725       87
## 8011           9284 2018-12-28         9   8727       88
## 8012           9285 2019-03-02         9   8728       51
## 8013           9285 2019-06-21         9   8729       94
## 8014           9286 2018-07-30         9   8730       20
## 8015           9288 2019-01-29         9   8732       16
## 8016           9288 2018-09-28         9   8731       85
## 8017           9289 2018-09-14         9   8733       53
## 8018           9289 2018-12-31         9   8734       17
## 8019           9289 2019-02-16         9   8735       55
## 8020           9289 2019-05-17         9   8737       21
## 8021           9291 2019-03-30         9   8740       48
## 8022           9291 2019-03-06         9   8739       27
## 8023           9291 2018-08-20         9   8738       98
## 8024           9293 2018-11-25         9   8742       22
## 8025           9293 2018-10-07         9   8741       58
## 8026           9294 2019-02-20         9   8743        6
## 8027           9295 2019-05-16         9   8744       83
## 8028           9297 2019-04-01         9   8745       72
## 8029           9298 2019-04-18         9   8747        9
## 8030           9298 2019-05-02         9   8748       18
## 8031           9298 2019-01-02         9   8746       23
## 8032           9301 2018-08-30         9   8749       46
## 8033           9301 2019-02-01         9   8751       54
## 8034           9301 2018-09-09         9   8750      110
## 8035           9302 2018-12-17         9   8752        7
## 8036           9302 2019-03-25         9   8753       30
## 8037           9303 2018-08-18         9   8754       58
## 8038           9304 2019-06-16         9   8756       73
## 8039           9306 2019-04-12         9   8759       77
## 8040           9306 2019-04-02         9   8758      104
## 8041           9308 2018-09-03         9   8760       69
## 8042           9308 2019-03-02         9   8762       55
## 8043           9309 2018-10-18         9   8763      112
## 8044           9310 2018-12-07         9   8764       99
## 8045           9310 2019-06-29         9   8765       23
## 8046           9313 2018-08-14         9   8768      113
## 8047           9314 2019-02-22         9   8771       96
## 8048           9314 2018-11-17         9   8769       55
## 8049           9314 2018-11-24         9   8770       13
## 8050           9315 2019-01-16         9   8772       18
## 8051           9317 2018-12-23         9   8775       60
## 8052           9317 2018-10-20         9   8774       93
## 8053           9318 2018-11-29         9   8776       92
## 8054           9320 2018-12-28         9   8777       99
## 8055           9320 2019-01-04         9   8778       58
## 8056           9321 2018-07-30         9   8779      103
## 8057           9321 2019-04-10         9   8780       58
## 8058           9323 2019-04-21         9   8781        1
## 8059           9325 2019-05-26         9   8782      112
## 8060           9326 2019-04-26         9   8784       29
## 8061           9326 2019-02-26         9   8783       19
## 8062           9329 2019-05-12         9   8787        6
## 8063           9329 2019-03-13         9   8786       84
## 8064           9330 2018-07-25         9   8789       79
## 8065           9330 2019-05-05         9   8790      114
## 8066           9330 2018-07-24         9   8788       51
## 8067           9331 2019-03-05         9   8791       98
## 8068           9333 2019-02-15         9   8793       94
## 8069           9333 2019-06-02         9   8795       30
## 8070           9334 2018-10-12         9   8797       22
## 8071           9334 2018-08-29         9   8796       78
## 8072           9335 2018-10-07         9   8799       79
## 8073           9335 2019-04-01         9   8801       45
## 8074           9335 2018-09-06         9   8798      103
## 8075           9335 2018-10-23         9   8800      114
## 8076           9338 2018-10-14         9   8802       29
## 8077           9339 2018-11-04         9   8803       88
## 8078           9339 2018-11-08         9   8804       91
## 8079           9340 2018-07-08         9   8805       14
## 8080           9340 2019-05-26         9   8807       58
## 8081           9341 2018-07-01         9   8808       45
## 8082           9341 2018-08-02         9   8809      113
## 8083           9341 2018-08-24         9   8810       17
## 8084           9343 2019-05-29         9   8814       14
## 8085           9343 2019-03-22         9   8813      114
## 8086           9343 2018-12-17         9   8812      100
## 8087           9343 2018-09-16         9   8811      108
## 8088           9345 2018-11-22         9   8819       42
## 8089           9345 2018-08-28         9   8817       94
## 8090           9345 2018-08-18         9   8816        6
## 8091           9345 2018-11-11         9   8818       81
## 8092           9346 2019-04-02         9   8820       79
## 8093           9347 2018-09-25         9   8822        5
## 8094           9347 2018-09-04         9   8821       25
## 8095           9348 2019-02-22         9   8824       38
## 8096           9348 2018-10-27         9   8823       71
## 8097           9349 2018-08-02         9   8825      102
## 8098           9350 2018-12-06         9   8828       16
## 8099           9350 2019-01-28         9   8829      102
## 8100           9350 2019-06-30         9   8830       28
## 8101           9350 2018-09-02         9   8827       77
## 8102           9350 2018-08-01         9   8826       85
## 8103           9351 2019-01-06         9   8831       52
## 8104           9352 2018-10-12         9   8833       86
## 8105           9352 2018-08-30         9   8832      110
## 8106           9353 2018-09-09         9   8834       33
## 8107           9353 2019-04-07         9   8835       16
## 8108           9354 2019-03-25         9   8837       26
## 8109           9354 2019-03-20         9   8836        3
## 8110           9355 2018-11-26         9   8838       51
## 8111           9355 2019-03-24         9   8840       17
## 8112           9355 2019-01-27         9   8839       84
## 8113           9356 2018-08-06         9   8842       10
## 8114           9356 2018-07-18         9   8841       37
## 8115           9358 2018-11-02         9   8844       89
## 8116           9358 2018-10-07         9   8843       86
## 8117           9359 2019-01-20         9   8846       72
## 8118           9360 2018-09-03         9   8848      111
## 8119           9362 2019-02-26         9   8850       69
## 8120           9363 2019-01-24         9   8851       79
## 8121           9364 2019-05-23         9   8852       44
## 8122           9365 2019-06-06         9   8857       28
## 8123           9365 2019-01-16         9   8855       62
## 8124           9365 2018-07-09         9   8853       74
## 8125           9365 2019-04-23         9   8856       83
## 8126           9365 2018-09-10         9   8854        3
## 8127           9366 2018-09-15         9   8858       93
## 8128           9366 2019-04-26         9   8860       53
## 8129           9366 2019-06-05         9   8861       33
## 8130           9367 2019-05-15         9   8863       78
## 8131           9367 2018-11-25         9   8862        3
## 8132           9369 2019-03-10         9   8866        1
## 8133           9369 2018-10-26         9   8865       94
## 8134           9370 2018-11-20         9   8867       10
## 8135           9371 2018-11-27         9   8868       18
## 8136           9372 2018-09-25         9   8869       69
## 8137           9373 2018-10-24         9   8870       32
## 8138           9374 2019-05-25         9   8871      105
## 8139           9376 2018-10-03         9   8872       42
## 8140           9376 2019-03-26         9   8873       18
## 8141           9378 2019-02-26         9   8874       25
## 8142           9380 2018-07-03         9   8875       90
## 8143           9381 2018-12-08         9   8876       60
## 8144           9382 2018-08-06         9   8878       48
## 8145           9382 2018-07-09         9   8877      106
## 8146           9385 2019-01-28         9   8879      100
## 8147           9386 2019-04-05         9   8881       78
## 8148           9386 2018-08-14         9   8880      112
## 8149           9387 2018-08-21         9   8882      100
## 8150           9388 2019-04-08         9   8884       85
## 8151           9388 2018-12-31         9   8883        1
## 8152           9389 2018-12-30         9   8885       94
## 8153           9391 2019-01-02         9   8886       12
## 8154           9391 2019-03-24         9   8887       77
## 8155           9393 2018-09-08         9   8888      113
## 8156           9393 2018-11-10         9   8889       32
## 8157           9394 2019-02-26         9   8892      109
## 8158           9394 2018-12-10         9   8891       82
## 8159           9394 2018-09-03         9   8890       29
## 8160           9396 2018-12-30         9   8893       89
## 8161           9396 2019-01-20         9   8894       10
## 8162           9397 2018-09-02         9   8896       25
## 8163           9397 2018-09-23         9   8898       26
## 8164           9397 2018-09-12         9   8897       84
## 8165           9397 2018-08-28         9   8895       15
## 8166           9397 2018-09-26         9   8899       25
## 8167           9399 2018-07-11         9   8900      110
## 8168           9400 2018-12-03         9   8902       58
## 8169           9400 2018-08-11         9   8901        9
## 8170           9403 2018-11-08         9   8904       68
## 8171           9404 2019-06-12         9   8907       45
## 8172           9404 2019-03-28         9   8906       53
## 8173           9406 2019-01-28         9   8909       30
## 8174           9406 2019-06-05         9   8910       80
## 8175           9406 2018-10-18         9   8908      109
## 8176           9407 2018-12-08         9   8912       25
## 8177           9407 2018-10-24         9   8911       98
## 8178           9408 2018-09-16         9   8914       68
## 8179           9408 2019-01-21         9   8915       73
## 8180           9408 2019-06-02         9   8916       99
## 8181           9408 2018-07-01         9   8913       66
## 8182           9412 2019-01-30         9   8917        2
## 8183           9413 2018-07-30         9   8918       85
## 8184           9414 2018-11-02         9   8920       77
## 8185           9414 2019-05-16         9   8921       58
## 8186           9414 2018-07-12         9   8919        9
## 8187           9415 2018-09-18         9   8922        7
## 8188           9415 2018-11-12         9   8923       22
## 8189           9418 2019-04-25         9   8925       12
## 8190           9418 2018-09-20         9   8924       93
## 8191           9419 2019-02-01         9   8926        9
## 8192           9420 2018-12-04         9   8927       19
## 8193           9423 2018-12-27         9   8928       99
## 8194           9424 2018-12-30         9   8929       21
## 8195           9426 2019-03-12         9   8931       15
## 8196           9427 2019-06-17         9   8932       24
## 8197           9428 2019-04-25         9   8933       36
## 8198           9429 2019-04-13         9   8936       46
## 8199           9429 2019-01-02         9   8935       20
## 8200           9430 2018-08-28         9   8937       31
## 8201           9431 2018-09-08         9   8938       80
## 8202           9432 2018-07-08         9   8939       17
## 8203           9434 2019-01-14         9   8940       38
## 8204           9435 2018-09-09         9   8941       25
## 8205           9438 2019-02-02         9   8943       22
## 8206           9438 2018-10-08         9   8942       99
## 8207           9439 2018-07-27         9   8945       30
## 8208           9439 2018-07-11         9   8944       21
## 8209           9439 2018-10-02         9   8946      113
## 8210           9440 2019-02-07         9   8947       87
## 8211           9440 2019-06-16         9   8948       38
## 8212           9442 2019-01-08         9   8950       21
## 8213           9442 2018-11-06         9   8949       98
## 8214           9444 2018-07-06         9   8951        6
## 8215           9444 2019-01-21         9   8952      110
## 8216           9447 2019-01-18         9   8953       20
## 8217           9447 2019-02-26         9   8954       47
## 8218           9454 2018-07-02         9   8956       50
## 8219           9454 2018-08-10         9   8957       74
## 8220           9457 2019-01-26         9   8963       88
## 8221           9457 2018-08-10         9   8960       21
## 8222           9457 2018-10-21         9   8961       71
## 8223           9457 2018-11-24         9   8962       97
## 8224           9458 2019-06-14         9   8965      107
## 8225           9459 2018-08-15         9   8966       42
## 8226           9461 2018-07-29         9   8968       22
## 8227           9461 2019-06-07         9   8969       36
## 8228           9462 2018-08-03         9   8970       73
## 8229           9463 2019-01-05         9   8972       47
## 8230           9463 2018-08-10         9   8971       98
## 8231           9464 2018-08-21         9   8973       72
## 8232           9465 2018-07-05         9   8974      106
## 8233           9466 2018-09-29         9   8975       10
## 8234           9467 2019-02-12         9   8976       98
## 8235           9469 2019-06-26         9   8977        4
## 8236           9470 2018-12-23         9   8978       37
## 8237           9472 2018-12-20         9   8979       23
## 8238           9473 2018-08-03         9   8981       80
## 8239           9473 2018-09-05         9   8982      107
## 8240           9475 2019-04-30         9   8983       26
## 8241           9476 2019-03-02         9   8984       80
## 8242           9478 2019-01-15         9   8986       85
## 8243           9479 2019-03-16         9   8987       14
## 8244           9480 2019-04-13         9   8988        5
## 8245           9481 2019-02-25         9   8989       79
## 8246           9482 2019-03-05         9   8991       20
## 8247           9482 2018-11-10         9   8990       16
## 8248           9483 2018-12-07         9   8992        6
## 8249           9483 2019-05-01         9   8993      109
## 8250           9484 2018-11-16         9   8995      106
## 8251           9486 2018-09-08         9   8998       60
## 8252           9486 2018-07-20         9   8996       88
## 8253           9487 2019-06-11         9   8999       84
## 8254           9488 2018-11-04         9   9000       19
## 8255           9491 2019-01-08         9   9001       49
## 8256           9492 2019-02-22         9   9002       63
## 8257           9494 2019-06-10         9   9004       27
## 8258           9494 2019-02-25         9   9003       31
## 8259           9495 2019-01-15         9   9005       75
## 8260           9498 2018-10-05         9   9008        5
## 8261           9498 2018-09-05         9   9007       87
## 8262           9499 2018-10-28         9   9010       13
## 8263           9499 2019-03-19         9   9011       69
## 8264           9501 2018-07-07         9   9012       29
## 8265           9503 2018-08-19         9   9015       24
## 8266           9503 2019-05-31         9   9016       48
## 8267           9504 2018-12-26         9   9017       94
## 8268           9505 2019-05-08         9   9019       79
## 8269           9505 2018-07-30         9   9018       42
## 8270          10000 2018-11-10        10   9022      106
## 8271          10000 2018-08-17        10   9020        9
## 8272          10000 2018-09-02        10   9021       95
## 8273          10001 2018-09-27        10   9026       96
## 8274          10001 2018-12-02        10   9027       12
## 8275          10001 2019-03-23        10   9031       30
## 8276          10001 2018-08-13        10   9023       58
## 8277          10001 2018-09-26        10   9025       27
## 8278          10001 2018-08-25        10   9024      104
## 8279          10001 2018-12-19        10   9028       20
## 8280          10001 2019-02-16        10   9029      106
## 8281          10001 2019-03-14        10   9030       93
## 8282          10002 2018-07-22        10   9032       18
## 8283          10002 2019-06-26        10   9040       49
## 8284          10002 2019-04-22        10   9038       87
## 8285          10002 2019-03-25        10   9037       68
## 8286          10002 2018-10-08        10   9035       58
## 8287          10002 2018-09-09        10   9034      100
## 8288          10002 2018-10-24        10   9036       73
## 8289          10002 2019-04-23        10   9039       74
## 8290          10003 2019-02-14        10   9045       85
## 8291          10003 2018-12-24        10   9043       29
## 8292          10003 2018-08-18        10   9041       74
## 8293          10003 2019-04-02        10   9046       79
## 8294          10003 2019-01-19        10   9044       40
## 8295          10003 2019-05-06        10   9047       58
## 8296          10004 2018-10-03        10   9049       30
## 8297          10004 2018-09-21        10   9048       53
## 8298          10004 2019-02-20        10   9052       75
## 8299          10004 2018-11-12        10   9050       70
## 8300          10004 2019-05-06        10   9053       12
## 8301          10004 2019-06-12        10   9055       96
## 8302          10005 2019-01-24        10   9061       48
## 8303          10005 2019-04-01        10   9063       81
## 8304          10005 2018-11-06        10   9059       43
## 8305          10005 2019-01-02        10   9060       99
## 8306          10005 2018-10-16        10   9058       10
## 8307          10005 2018-09-20        10   9057       27
## 8308          10005 2019-05-30        10   9064       10
## 8309          10005 2019-02-13        10   9062        7
## 8310          10006 2018-09-01        10   9065       10
## 8311          10006 2019-06-29        10   9070       12
## 8312          10006 2018-12-10        10   9068       36
## 8313          10006 2019-02-10        10   9069       51
## 8314          10006 2018-10-03        10   9066        4
## 8315          10006 2018-10-28        10   9067        7
## 8316          10007 2019-04-14        10   9075      106
## 8317          10007 2018-12-05        10   9072       47
## 8318          10007 2019-02-18        10   9073       56
## 8319          10007 2019-05-25        10   9076       10
## 8320          10007 2019-03-12        10   9074       52
## 8321          10007 2018-09-26        10   9071      107
## 8322          10008 2019-06-22        10   9083       63
## 8323          10008 2018-07-16        10   9077      110
## 8324          10008 2019-01-07        10   9080       97
## 8325          10008 2018-09-08        10   9078       31
## 8326          10008 2019-02-02        10   9082       88
## 8327          10008 2019-01-15        10   9081       91
## 8328          10008 2018-11-10        10   9079       46
## 8329          10009 2019-01-02        10   9088       30
## 8330          10009 2018-10-07        10   9085       22
## 8331          10009 2019-01-05        10   9089       50
## 8332          10009 2018-10-04        10   9084       77
## 8333          10009 2019-04-09        10   9090       52
##                                     PROD_NAME PROD_QTY TOT_SALES PACK_SIZE
## 1             Natural Chip Compny SeaSalt175g        2      6.00       175
## 2       Red Rock Deli Chikn&Garlic Aioli 150g        1      2.70       150
## 3           Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 4          Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 5              WW Original Stacked Chips 160g        1      1.90       160
## 6                          Cheetos Puffs 165g        1      2.80       165
## 7    Infuzions SourCream&Herbs Veg Strws 110g        1      3.80       110
## 8             RRD SR Slow Rst Pork Belly 150g        1      2.70       150
## 9                 Doritos Cheese Supreme 330g        1      5.70       330
## 10                      Doritos Mexicana 170g        2      8.80       170
## 11   Infuzions SourCream&Herbs Veg Strws 110g        1      3.80       110
## 12     Smiths Crinkle Cut Chips Barbecue 170g        1      2.90       170
## 13      GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 14     Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 15                Doritos Cheese Supreme 330g        1      5.70       330
## 16                      CCs Tasty Cheese 175g        2      4.20       175
## 17    Doritos Corn Chip Southern Chicken 150g        1      3.90       150
## 18               Tostitos Splash Of Lime 175g        1      4.40       175
## 19               Kettle 135g Swt Pot Sea Salt        1      4.20       135
## 20                    RRD Salt & Vinegar 165g        1      3.00       165
## 21     Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 22        Infuzions Mango Chutny Papadums 70g        1      2.40        70
## 23      GrnWves Plus Btroot & Chilli Jam 180g        1      3.10       180
## 24         Smiths Crinkle Cut Snag&Sauce 150g        1      2.60       150
## 25               Smiths Crinkle Original 330g        1      5.70       330
## 26      GrnWves Plus Btroot & Chilli Jam 180g        1      3.10       180
## 27     Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 28         RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 29            Natural Chip Compny SeaSalt175g        1      3.00       175
## 30      Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 31                      CCs Tasty Cheese 175g        1      2.10       175
## 32        Infuzions Mango Chutny Papadums 70g        1      2.40        70
## 33   Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 34            RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 35      Natural ChipCo Sea Salt & Vinegr 175g        1      3.00       175
## 36              Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 37         RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 38        Natural Chip Co Tmato Hrb&Spce 175g        1      3.00       175
## 39                          Burger Rings 220g        1      2.30       220
## 40               Woolworths Cheese Rings 190g        1      1.80       190
## 41               Kettle 135g Swt Pot Sea Salt        1      4.20       135
## 42         Smiths Thinly Swt Chli&S/Cream175G        1      3.00       175
## 43           Thins Chips Seasonedchicken 175g        1      3.30       175
## 44       Smiths Thinly Cut Roast Chicken 175g        1      3.00       175
## 45         Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 46     Smiths Crinkle Cut Chips Barbecue 170g        1      2.90       170
## 47        Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 48     Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 49       Smiths Chip Thinly Cut Original 175g        1      3.00       175
## 50     Smiths Crinkle Cut Chips Original 170g        2      5.80       170
## 51              Thins Chips Light& Tangy 175g        1      3.30       175
## 52           Doritos Corn Chips Original 170g        1      4.40       170
## 53     Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 54        Kettle Sensations Siracha Lime 150g        1      4.60       150
## 55     Smiths Crinkle Cut Salt & Vinegar 170g        1      2.90       170
## 56           Smith Crinkle Cut Bolognese 150g        1      2.60       150
## 57    Doritos Corn Chip Southern Chicken 150g        1      3.90       150
## 58                         Kettle Chilli 175g        1      5.40       175
## 59                       Cheezels Cheese 330g        1      5.70       330
## 60                       Twisties Cheese 270g        1      4.60       270
## 61        Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 62           Doritos Corn Chips Original 170g        1      4.40       170
## 63              Thins Chips Light& Tangy 175g        1      3.30       175
## 64                   RRD Chilli& Coconut 150g        1      2.70       150
## 65                WW Crinkle Cut Chicken 175g        1      1.70       175
## 66      Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 67         Smiths Crinkle Cut Snag&Sauce 150g        1      2.60       150
## 68        Infuzions Mango Chutny Papadums 70g        1      2.40        70
## 69      GrnWves Plus Btroot & Chilli Jam 180g        1      3.10       180
## 70      Sunbites Whlegrn Crisps Frch/Onin 90g        1      1.70        90
## 71     Smiths Crinkle Cut Salt & Vinegar 170g        1      2.90       170
## 72      Sunbites Whlegrn Crisps Frch/Onin 90g        1      1.70        90
## 73       Kettle Tortilla ChpsFeta&Garlic 150g        1      4.60       150
## 74     Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 75      Sunbites Whlegrn Crisps Frch/Onin 90g        1      1.70        90
## 76    Smiths Crinkle Cut French OnionDip 150g        1      2.60       150
## 77    Smiths Crinkle Cut French OnionDip 150g        1      2.60       150
## 78       Kettle Tortilla ChpsFeta&Garlic 150g        2      4.60       150
## 79              WW D/Style Chip Sea Salt 200g        1      1.90       200
## 80      Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 81       Smiths Chip Thinly Cut Original 175g        1      3.00       175
## 82     Smiths Crinkle Cut Chips Original 170g        1      2.90       170
## 83             WW Original Stacked Chips 160g        2      3.80       160
## 84           Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 85              Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 86              Tostitos Smoked Chipotle 175g        1      4.40       175
## 87          Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 88      Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 89                    RRD Salt & Vinegar 165g        1      3.00       165
## 90                     RRD Lime & Pepper 165g        1      3.00       165
## 91                      CCs Nacho Cheese 175g        2      4.20       175
## 92       Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 93    Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 94         RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 95           Pringles Sthrn FriedChicken 134g        2      7.40       134
## 96      Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 97           Pringles Chicken Salt Crips 134g        1      3.70       134
## 98             French Fries Potato Chips 175g        1      3.00       175
## 99       Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 100      Snbts Whlgrn Crisps Cheddr&Mstrd 90g        1      1.70        90
## 101    Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 102              Woolworths Cheese Rings 190g        1      1.80       190
## 103                    RRD Lime & Pepper 165g        1      3.00       165
## 104                         CCs Original 175g        1      2.10       175
## 105    Smiths Crinkle Cut Salt & Vinegar 170g        1      2.90       170
## 106              Tostitos Lightly Salted 175g        2      8.80       175
## 107     Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 108     Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 109        Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 110                     CCs Nacho Cheese 175g        1      2.10       175
## 111     Smiths Crinkle Cut Chips Chicken 170g        1      2.90       170
## 112          Smith Crinkle Cut Bolognese 150g        1      2.60       150
## 113    Smiths Crinkle Cut Chips Chs&Onion170g        1      2.90       170
## 114                     CCs Nacho Cheese 175g        2      4.20       175
## 115    Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 116                      Twisties Chicken270g        1      4.60       270
## 117      Red Rock Deli Sp Salt & Truffle 150G        1      2.70       150
## 118       Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 119                      RRD Pc Sea Salt 165g        1      3.00       165
## 120     Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 121          Pringles Chicken Salt Crips 134g        1      3.70       134
## 122        RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 123     Red Rock Deli Chikn&Garlic Aioli 150g        1      2.70       150
## 124              Woolworths Cheese Rings 190g        2      3.60       190
## 125          Doritos Corn Chips Original 170g        1      4.40       170
## 126         WW Supreme Cheese Corn Chips 200g        1      1.90       200
## 127      Smiths Thinly Cut Roast Chicken 175g        1      3.00       175
## 128          Pringles Sthrn FriedChicken 134g        2      7.40       134
## 129               WW Original Corn Chips 200g        1      1.90       200
## 130         Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 131    Smiths Crinkle Cut Chips Original 170g        2      5.80       170
## 132                  Cheezels Cheese Box 125g        1      2.10       125
## 133      Red Rock Deli Sp Salt & Truffle 150G        1      2.70       150
## 134     Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 135    Smiths Crinkle Cut Chips Chs&Onion170g        1      2.90       170
## 136             Tostitos Smoked Chipotle 175g        1      4.40       175
## 137                     CCs Nacho Cheese 175g        1      2.10       175
## 138             WW D/Style Chip Sea Salt 200g        1      1.90       200
## 139        Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 140                     Doritos Mexicana 170g        2      8.80       170
## 141    Infzns Crn Crnchers Tangy Gcamole 110g        1      3.80       110
## 142  Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        1      3.80       110
## 143              Tostitos Splash Of Lime 175g        1      4.40       175
## 144                         CCs Original 175g        2      4.20       175
## 145                     CCs Tasty Cheese 175g        1      2.10       175
## 146    WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 147  Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        1      3.80       110
## 148      Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 149        Smiths Crinkle Cut Snag&Sauce 150g        1      2.60       150
## 150        Smiths Crinkle Cut Snag&Sauce 150g        1      2.60       150
## 151           Natural Chip Compny SeaSalt175g        2      6.00       175
## 152                      Cheezels Cheese 330g        1      5.70       330
## 153        RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 154             Pringles Mystery Flavour 134g        1      3.70       134
## 155                         CCs Original 175g        1      2.10       175
## 156                    Pringles Barbeque 134g        1      3.70       134
## 157             Grain Waves Sweet Chilli 210g        1      3.60       210
## 158               Doritos Cheese Supreme 330g        1      5.70       330
## 159     Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 160              Pringles Sweet&Spcy BBQ 134g        1      3.70       134
## 161       Natural Chip Co Tmato Hrb&Spce 175g        1      3.00       175
## 162                      Kettle Original 175g        1      5.40       175
## 163           RRD SR Slow Rst Pork Belly 150g        1      2.70       150
## 164  Infuzions Thai SweetChili PotatoMix 110g        1      3.80       110
## 165       Natural Chip Co Tmato Hrb&Spce 175g        1      3.00       175
## 166              Tostitos Splash Of Lime 175g        2      8.80       175
## 167                        Cheetos Puffs 165g        1      2.80       165
## 168                      RRD Pc Sea Salt 165g        2      6.00       165
## 169     Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 170                         CCs Original 175g        1      2.10       175
## 171     Natural ChipCo Sea Salt & Vinegr 175g        1      3.00       175
## 172         Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 173  Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 174            Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 175          Pringles Sthrn FriedChicken 134g        1      3.70       134
## 176        Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 177    Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 178   Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 179      Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 180    WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 181              Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 182        Smiths Thinly Swt Chli&S/Cream175G        1      3.00       175
## 183                    RRD Lime & Pepper 165g        2      6.00       165
## 184       Infuzions Mango Chutny Papadums 70g        1      2.40        70
## 185     Cobs Popd Sour Crm &Chives Chips 110g        1      3.80       110
## 186             WW D/Style Chip Sea Salt 200g        1      1.90       200
## 187      Snbts Whlgrn Crisps Cheddr&Mstrd 90g        1      1.70        90
## 188       Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 189            WW Original Stacked Chips 160g        2      3.80       160
## 190                      Kettle Original 175g        1      5.40       175
## 191       Red Rock Deli Thai Chilli&Lime 150g        1      2.70       150
## 192                  RRD Chilli& Coconut 150g        1      2.70       150
## 193       Kettle Sensations Siracha Lime 150g        1      4.60       150
## 194                      Cheezels Cheese 330g        1      5.70       330
## 195                  RRD Chilli& Coconut 150g        2      5.40       150
## 196        RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 197               Twisties Cheese Burger 250g        1      4.30       250
## 198          Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 199                      Cheezels Cheese 330g        1      5.70       330
## 200              Woolworths Cheese Rings 190g        1      1.80       190
## 201      Smiths Thinly Cut Roast Chicken 175g        1      3.00       175
## 202                      Cheezels Cheese 330g        1      5.70       330
## 203          Kettle Sea Salt And Vinegar 175g        1      5.40       175
## 204                      Cheezels Cheese 330g        2     11.40       330
## 205             Thins Chips Light& Tangy 175g        1      3.30       175
## 206     Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 207          Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 208                      Cheezels Cheese 330g        1      5.70       330
## 209      Red Rock Deli Sp Salt & Truffle 150G        1      2.70       150
## 210       Red Rock Deli Thai Chilli&Lime 150g        1      2.70       150
## 211      Red Rock Deli Sp Salt & Truffle 150G        1      2.70       150
## 212    Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 213              WW Crinkle Cut Original 175g        1      1.70       175
## 214                     CCs Tasty Cheese 175g        1      2.10       175
## 215     Cobs Popd Sour Crm &Chives Chips 110g        1      3.80       110
## 216              Dorito Corn Chp Supreme 380g        1      6.50       380
## 217                  Cheezels Cheese Box 125g        1      2.10       125
## 218                    RRD Lime & Pepper 165g        1      3.00       165
## 219     Smiths Crinkle Cut Chips Chicken 170g        1      2.90       170
## 220             Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 221    Smiths Crinkle Cut Chips Barbecue 170g        2      5.80       170
## 222         WW Supreme Cheese Corn Chips 200g        1      1.90       200
## 223    Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 224     Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 225               Twisties Cheese Burger 250g        1      4.30       250
## 226    Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 227                    Pringles Barbeque 134g        1      3.70       134
## 228              Smiths Crinkle Original 330g        1      5.70       330
## 229     Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 230     Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 231               WW Original Corn Chips 200g        1      1.90       200
## 232                     Doritos Mexicana 170g        2      8.80       170
## 233          Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 234            French Fries Potato Chips 175g        1      3.00       175
## 235   Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 236             Pringles SourCream Onion 134g        1      3.70       134
## 237                    Pringles Barbeque 134g        1      3.70       134
## 238    Infzns Crn Crnchers Tangy Gcamole 110g        1      3.80       110
## 239                  Cheezels Cheese Box 125g        1      2.10       125
## 240          Smith Crinkle Cut Bolognese 150g        1      2.60       150
## 241          Thins Chips Seasonedchicken 175g        2      6.60       175
## 242               WW Original Corn Chips 200g        1      1.90       200
## 243      Snbts Whlgrn Crisps Cheddr&Mstrd 90g        1      1.70        90
## 244               WW Original Corn Chips 200g        1      1.90       200
## 245      Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 246             Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 247  Infuzions SourCream&Herbs Veg Strws 110g        1      3.80       110
## 248           RRD SR Slow Rst Pork Belly 150g        1      2.70       150
## 249             Tostitos Smoked Chipotle 175g        1      4.40       175
## 250   Smiths Crinkle Cut French OnionDip 150g        1      2.60       150
## 251     Smiths Crinkle Cut Chips Chicken 170g        1      2.90       170
## 252  Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 253              Woolworths Cheese Rings 190g        2      3.60       190
## 254             Tostitos Smoked Chipotle 175g        1      4.40       175
## 255    WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 256      Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 257   Doritos Corn Chip Mexican Jalapeno 150g        1      3.90       150
## 258          Kettle Sea Salt And Vinegar 175g        1      5.40       175
## 259              Dorito Corn Chp Supreme 380g        1      6.50       380
## 260        Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 261                      Twisties Cheese 270g        1      4.60       270
## 262     Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 263     Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 264          Pringles Chicken Salt Crips 134g        1      3.70       134
## 265   Doritos Corn Chip Southern Chicken 150g        1      3.90       150
## 266     Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 267          Pringles Sthrn FriedChicken 134g        1      3.70       134
## 268          Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 269                        Cheetos Puffs 165g        1      2.80       165
## 270      Smiths Thinly Cut Roast Chicken 175g        1      3.00       175
## 271             Pringles Mystery Flavour 134g        2      7.40       134
## 272  Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 273               Twisties Cheese Burger 250g        1      4.30       250
## 274              RRD Steak & Chimuchurri 150g        1      2.70       150
## 275           Thins Chips Salt & Vinegar 175g        1      3.30       175
## 276                         Burger Rings 220g        1      2.30       220
## 277              Kettle 135g Swt Pot Sea Salt        1      4.20       135
## 278                      Twisties Chicken270g        1      4.60       270
## 279     Cobs Popd Sour Crm &Chives Chips 110g        1      3.80       110
## 280   Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 281     Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 282       Red Rock Deli Thai Chilli&Lime 150g        1      2.70       150
## 283                  RRD Chilli& Coconut 150g        1      2.70       150
## 284    WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 285     Natural ChipCo Sea Salt & Vinegr 175g        1      3.00       175
## 286     Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 287                      RRD Pc Sea Salt 165g        2      6.00       165
## 288                         Burger Rings 220g        1      2.30       220
## 289                      Twisties Cheese 270g        2      9.20       270
## 290       Tyrrells Crisps Lightly Salted 165g        1      4.20       165
## 291          Pringles Chicken Salt Crips 134g        1      3.70       134
## 292                     CCs Nacho Cheese 175g        1      2.10       175
## 293            WW Original Stacked Chips 160g        4      7.60       160
## 294          Pringles Chicken Salt Crips 134g        1      3.70       134
## 295     Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 296     Sunbites Whlegrn Crisps Frch/Onin 90g        1      1.70        90
## 297         WW Supreme Cheese Corn Chips 200g        1      1.90       200
## 298            WW Original Stacked Chips 160g        2      3.80       160
## 299                         CCs Original 175g        1      2.10       175
## 300                      Kettle Original 175g        2     10.80       175
## 301     Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 302   Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 303    Smiths Crinkle Cut Chips Original 170g        2      5.80       170
## 304    WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 305            Thins Chips Originl saltd 175g        2      6.60       175
## 306               Doritos Cheese Supreme 330g        1      5.70       330
## 307              Smiths Crinkle Original 330g        1      5.70       330
## 308             Tostitos Smoked Chipotle 175g        1      4.40       175
## 309                     CCs Nacho Cheese 175g        3      6.30       175
## 310            WW Original Stacked Chips 160g        2      3.80       160
## 311                         CCs Original 175g        1      2.10       175
## 312   Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 313          Smith Crinkle Cut Bolognese 150g        1      2.60       150
## 314     Smiths Chip Thinly S/Cream&Onion 175g        1      3.00       175
## 315          Thins Chips Seasonedchicken 175g        1      3.30       175
## 316                        Cheetos Puffs 165g        1      2.80       165
## 317                RRD Honey Soy Chicken 165g        2      6.00       165
## 318             Tostitos Smoked Chipotle 175g        1      4.40       175
## 319           Natural Chip Compny SeaSalt175g        1      3.00       175
## 320              WW Crinkle Cut Original 175g        1      1.70       175
## 321          Doritos Corn Chips Original 170g        1      4.40       170
## 322             Kettle Honey Soy Chicken 175g        1      5.40       175
## 323       NCC Sour Cream & Garden Chives 175g        1      3.00       175
## 324             Grain Waves Sweet Chilli 210g        2      7.20       210
## 325      Kettle Tortilla ChpsFeta&Garlic 150g        1      4.60       150
## 326             Pringles Original Crisps 134g        1      3.70       134
## 327              WW Crinkle Cut Original 175g        2      3.40       175
## 328   Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 329             Thins Chips Light& Tangy 175g        1      3.30       175
## 330   Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 331      Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 332          Pringles Chicken Salt Crips 134g        1      3.70       134
## 333               WW Crinkle Cut Chicken 175g        1      1.70       175
## 334              Tostitos Lightly Salted 175g        1      4.40       175
## 335             Pringles SourCream Onion 134g        1      3.70       134
## 336                         Burger Rings 220g        1      2.30       220
## 337     Smiths Crinkle Cut Chips Chicken 170g        1      2.90       170
## 338              RRD Steak & Chimuchurri 150g        1      2.70       150
## 339       Smith Crinkle Cut Mac N Cheese 150g        2      5.20       150
## 340                  RRD Chilli& Coconut 150g        1      2.70       150
## 341       Red Rock Deli Thai Chilli&Lime 150g        1      2.70       150
## 342               WW Original Corn Chips 200g        1      1.90       200
## 343          Doritos Corn Chips Original 170g        1      4.40       170
## 344     Smiths Crinkle Cut Chips Chicken 170g        2      2.90       170
## 345              Pringles Sweet&Spcy BBQ 134g        1      3.70       134
## 346       Natural Chip Co Tmato Hrb&Spce 175g        1      3.00       175
## 347   Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 348      Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 349         Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 350    Smiths Crinkle Cut Chips Original 170g        1      2.90       170
## 351       Thins Potato Chips Hot & Spicy 175g        1      3.30       175
## 352      Red Rock Deli Sp Salt & Truffle 150G        1      2.70       150
## 353     Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 354            Cheetos Chs & Bacon Balls 190g        1      3.30       190
## 355     Cobs Popd Sour Crm &Chives Chips 110g        1      3.80       110
## 356                     CCs Tasty Cheese 175g        1      2.10       175
## 357  Kettle Tortilla ChpsHny&Jlpno Chili 150g        1      4.60       150
## 358  Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 359                        Kettle Chilli 175g        1      5.40       175
## 360              WW Crinkle Cut Original 175g        1      1.70       175
## 361       Red Rock Deli Thai Chilli&Lime 150g        1      2.70       150
## 362                      Twisties Chicken270g        2      9.20       270
## 363              Pringles Sweet&Spcy BBQ 134g        1      3.70       134
## 364                         Burger Rings 220g        1      2.30       220
## 365          Thins Chips Seasonedchicken 175g        1      3.30       175
## 366        RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 367          Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 368  Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 369    Infzns Crn Crnchers Tangy Gcamole 110g        1      3.80       110
## 370                    Pringles Barbeque 134g        1      3.70       134
## 371                      Kettle Original 175g        1      5.40       175
## 372             Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 373             Thins Chips Light& Tangy 175g        1      3.30       175
## 374           Thins Chips Salt & Vinegar 175g        1      3.30       175
## 375                      RRD Pc Sea Salt 165g        1      3.00       165
## 376                      Twisties Chicken270g        1      4.60       270
## 377         WW Supreme Cheese Corn Chips 200g        1      1.90       200
## 378              Smiths Crinkle Original 330g        1      5.70       330
## 379       Smith Crinkle Cut Mac N Cheese 150g        1      2.60       150
## 380                     Doritos Mexicana 170g        2      8.80       170
## 381       Natural Chip Co Tmato Hrb&Spce 175g        1      3.00       175
## 382                    RRD Lime & Pepper 165g        1      3.00       165
## 383    Infzns Crn Crnchers Tangy Gcamole 110g        1      3.80       110
## 384     GrnWves Plus Btroot & Chilli Jam 180g        1      3.10       180
## 385    WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 386   Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 387       NCC Sour Cream & Garden Chives 175g        1      3.00       175
## 388                     CCs Nacho Cheese 175g        2      4.20       175
## 389                     CCs Nacho Cheese 175g        2      4.20       175
## 390             Pringles SourCream Onion 134g        1      3.70       134
## 391              Woolworths Cheese Rings 190g        1      1.80       190
## 392     GrnWves Plus Btroot & Chilli Jam 180g        1      3.10       180
## 393             Tostitos Smoked Chipotle 175g        1      4.40       175
## 394              Tostitos Splash Of Lime 175g        1      4.40       175
## 395               Twisties Cheese Burger 250g        2      8.60       250
## 396                RRD Honey Soy Chicken 165g        2      6.00       165
## 397   Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 398             Pringles SourCream Onion 134g        2      7.40       134
## 399         Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 400            Thins Chips Originl saltd 175g        1      3.30       175
## 401            Thins Chips Originl saltd 175g        2      6.60       175
## 402                         CCs Original 175g        2      4.20       175
## 403                         Burger Rings 220g        1      2.30       220
## 404     Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 405      Smiths Chip Thinly Cut Original 175g        1      3.00       175
## 406              Tostitos Splash Of Lime 175g        1      4.40       175
## 407     Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 408              RRD Steak & Chimuchurri 150g        1      2.70       150
## 409     Sunbites Whlegrn Crisps Frch/Onin 90g        1      1.70        90
## 410         WW Supreme Cheese Corn Chips 200g        1      1.90       200
## 411        Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 412             Pringles SourCream Onion 134g        1      3.70       134
## 413         WW Supreme Cheese Corn Chips 200g        1      1.90       200
## 414               WW Original Corn Chips 200g        2      3.80       200
## 415          Doritos Corn Chips Original 170g        1      4.40       170
## 416          Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 417      Red Rock Deli Sp Salt & Truffle 150G        1      2.70       150
## 418                  RRD Chilli& Coconut 150g        1      2.70       150
## 419             Grain Waves Sweet Chilli 210g        1      3.60       210
## 420    WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 421             Pringles SourCream Onion 134g        1      3.70       134
## 422         WW Supreme Cheese Corn Chips 200g        1      1.90       200
## 423          Kettle Sea Salt And Vinegar 175g        1      5.40       175
## 424    WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 425               Twisties Cheese Burger 250g        1      4.30       250
## 426     GrnWves Plus Btroot & Chilli Jam 180g        1      3.10       180
## 427        Smiths Thinly Swt Chli&S/Cream175G        2      6.00       175
## 428       Natural Chip Co Tmato Hrb&Spce 175g        1      3.00       175
## 429                        Kettle Chilli 175g        1      5.40       175
## 430               WW Crinkle Cut Chicken 175g        1      1.70       175
## 431    Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 432     Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 433      Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 434                RRD Honey Soy Chicken 165g        1      3.00       165
## 435   Doritos Corn Chip Mexican Jalapeno 150g        1      3.90       150
## 436     Sunbites Whlegrn Crisps Frch/Onin 90g        1      1.70        90
## 437      Smiths Chip Thinly Cut Original 175g        1      3.00       175
## 438             Thins Chips Light& Tangy 175g        1      3.30       175
## 439              RRD Steak & Chimuchurri 150g        2      5.40       150
## 440       Tyrrells Crisps Lightly Salted 165g        1      4.20       165
## 441    Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 442             Grain Waves Sweet Chilli 210g        2      7.20       210
## 443   Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 444                      Cheezels Cheese 330g        1      5.70       330
## 445          Thins Chips Seasonedchicken 175g        1      3.30       175
## 446   Smiths Crinkle Cut French OnionDip 150g        1      2.60       150
## 447      Red Rock Deli Sp Salt & Truffle 150G        1      2.70       150
## 448  Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        1      3.80       110
## 449      Kettle Tortilla ChpsFeta&Garlic 150g        1      4.60       150
## 450      Snbts Whlgrn Crisps Cheddr&Mstrd 90g        1      1.70        90
## 451          Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 452    Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 453      Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 454          Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 455              RRD Steak & Chimuchurri 150g        1      2.70       150
## 456            WW Original Stacked Chips 160g        1      1.90       160
## 457    Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 458  Infuzions SourCream&Herbs Veg Strws 110g        1      3.80       110
## 459    WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 460             Grain Waves Sweet Chilli 210g        1      3.60       210
## 461              Tostitos Splash Of Lime 175g        1      4.40       175
## 462    Smiths Crinkle Cut Chips Original 170g        1      2.90       170
## 463       Smith Crinkle Cut Mac N Cheese 150g        1      2.60       150
## 464      Smiths Thinly Cut Roast Chicken 175g        1      3.00       175
## 465     Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 466              WW Crinkle Cut Original 175g        1      1.70       175
## 467   Smiths Crinkle Cut French OnionDip 150g        1      2.60       150
## 468          Pringles Sthrn FriedChicken 134g        2      7.40       134
## 469   Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 470          Doritos Corn Chips Original 170g        1      4.40       170
## 471        Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 472             Pringles SourCream Onion 134g        2      7.40       134
## 473     Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 474               Doritos Cheese Supreme 330g        1      5.70       330
## 475             Pringles SourCream Onion 134g        2      7.40       134
## 476              Smiths Crinkle Original 330g        1      5.70       330
## 477       Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 478               Twisties Cheese Burger 250g        1      4.30       250
## 479                        Kettle Chilli 175g        1      5.40       175
## 480       Tyrrells Crisps Lightly Salted 165g        1      4.20       165
## 481                  Pringles Slt Vingar 134g        2      7.40       134
## 482              Kettle 135g Swt Pot Sea Salt        1      4.20       135
## 483             Tostitos Smoked Chipotle 175g        2      8.80       175
## 484      Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 485       Red Rock Deli Thai Chilli&Lime 150g        1      2.70       150
## 486         Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 487    Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 488             Tostitos Smoked Chipotle 175g        2      8.80       175
## 489          Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 490        Smiths Crinkle Cut Snag&Sauce 150g        4     10.40       150
## 491     Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 492            WW Original Stacked Chips 160g        1      1.90       160
## 493               WW Original Corn Chips 200g        2      3.80       200
## 494              Tostitos Lightly Salted 175g        2      8.80       175
## 495             Kettle Honey Soy Chicken 175g        1      5.40       175
## 496                RRD Honey Soy Chicken 165g        2      6.00       165
## 497       Smith Crinkle Cut Mac N Cheese 150g        1      2.60       150
## 498              Pringles Sweet&Spcy BBQ 134g        1      3.70       134
## 499                  Cheezels Cheese Box 125g        2      4.20       125
## 500                        Kettle Chilli 175g        1      5.40       175
## 501     Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 502          Doritos Corn Chips Original 170g        1      4.40       170
## 503      Smiths Chip Thinly Cut Original 175g        1      3.00       175
## 504       Tyrrells Crisps Lightly Salted 165g        1      4.20       165
## 505              WW Crinkle Cut Original 175g        1      1.70       175
## 506                      Cheezels Cheese 330g        1      5.70       330
## 507              Kettle 135g Swt Pot Sea Salt        1      4.20       135
## 508                      Twisties Chicken270g        1      4.60       270
## 509              Dorito Corn Chp Supreme 380g        1      6.50       380
## 510       Kettle Sensations Siracha Lime 150g        1      4.60       150
## 511                  Cheezels Cheese Box 125g        1      2.10       125
## 512  Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        1      3.80       110
## 513    Smiths Crinkle Cut Chips Original 170g        1      2.90       170
## 514             Pringles SourCream Onion 134g        1      3.70       134
## 515             Grain Waves Sweet Chilli 210g        1      3.60       210
## 516         Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 517          Pringles Chicken Salt Crips 134g        2      7.40       134
## 518                         Burger Rings 220g        1      2.30       220
## 519       Kettle Sensations Siracha Lime 150g        1      4.60       150
## 520                         Burger Rings 220g        1      2.30       220
## 521                     CCs Tasty Cheese 175g        2      4.20       175
## 522     Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 523   Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 524                      Twisties Chicken270g        1      4.60       270
## 525      Snbts Whlgrn Crisps Cheddr&Mstrd 90g        1      1.70        90
## 526   Smiths Crinkle Cut French OnionDip 150g        1      2.60       150
## 527              Tostitos Splash Of Lime 175g        2      8.80       175
## 528       Smith Crinkle Cut Mac N Cheese 150g        1      2.60       150
## 529    Smiths Crinkle Cut Chips Original 170g        1      2.90       170
## 530              Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 531           Natural Chip Compny SeaSalt175g        1      3.00       175
## 532       Red Rock Deli Thai Chilli&Lime 150g        2      2.70       150
## 533          Pringles Sthrn FriedChicken 134g        1      3.70       134
## 534                      RRD Pc Sea Salt 165g        1      3.00       165
## 535    WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 536      Smiths Thinly Cut Roast Chicken 175g        1      3.00       175
## 537             Pringles Mystery Flavour 134g        1      3.70       134
## 538          Doritos Corn Chips Original 170g        1      4.40       170
## 539             Pringles Mystery Flavour 134g        1      3.70       134
## 540           Natural Chip Compny SeaSalt175g        1      3.00       175
## 541  Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        1      3.80       110
## 542        Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 543                   RRD Salt & Vinegar 165g        1      3.00       165
## 544                        Kettle Chilli 175g        2      5.40       175
## 545              Kettle 135g Swt Pot Sea Salt        1      4.20       135
## 546            French Fries Potato Chips 175g        1      3.00       175
## 547          Thins Chips Seasonedchicken 175g        1      3.30       175
## 548  Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        1      3.80       110
## 549           Thins Chips Salt & Vinegar 175g        1      3.30       175
## 550          Smith Crinkle Cut Bolognese 150g        1      2.60       150
## 551            Thins Chips Originl saltd 175g        1      3.30       175
## 552          Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 553              Woolworths Cheese Rings 190g        1      1.80       190
## 554    Smiths Crinkle Cut Chips Barbecue 170g        1      2.90       170
## 555     Smiths Chip Thinly S/Cream&Onion 175g        1      3.00       175
## 556             Pringles SourCream Onion 134g        1      3.70       134
## 557    Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 558               WW Crinkle Cut Chicken 175g        1      1.70       175
## 559      Kettle Tortilla ChpsFeta&Garlic 150g        1      4.60       150
## 560             Kettle Honey Soy Chicken 175g        1      5.40       175
## 561        Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 562             Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 563          Pringles Sthrn FriedChicken 134g        1      3.70       134
## 564              Tostitos Lightly Salted 175g        1      4.40       175
## 565              Pringles Sweet&Spcy BBQ 134g        1      3.70       134
## 566    Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 567        Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 568     GrnWves Plus Btroot & Chilli Jam 180g        1      3.10       180
## 569                      Cheezels Cheese 330g        1      5.70       330
## 570              Dorito Corn Chp Supreme 380g        1      6.50       380
## 571  Infuzions Thai SweetChili PotatoMix 110g        1      3.80       110
## 572     Sunbites Whlegrn Crisps Frch/Onin 90g        1      1.70        90
## 573                    Pringles Barbeque 134g        1      3.70       134
## 574             Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 575            Cheetos Chs & Bacon Balls 190g        1      3.30       190
## 576       Red Rock Deli Thai Chilli&Lime 150g        1      2.70       150
## 577   Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 578            WW Original Stacked Chips 160g        1      1.90       160
## 579          Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 580              Woolworths Cheese Rings 190g        1      1.80       190
## 581        Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 582             Pringles SourCream Onion 134g        1      3.70       134
## 583       Thins Potato Chips Hot & Spicy 175g        1      3.30       175
## 584                    RRD Lime & Pepper 165g        1      3.00       165
## 585   Smiths Crinkle Cut French OnionDip 150g        1      2.60       150
## 586                    RRD Lime & Pepper 165g        1      3.00       165
## 587         WW Supreme Cheese Corn Chips 200g        1      1.90       200
## 588      Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 589       NCC Sour Cream & Garden Chives 175g        1      3.00       175
## 590        RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 591      Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 592        Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 593                     Doritos Mexicana 170g        2      8.80       170
## 594       Infuzions Mango Chutny Papadums 70g        1      2.40        70
## 595  Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 596     Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 597        Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 598              Pringles Sweet&Spcy BBQ 134g        1      3.70       134
## 599     Cobs Popd Sour Crm &Chives Chips 110g        1      3.80       110
## 600          Pringles Chicken Salt Crips 134g        1      3.70       134
## 601  Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 602              Dorito Corn Chp Supreme 380g        1      6.50       380
## 603    WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 604                  Cheezels Cheese Box 125g        1      2.10       125
## 605      Smiths Chip Thinly Cut Original 175g        1      3.00       175
## 606    WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 607       Kettle Sensations Siracha Lime 150g        1      4.60       150
## 608                        Kettle Chilli 175g        2     10.80       175
## 609              Pringles Sweet&Spcy BBQ 134g        1      3.70       134
## 610              Smiths Crinkle Original 330g        1      5.70       330
## 611               Twisties Cheese Burger 250g        1      4.30       250
## 612             Grain Waves Sweet Chilli 210g        1      3.60       210
## 613   Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 614            WW Original Stacked Chips 160g        1      1.90       160
## 615    Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 616          Thins Chips Seasonedchicken 175g        1      3.30       175
## 617     Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 618                RRD Honey Soy Chicken 165g        1      3.00       165
## 619             Grain Waves Sweet Chilli 210g        1      3.60       210
## 620     Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 621    Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 622    Smiths Crinkle Cut Chips Original 170g        2      5.80       170
## 623                      Kettle Original 175g        1      5.40       175
## 624                RRD Honey Soy Chicken 165g        1      3.00       165
## 625    WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 626              Pringles Sweet&Spcy BBQ 134g        1      3.70       134
## 627   Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 628          Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 629   Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 630             Tostitos Smoked Chipotle 175g        1      4.40       175
## 631                   RRD Salt & Vinegar 165g        1      3.00       165
## 632       Red Rock Deli Thai Chilli&Lime 150g        1      2.70       150
## 633   Doritos Corn Chip Southern Chicken 150g        1      3.90       150
## 634       NCC Sour Cream & Garden Chives 175g        1      3.00       175
## 635          Doritos Corn Chips Original 170g        1      4.40       170
## 636               Twisties Cheese Burger 250g        1      4.30       250
## 637   Doritos Corn Chip Southern Chicken 150g        1      3.90       150
## 638    Smiths Crinkle Cut Chips Original 170g        1      2.90       170
## 639                     CCs Nacho Cheese 175g        1      2.10       175
## 640             Grain Waves Sweet Chilli 210g        1      3.60       210
## 641      Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 642                  RRD Chilli& Coconut 150g        1      2.70       150
## 643                         CCs Original 175g        1      2.10       175
## 644              Woolworths Cheese Rings 190g        1      1.80       190
## 645              Kettle 135g Swt Pot Sea Salt        1      4.20       135
## 646                      Twisties Chicken270g        1      4.60       270
## 647                         Burger Rings 220g        1      2.30       220
## 648              Tostitos Splash Of Lime 175g        2      8.80       175
## 649    Smiths Crinkle Cut Chips Barbecue 170g        1      2.90       170
## 650    Smiths Crinkle Cut Salt & Vinegar 170g        1      2.90       170
## 651             WW D/Style Chip Sea Salt 200g        1      1.90       200
## 652             Grain Waves Sweet Chilli 210g        1      3.60       210
## 653          Pringles Chicken Salt Crips 134g        1      3.70       134
## 654  Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        1      3.80       110
## 655    Infzns Crn Crnchers Tangy Gcamole 110g        1      3.80       110
## 656             Pringles Original Crisps 134g        1      3.70       134
## 657   Doritos Corn Chip Mexican Jalapeno 150g        1      3.90       150
## 658              Woolworths Cheese Rings 190g        1      1.80       190
## 659             Tostitos Smoked Chipotle 175g        2      8.80       175
## 660           Natural Chip Compny SeaSalt175g        1      3.00       175
## 661        Smiths Crinkle Cut Snag&Sauce 150g        2      5.20       150
## 662     Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 663                   RRD Salt & Vinegar 165g        1      3.00       165
## 664   Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 665                         CCs Original 175g        1      2.10       175
## 666        Smiths Thinly Swt Chli&S/Cream175G        1      3.00       175
## 667              Smiths Crinkle Original 330g        1      5.70       330
## 668   Doritos Corn Chip Southern Chicken 150g        1      3.90       150
## 669               WW Original Corn Chips 200g        1      1.90       200
## 670              Tostitos Lightly Salted 175g        1      4.40       175
## 671        Smiths Crinkle Cut Snag&Sauce 150g        1      2.60       150
## 672             Thins Chips Light& Tangy 175g        1      3.30       175
## 673     Cobs Popd Sour Crm &Chives Chips 110g        1      3.80       110
## 674                      RRD Pc Sea Salt 165g        1      3.00       165
## 675           Thins Chips Salt & Vinegar 175g        1      3.30       175
## 676                      Twisties Chicken270g        1      4.60       270
## 677            Cheetos Chs & Bacon Balls 190g        1      3.30       190
## 678             Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 679               Twisties Cheese Burger 250g        1      4.30       250
## 680                         Burger Rings 220g        1      2.30       220
## 681        Smiths Crinkle Cut Snag&Sauce 150g        1      2.60       150
## 682                      Kettle Original 175g        2      5.40       175
## 683             Pringles Mystery Flavour 134g        1      3.70       134
## 684  Kettle Tortilla ChpsHny&Jlpno Chili 150g        1      4.60       150
## 685                        Cheetos Puffs 165g        1      2.80       165
## 686            French Fries Potato Chips 175g        1      3.00       175
## 687            French Fries Potato Chips 175g        1      3.00       175
## 688  Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 689            French Fries Potato Chips 175g        1      3.00       175
## 690      Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 691          Smith Crinkle Cut Bolognese 150g        1      2.60       150
## 692         WW Supreme Cheese Corn Chips 200g        1      1.90       200
## 693          Doritos Corn Chips Original 170g        1      4.40       170
## 694       Infuzions Mango Chutny Papadums 70g        1      2.40        70
## 695     Smiths Chip Thinly S/Cream&Onion 175g        1      3.00       175
## 696             Kettle Honey Soy Chicken 175g        1      5.40       175
## 697               WW Original Corn Chips 200g        1      1.90       200
## 698             Grain Waves Sweet Chilli 210g        1      3.60       210
## 699                   RRD Salt & Vinegar 165g        1      3.00       165
## 700                      Twisties Chicken270g        2      9.20       270
## 701                    RRD Lime & Pepper 165g        1      3.00       165
## 702    Smiths Crinkle Cut Chips Chs&Onion170g        1      2.90       170
## 703       Red Rock Deli Thai Chilli&Lime 150g        1      2.70       150
## 704      Smiths Chip Thinly Cut Original 175g        1      3.00       175
## 705   Doritos Corn Chip Mexican Jalapeno 150g        1      3.90       150
## 706    Infzns Crn Crnchers Tangy Gcamole 110g        1      3.80       110
## 707       Smith Crinkle Cut Mac N Cheese 150g        1      2.60       150
## 708     Smiths Crinkle Cut Chips Chicken 170g        1      2.90       170
## 709                     CCs Tasty Cheese 175g        1      2.10       175
## 710        Smiths Thinly Swt Chli&S/Cream175G        1      3.00       175
## 711               WW Original Corn Chips 200g        1      1.90       200
## 712     Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 713                      Twisties Chicken270g        1      4.60       270
## 714           Thins Chips Salt & Vinegar 175g        1      3.30       175
## 715    Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 716   Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 717        Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 718               Doritos Cheese Supreme 330g        1      5.70       330
## 719          Kettle Sea Salt And Vinegar 175g        1      5.40       175
## 720    WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 721     Sunbites Whlegrn Crisps Frch/Onin 90g        1      1.70        90
## 722                  Pringles Slt Vingar 134g        1      3.70       134
## 723                     CCs Nacho Cheese 175g        1      2.10       175
## 724       NCC Sour Cream & Garden Chives 175g        1      3.00       175
## 725     Sunbites Whlegrn Crisps Frch/Onin 90g        1      1.70        90
## 726     Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 727             Pringles Original Crisps 134g        1      3.70       134
## 728  Infuzions SourCream&Herbs Veg Strws 110g        1      3.80       110
## 729       Smith Crinkle Cut Mac N Cheese 150g        1      2.60       150
## 730               WW Original Corn Chips 200g        1      1.90       200
## 731        RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 732       Thins Potato Chips Hot & Spicy 175g        1      3.30       175
## 733            Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 734              WW Crinkle Cut Original 175g        1      1.70       175
## 735       Red Rock Deli Thai Chilli&Lime 150g        1      2.70       150
## 736        Smiths Crinkle Cut Snag&Sauce 150g        1      2.60       150
## 737    Smiths Crinkle Cut Chips Barbecue 170g        1      2.90       170
## 738              Pringles Sweet&Spcy BBQ 134g        1      3.70       134
## 739       Kettle Sensations Siracha Lime 150g        1      4.60       150
## 740          Smith Crinkle Cut Bolognese 150g        1      2.60       150
## 741     GrnWves Plus Btroot & Chilli Jam 180g        1      3.10       180
## 742  Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 743           Natural Chip Compny SeaSalt175g        1      3.00       175
## 744             Pringles SourCream Onion 134g        1      3.70       134
## 745      Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 746   Doritos Corn Chip Southern Chicken 150g        1      3.90       150
## 747  Infuzions SourCream&Herbs Veg Strws 110g        1      3.80       110
## 748   Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 749       Smith Crinkle Cut Mac N Cheese 150g        1      2.60       150
## 750                         Burger Rings 220g        1      2.30       220
## 751      Kettle Tortilla ChpsFeta&Garlic 150g        1      4.60       150
## 752                         Burger Rings 220g        1      2.30       220
## 753       NCC Sour Cream & Garden Chives 175g        1      3.00       175
## 754                      Cheezels Cheese 330g        1      5.70       330
## 755      Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 756     Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 757                        Cheetos Puffs 165g        1      2.80       165
## 758          Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 759   Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 760             Tostitos Smoked Chipotle 175g        1      4.40       175
## 761                         Burger Rings 220g        2      4.60       220
## 762        Smiths Crinkle Cut Snag&Sauce 150g        1      2.60       150
## 763       Natural Chip Co Tmato Hrb&Spce 175g        1      3.00       175
## 764        Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 765                         Burger Rings 220g        1      2.30       220
## 766  Infuzions Thai SweetChili PotatoMix 110g        1      3.80       110
## 767     Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 768      Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 769    Smiths Crinkle Cut Salt & Vinegar 170g        1      2.90       170
## 770       Thins Potato Chips Hot & Spicy 175g        1      3.30       175
## 771    Smiths Crinkle Cut Chips Barbecue 170g        1      2.90       170
## 772    WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 773                    RRD Lime & Pepper 165g        1      3.00       165
## 774    Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 775        Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 776             Tostitos Smoked Chipotle 175g        1      4.40       175
## 777               WW Crinkle Cut Chicken 175g        1      1.70       175
## 778     Red Rock Deli Chikn&Garlic Aioli 150g        1      2.70       150
## 779                      Kettle Original 175g        1      5.40       175
## 780          Pringles Sthrn FriedChicken 134g        1      3.70       134
## 781    Infzns Crn Crnchers Tangy Gcamole 110g        1      3.80       110
## 782    WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 783           Natural Chip Compny SeaSalt175g        1      3.00       175
## 784         WW Supreme Cheese Corn Chips 200g        1      1.90       200
## 785     Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 786        Smiths Crinkle Cut Snag&Sauce 150g        1      2.60       150
## 787              Dorito Corn Chp Supreme 380g        1      6.50       380
## 788    Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 789      Snbts Whlgrn Crisps Cheddr&Mstrd 90g        1      1.70        90
## 790             Grain Waves Sweet Chilli 210g        1      3.60       210
## 791        Smiths Crinkle Cut Snag&Sauce 150g        1      2.60       150
## 792   Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 793     Cobs Popd Sour Crm &Chives Chips 110g        1      3.80       110
## 794              Tostitos Splash Of Lime 175g        1      4.40       175
## 795       Natural Chip Co Tmato Hrb&Spce 175g        1      3.00       175
## 796               WW Original Corn Chips 200g        1      1.90       200
## 797     Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 798  Kettle Tortilla ChpsHny&Jlpno Chili 150g        1      4.60       150
## 799   Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 800                     CCs Nacho Cheese 175g        2      4.20       175
## 801                     CCs Nacho Cheese 175g        1      2.10       175
## 802                     CCs Nacho Cheese 175g        1      2.10       175
## 803                     CCs Nacho Cheese 175g        1      2.10       175
## 804     GrnWves Plus Btroot & Chilli Jam 180g        1      3.10       180
## 805      Smiths Thinly Cut Roast Chicken 175g        1      3.00       175
## 806        Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 807          Pringles Chicken Salt Crips 134g        1      3.70       134
## 808     Smiths Chip Thinly S/Cream&Onion 175g        1      3.00       175
## 809                      Cheezels Cheese 330g        1      5.70       330
## 810              Kettle 135g Swt Pot Sea Salt        1      4.20       135
## 811              Tostitos Lightly Salted 175g        1      4.40       175
## 812    Smiths Crinkle Cut Chips Chs&Onion170g        1      2.90       170
## 813       Red Rock Deli Thai Chilli&Lime 150g        1      2.70       150
## 814            Cheetos Chs & Bacon Balls 190g        1      3.30       190
## 815    Smiths Crinkle Cut Chips Original 170g        1      2.90       170
## 816     Sunbites Whlegrn Crisps Frch/Onin 90g        1      1.70        90
## 817  Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 818      Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 819          Thins Chips Seasonedchicken 175g        1      3.30       175
## 820       Kettle Sensations Siracha Lime 150g        1      4.60       150
## 821          Pringles Chicken Salt Crips 134g        1      3.70       134
## 822                      Kettle Original 175g        1      5.40       175
## 823              Tostitos Splash Of Lime 175g        1      4.40       175
## 824               Doritos Cheese Supreme 330g        1      5.70       330
## 825            French Fries Potato Chips 175g        1      3.00       175
## 826                     Doritos Mexicana 170g        1      4.40       170
## 827       Natural Chip Co Tmato Hrb&Spce 175g        1      3.00       175
## 828             WW D/Style Chip Sea Salt 200g        1      1.90       200
## 829      Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 830       Smith Crinkle Cut Mac N Cheese 150g        1      2.60       150
## 831               WW Crinkle Cut Chicken 175g        1      1.70       175
## 832       Smith Crinkle Cut Mac N Cheese 150g        1      2.60       150
## 833     Cobs Popd Sour Crm &Chives Chips 110g        1      3.80       110
## 834            French Fries Potato Chips 175g        1      3.00       175
## 835  Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 836         WW Supreme Cheese Corn Chips 200g        1      1.90       200
## 837           Natural Chip Compny SeaSalt175g        1      3.00       175
## 838  Kettle Tortilla ChpsHny&Jlpno Chili 150g        1      4.60       150
## 839           Thins Chips Salt & Vinegar 175g        1      3.30       175
## 840             Pringles Original Crisps 134g        2      3.70       134
## 841            French Fries Potato Chips 175g        1      3.00       175
## 842              Kettle 135g Swt Pot Sea Salt        1      4.20       135
## 843          Thins Chips Seasonedchicken 175g        1      3.30       175
## 844               WW Original Corn Chips 200g        1      1.90       200
## 845               Twisties Cheese Burger 250g        1      4.30       250
## 846      Snbts Whlgrn Crisps Cheddr&Mstrd 90g        1      1.70        90
## 847             Kettle Honey Soy Chicken 175g        1      5.40       175
## 848              Tostitos Lightly Salted 175g        2      8.80       175
## 849              Smiths Crinkle Original 330g        1      5.70       330
## 850        Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 851                     Doritos Mexicana 170g        2      8.80       170
## 852    Smiths Crinkle Cut Chips Chs&Onion170g        1      2.90       170
## 853                      Twisties Cheese 270g        1      4.60       270
## 854               Doritos Cheese Supreme 330g        1      5.70       330
## 855                        Cheetos Puffs 165g        1      2.80       165
## 856   Doritos Corn Chip Mexican Jalapeno 150g        1      3.90       150
## 857              WW Crinkle Cut Original 175g        1      1.70       175
## 858   Doritos Corn Chip Mexican Jalapeno 150g        1      3.90       150
## 859      Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 860       Natural Chip Co Tmato Hrb&Spce 175g        1      3.00       175
## 861         Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 862    Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 863                      RRD Pc Sea Salt 165g        1      3.00       165
## 864       Thins Potato Chips Hot & Spicy 175g        1      3.30       175
## 865       Smith Crinkle Cut Mac N Cheese 150g        1      2.60       150
## 866          Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 867     Cobs Popd Sour Crm &Chives Chips 110g        1      3.80       110
## 868    Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 869                      Twisties Chicken270g        2      9.20       270
## 870                    Pringles Barbeque 134g        1      3.70       134
## 871            WW Original Stacked Chips 160g        2      3.80       160
## 872              WW Crinkle Cut Original 175g        1      1.70       175
## 873    Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 874            WW Original Stacked Chips 160g        1      1.90       160
## 875   Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 876                     CCs Tasty Cheese 175g        1      2.10       175
## 877    Smiths Crinkle Cut Chips Barbecue 170g        1      2.90       170
## 878    Smiths Crinkle Cut Chips Chs&Onion170g        1      2.90       170
## 879                         CCs Original 175g        1      2.10       175
## 880       Tyrrells Crisps Lightly Salted 165g        1      4.20       165
## 881          Smith Crinkle Cut Bolognese 150g        1      2.60       150
## 882     Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 883              Tostitos Splash Of Lime 175g        1      4.40       175
## 884   Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 885     Smiths Chip Thinly S/Cream&Onion 175g        5     15.00       175
## 886       Thins Potato Chips Hot & Spicy 175g        1      3.30       175
## 887      Snbts Whlgrn Crisps Cheddr&Mstrd 90g        1      1.70        90
## 888          Thins Chips Seasonedchicken 175g        2      6.60       175
## 889            Thins Chips Originl saltd 175g        1      3.30       175
## 890                     CCs Tasty Cheese 175g        1      2.10       175
## 891              Smiths Crinkle Original 330g        1      5.70       330
## 892     Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 893                        Kettle Chilli 175g        1      5.40       175
## 894  Infuzions Thai SweetChili PotatoMix 110g        1      3.80       110
## 895          Thins Chips Seasonedchicken 175g        1      3.30       175
## 896      Red Rock Deli Sp Salt & Truffle 150G        1      2.70       150
## 897             Pringles SourCream Onion 134g        1      3.70       134
## 898  Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 899  Infuzions Thai SweetChili PotatoMix 110g        1      3.80       110
## 900                      Twisties Cheese 270g        1      4.60       270
## 901                    RRD Lime & Pepper 165g        2      6.00       165
## 902             Thins Chips Light& Tangy 175g        1      3.30       175
## 903    Smiths Crinkle Cut Chips Barbecue 170g        1      2.90       170
## 904          Pringles Chicken Salt Crips 134g        1      3.70       134
## 905                  Cheezels Cheese Box 125g        1      2.10       125
## 906        Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 907            Cheetos Chs & Bacon Balls 190g        1      3.30       190
## 908        Smiths Thinly Swt Chli&S/Cream175G        1      3.00       175
## 909     Smiths Chip Thinly S/Cream&Onion 175g        1      3.00       175
## 910   Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 911      Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 912   Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 913             Pringles SourCream Onion 134g        1      3.70       134
## 914              Dorito Corn Chp Supreme 380g        1      6.50       380
## 915              Pringles Sweet&Spcy BBQ 134g        1      3.70       134
## 916       Thins Potato Chips Hot & Spicy 175g        1      3.30       175
## 917          Pringles Chicken Salt Crips 134g        1      3.70       134
## 918               WW Original Corn Chips 200g        1      1.90       200
## 919            WW Original Stacked Chips 160g        1      1.90       160
## 920       Infuzions Mango Chutny Papadums 70g        1      2.40        70
## 921            WW Original Stacked Chips 160g        1      1.90       160
## 922          Pringles Chicken Salt Crips 134g        2      7.40       134
## 923       Infuzions Mango Chutny Papadums 70g        1      2.40        70
## 924                   RRD Salt & Vinegar 165g        1      3.00       165
## 925          Pringles Sthrn FriedChicken 134g        1      3.70       134
## 926         Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 927                      Twisties Chicken270g        1      4.60       270
## 928                   RRD Salt & Vinegar 165g        1      3.00       165
## 929            Thins Chips Originl saltd 175g        2      6.60       175
## 930     Smiths Crinkle Cut Chips Chicken 170g        1      2.90       170
## 931     Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 932       Smith Crinkle Cut Mac N Cheese 150g        1      2.60       150
## 933    Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 934    Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 935    Smiths Crinkle Cut Chips Barbecue 170g        1      2.90       170
## 936                    RRD Lime & Pepper 165g        1      3.00       165
## 937   Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 938      Snbts Whlgrn Crisps Cheddr&Mstrd 90g        1      1.70        90
## 939             Pringles SourCream Onion 134g        1      3.70       134
## 940              Tostitos Splash Of Lime 175g        1      4.40       175
## 941     Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 942  Kettle Tortilla ChpsHny&Jlpno Chili 150g        3     13.80       150
## 943                        Kettle Chilli 175g        1      5.40       175
## 944              WW Crinkle Cut Original 175g        1      1.70       175
## 945                      Cheezels Cheese 330g        2     11.40       330
## 946  Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        1      3.80       110
## 947               Doritos Cheese Supreme 330g        1      5.70       330
## 948          Thins Chips Seasonedchicken 175g        1      3.30       175
## 949                     CCs Nacho Cheese 175g        1      2.10       175
## 950   Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 951             Thins Chips Light& Tangy 175g        2      6.60       175
## 952          Doritos Corn Chips Original 170g        1      4.40       170
## 953     Red Rock Deli Chikn&Garlic Aioli 150g        1      2.70       150
## 954                      Twisties Chicken270g        1      4.60       270
## 955          Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 956          Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 957            WW Original Stacked Chips 160g        2      3.80       160
## 958  Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 959       NCC Sour Cream & Garden Chives 175g        1      3.00       175
## 960         WW Supreme Cheese Corn Chips 200g        1      1.90       200
## 961          Pringles Sthrn FriedChicken 134g        1      3.70       134
## 962          Pringles Chicken Salt Crips 134g        1      3.70       134
## 963         Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 964             Pringles SourCream Onion 134g        1      3.70       134
## 965             Kettle Honey Soy Chicken 175g        1      5.40       175
## 966      Red Rock Deli Sp Salt & Truffle 150G        1      2.70       150
## 967                RRD Honey Soy Chicken 165g        1      3.00       165
## 968               WW Original Corn Chips 200g        1      1.90       200
## 969                      Cheezels Cheese 330g        1      5.70       330
## 970     Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 971              Tostitos Splash Of Lime 175g        1      4.40       175
## 972                  Pringles Slt Vingar 134g        1      3.70       134
## 973        Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 974      Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 975     Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 976      Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 977             Kettle Honey Soy Chicken 175g        1      5.40       175
## 978       Smith Crinkle Cut Mac N Cheese 150g        1      2.60       150
## 979             Grain Waves Sweet Chilli 210g        1      3.60       210
## 980       Tyrrells Crisps Lightly Salted 165g        1      4.20       165
## 981              Pringles Sweet&Spcy BBQ 134g        1      3.70       134
## 982           RRD SR Slow Rst Pork Belly 150g        1      2.70       150
## 983                     Doritos Mexicana 170g        1      4.40       170
## 984      Kettle Tortilla ChpsFeta&Garlic 150g        2      4.60       150
## 985   Doritos Corn Chip Mexican Jalapeno 150g        1      3.90       150
## 986      Kettle Tortilla ChpsFeta&Garlic 150g        1      4.60       150
## 987               Doritos Cheese Supreme 330g        1      5.70       330
## 988                  RRD Chilli& Coconut 150g        1      2.70       150
## 989               WW Crinkle Cut Chicken 175g        1      1.70       175
## 990         Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 991                        Cheetos Puffs 165g        1      2.80       165
## 992  Infuzions Thai SweetChili PotatoMix 110g        1      3.80       110
## 993       Tyrrells Crisps Lightly Salted 165g        1      4.20       165
## 994                        Kettle Chilli 175g        1      5.40       175
## 995             Kettle Honey Soy Chicken 175g        1      5.40       175
## 996   Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 997           RRD SR Slow Rst Pork Belly 150g        2      2.70       150
## 998           RRD SR Slow Rst Pork Belly 150g        1      2.70       150
## 999      Snbts Whlgrn Crisps Cheddr&Mstrd 90g        1      1.70        90
## 1000     Red Rock Deli Sp Salt & Truffle 150G        1      2.70       150
## 1001 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1002              Doritos Cheese Supreme 330g        2     11.40       330
## 1003  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 1004    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1005     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1006 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 1007                     Twisties Cheese 270g        2      9.20       270
## 1008                 Pringles Slt Vingar 134g        2      7.40       134
## 1009 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        1      3.80       110
## 1010       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1011   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1012                     Twisties Cheese 270g        2      9.20       270
## 1013                 Pringles Slt Vingar 134g        2      7.40       134
## 1014         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1015            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 1016                 Pringles Slt Vingar 134g        2      7.40       134
## 1017             Smiths Crinkle Original 330g        2     11.40       330
## 1018            Pringles Original Crisps 134g        2      7.40       134
## 1019                    Doritos Mexicana 170g        2      8.80       170
## 1020         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1021             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1022                     Twisties Cheese 270g        1      4.60       270
## 1023       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1024            Pringles SourCream Onion 134g        2      7.40       134
## 1025            Pringles SourCream Onion 134g        2      7.40       134
## 1026  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 1027          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1028                     Twisties Chicken270g        2      9.20       270
## 1029                     Cheezels Cheese 330g        2     11.40       330
## 1030                     Cheezels Cheese 330g        2     11.40       330
## 1031 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1032     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1033            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1034                     Twisties Cheese 270g        2      9.20       270
## 1035     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1036 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1037     Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 1038 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1039 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1040             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 1041            Thins Chips Light& Tangy 175g        1      3.30       175
## 1042             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 1043 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1044                     Cheezels Cheese 330g        2     11.40       330
## 1045       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1046                 Pringles Slt Vingar 134g        2      7.40       134
## 1047            Pringles Mystery Flavour 134g        2      7.40       134
## 1048                     Twisties Cheese 270g        1      4.60       270
## 1049   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 1050                     Cheezels Cheese 330g        2     11.40       330
## 1051                    Doritos Mexicana 170g        2      8.80       170
## 1052            Pringles SourCream Onion 134g        2      7.40       134
## 1053                     Twisties Cheese 270g        2      9.20       270
## 1054            Pringles SourCream Onion 134g        2      7.40       134
## 1055             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1056     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1057          Thins Chips Salt & Vinegar 175g        5      6.60       175
## 1058             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1059       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1060       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1061     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1062  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 1063                     Twisties Cheese 270g        2      9.20       270
## 1064         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1065             Tostitos Splash Of Lime 175g        2      8.80       175
## 1066             Tostitos Lightly Salted 175g        2      8.80       175
## 1067              Doritos Cheese Supreme 330g        2     11.40       330
## 1068    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1069         Thins Chips Seasonedchicken 175g        2      6.60       175
## 1070      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 1071 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1072         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 1073      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 1074      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 1075         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 1076            Tostitos Smoked Chipotle 175g        2      8.80       175
## 1077             Tostitos Splash Of Lime 175g        2      8.80       175
## 1078             Smiths Crinkle Original 330g        2     11.40       330
## 1079  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 1080  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1081             Tostitos Splash Of Lime 175g        2      8.80       175
## 1082          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1083            Thins Chips Light& Tangy 175g        1      3.30       175
## 1084     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1085            Kettle Honey Soy Chicken 175g        2     10.80       175
## 1086 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 1087              Twisties Cheese Burger 250g        2      8.60       250
## 1088          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1089            Kettle Honey Soy Chicken 175g        2     10.80       175
## 1090            Pringles Original Crisps 134g        1      3.70       134
## 1091         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1092                   Pringles Barbeque 134g        2      7.40       134
## 1093 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 1094         Pringles Sthrn FriedChicken 134g        5      7.40       134
## 1095     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1096      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 1097              Twisties Cheese Burger 250g        2      8.60       250
## 1098            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1099  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 1100                 Pringles Slt Vingar 134g        2      7.40       134
## 1101                     Twisties Cheese 270g        2      9.20       270
## 1102                    Doritos Mexicana 170g        2      8.80       170
## 1103                     Twisties Chicken270g        2      9.20       270
## 1104                     Twisties Chicken270g        2      9.20       270
## 1105            Tostitos Smoked Chipotle 175g        2      8.80       175
## 1106            Thins Chips Light& Tangy 175g        2      6.60       175
## 1107       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1108                 Pringles Slt Vingar 134g        2      7.40       134
## 1109            Thins Chips Light& Tangy 175g        2      6.60       175
## 1110            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 1111    Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 1112            Thins Chips Light& Tangy 175g        2      6.60       175
## 1113             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1114             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1115          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1116     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1117     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 1118             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1119 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1120         Pringles Chicken Salt Crips 134g        1      3.70       134
## 1121          Thins Chips Salt & Vinegar 175g        1      3.30       175
## 1122                     Kettle Original 175g        2     10.80       175
## 1123  Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 1124          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1125       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1126             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1127              Twisties Cheese Burger 250g        2      8.60       250
## 1128  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 1129         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1130             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1131             Kettle 135g Swt Pot Sea Salt        1      4.20       135
## 1132                     Twisties Cheese 270g        2      9.20       270
## 1133                     Twisties Cheese 270g        2      9.20       270
## 1134 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1135                     Twisties Cheese 270g        2      9.20       270
## 1136      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 1137                     Twisties Chicken270g        2      9.20       270
## 1138    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1139         Thins Chips Seasonedchicken 175g        2      6.60       175
## 1140  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1141            Thins Chips Light& Tangy 175g        2      6.60       175
## 1142                       Kettle Chilli 175g        2     10.80       175
## 1143                     Kettle Original 175g        2     10.80       175
## 1144                     Twisties Chicken270g        2      9.20       270
## 1145                     Twisties Chicken270g        2      9.20       270
## 1146   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 1147             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 1148             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 1149                     Kettle Original 175g        2     10.80       175
## 1150              Twisties Cheese Burger 250g        1      4.30       250
## 1151                     Kettle Original 175g        2     10.80       175
## 1152             Smiths Crinkle Original 330g        2     11.40       330
## 1153                       Kettle Chilli 175g        1      5.40       175
## 1154                       Kettle Chilli 175g        2     10.80       175
## 1155              Twisties Cheese Burger 250g        2      8.60       250
## 1156            Kettle Honey Soy Chicken 175g        2     10.80       175
## 1157         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 1158            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1159     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1160    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1161   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1162   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 1163                    Doritos Mexicana 170g        2      8.80       170
## 1164 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1165             Smiths Crinkle Original 330g        2     11.40       330
## 1166     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1167             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1168    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1169         Doritos Corn Chips Original 170g        2      8.80       170
## 1170     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1171                     Cheezels Cheese 330g        2     11.40       330
## 1172   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 1173            Pringles SourCream Onion 134g        1      3.70       134
## 1174                     Twisties Cheese 270g        1      4.60       270
## 1175                    Doritos Mexicana 170g        2      8.80       170
## 1176  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1177 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 1178  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 1179                   Pringles Barbeque 134g        2      7.40       134
## 1180     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1181            Pringles Original Crisps 134g        2      7.40       134
## 1182         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1183            Thins Chips Light& Tangy 175g        2      6.60       175
## 1184     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 1185              Twisties Cheese Burger 250g        2      8.60       250
## 1186     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1187   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1188              Twisties Cheese Burger 250g        1      4.30       250
## 1189 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1190                       Kettle Chilli 175g        2     10.80       175
## 1191  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1192         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1193            Pringles Mystery Flavour 134g        2      7.40       134
## 1194  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1195       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1196    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1197   Doritos Corn Chips Cheese Supreme 170g        4      8.80       170
## 1198  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 1199      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 1200      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 1201                     Twisties Cheese 270g        2      9.20       270
## 1202              Doritos Cheese Supreme 330g        2     11.40       330
## 1203            Pringles Original Crisps 134g        2      7.40       134
## 1204             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1205                     Twisties Chicken270g        2      9.20       270
## 1206 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1207            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 1208    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1209            Pringles SourCream Onion 134g        1      3.70       134
## 1210   Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 1211 Kettle Tortilla ChpsHny&Jlpno Chili 150g        1      4.60       150
## 1212     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1213  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 1214             Tostitos Lightly Salted 175g        2      8.80       175
## 1215     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1216    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 1217  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1218             Tostitos Lightly Salted 175g        2      8.80       175
## 1219   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 1220            Pringles Original Crisps 134g        2      7.40       134
## 1221  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 1222             Tostitos Splash Of Lime 175g        2      8.80       175
## 1223 Kettle Tortilla ChpsHny&Jlpno Chili 150g        1      4.60       150
## 1224                    Doritos Mexicana 170g        2      8.80       170
## 1225      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 1226                       Kettle Chilli 175g        2     10.80       175
## 1227     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1228       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1229             Tostitos Lightly Salted 175g        2      8.80       175
## 1230                 Pringles Slt Vingar 134g        2      7.40       134
## 1231   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 1232             Smiths Crinkle Original 330g        2     11.40       330
## 1233 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1234             Smiths Crinkle Original 330g        2     11.40       330
## 1235            Tostitos Smoked Chipotle 175g        2      8.80       175
## 1236         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1237       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1238                     Twisties Cheese 270g        2      9.20       270
## 1239 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 1240         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 1241             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 1242             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 1243   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 1244  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1245   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1246   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 1247     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1248             Tostitos Lightly Salted 175g        2      8.80       175
## 1249   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1250 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1251                   Pringles Barbeque 134g        2      7.40       134
## 1252         Doritos Corn Chips Original 170g        2      8.80       170
## 1253   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1254  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 1255            Tostitos Smoked Chipotle 175g        2      8.80       175
## 1256         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1257         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1258             Tostitos Splash Of Lime 175g        2      8.80       175
## 1259                     Kettle Original 175g        2     10.80       175
## 1260            Pringles Original Crisps 134g        2      7.40       134
## 1261  Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 1262    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1263         Doritos Corn Chips Original 170g        2      8.80       170
## 1264   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1265            Pringles Mystery Flavour 134g        2      7.40       134
## 1266            Grain Waves Sweet Chilli 210g        5      7.20       210
## 1267            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1268  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 1269                     Kettle Original 175g        2     10.80       175
## 1270             Tostitos Splash Of Lime 175g        2      8.80       175
## 1271     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1272                     Twisties Cheese 270g        2      9.20       270
## 1273            Kettle Honey Soy Chicken 175g        2     10.80       175
## 1274            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1275                     Twisties Cheese 270g        2      9.20       270
## 1276         Thins Chips Seasonedchicken 175g        2      6.60       175
## 1277                 Pringles Slt Vingar 134g        2      7.40       134
## 1278         Doritos Corn Chips Original 170g        2      8.80       170
## 1279                       Kettle Chilli 175g        2     10.80       175
## 1280      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 1281                    Doritos Mexicana 170g        2      8.80       170
## 1282                       Kettle Chilli 175g        2     10.80       175
## 1283    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1284  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1285      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 1286 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 1287     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 1288            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1289   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 1290                     Cheezels Cheese 330g        2     11.40       330
## 1291            Tostitos Smoked Chipotle 175g        2      8.80       175
## 1292 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1293         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 1294                     Twisties Chicken270g        1      4.60       270
## 1295            Tostitos Smoked Chipotle 175g        2      8.80       175
## 1296   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 1297 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 1298            Thins Chips Light& Tangy 175g        2      6.60       175
## 1299             Tostitos Splash Of Lime 175g        1      4.40       175
## 1300    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1301         Thins Chips Seasonedchicken 175g        2      6.60       175
## 1302                     Kettle Original 175g        2     10.80       175
## 1303   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 1304            Thins Chips Light& Tangy 175g        2      6.60       175
## 1305            Pringles Original Crisps 134g        2      7.40       134
## 1306   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 1307       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1308         Doritos Corn Chips Original 170g        2      8.80       170
## 1309              Twisties Cheese Burger 250g        2      8.60       250
## 1310 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 1311            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 1312             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1313      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 1314          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1315 Infuzions Thai SweetChili PotatoMix 110g        1      3.80       110
## 1316             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1317   Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 1318    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1319       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1320  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 1321         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1322   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 1323            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1324            Pringles Mystery Flavour 134g        2      7.40       134
## 1325         Thins Chips Seasonedchicken 175g        2      6.60       175
## 1326            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 1327         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 1328    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 1329         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1330            Pringles Original Crisps 134g        2      7.40       134
## 1331                     Cheezels Cheese 330g        2     11.40       330
## 1332 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 1333       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1334             Tostitos Splash Of Lime 175g        2      8.80       175
## 1335            Thins Chips Light& Tangy 175g        2      6.60       175
## 1336            Pringles Mystery Flavour 134g        2      7.40       134
## 1337  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1338            Kettle Honey Soy Chicken 175g        2     10.80       175
## 1339       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1340            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 1341             Tostitos Lightly Salted 175g        2      8.80       175
## 1342                     Twisties Chicken270g        2      9.20       270
## 1343         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1344                     Twisties Chicken270g        2      9.20       270
## 1345       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1346            Pringles SourCream Onion 134g        1      3.70       134
## 1347   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 1348            Pringles Mystery Flavour 134g        2      7.40       134
## 1349   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 1350                     Twisties Chicken270g        2      9.20       270
## 1351                   Pringles Barbeque 134g        2      7.40       134
## 1352       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1353   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1354  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1355            Pringles Mystery Flavour 134g        2      7.40       134
## 1356         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 1357            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1358              Doritos Cheese Supreme 330g        2     11.40       330
## 1359  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 1360             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 1361       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1362   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 1363            Thins Chips Light& Tangy 175g        2      6.60       175
## 1364    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 1365  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 1366    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1367            Thins Chips Light& Tangy 175g        2      6.60       175
## 1368   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 1369                 Pringles Slt Vingar 134g        2      7.40       134
## 1370 Kettle Tortilla ChpsHny&Jlpno Chili 150g        1      4.60       150
## 1371     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1372         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 1373             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 1374                     Twisties Cheese 270g        2      9.20       270
## 1375         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 1376              Doritos Cheese Supreme 330g        2     11.40       330
## 1377            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1378    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1379    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 1380    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1381       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1382      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 1383         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1384                    Doritos Mexicana 170g        2      8.80       170
## 1385                       Kettle Chilli 175g        2     10.80       175
## 1386                   Pringles Barbeque 134g        2      7.40       134
## 1387         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 1388       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1389             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 1390         Thins Chips Seasonedchicken 175g        2      6.60       175
## 1391    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1392            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1393         Kettle Sea Salt And Vinegar 175g        1      5.40       175
## 1394                     Twisties Cheese 270g        2      9.20       270
## 1395    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1396                       Kettle Chilli 175g        1      5.40       175
## 1397       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1398       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1399  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1400    Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 1401              Twisties Cheese Burger 250g        2      8.60       250
## 1402                     Twisties Chicken270g        2      9.20       270
## 1403              Doritos Cheese Supreme 330g        2     11.40       330
## 1404             Tostitos Lightly Salted 175g        2      8.80       175
## 1405         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1406            Pringles Original Crisps 134g        1      3.70       134
## 1407                    Doritos Mexicana 170g        2      8.80       170
## 1408             Smiths Crinkle Original 330g        2     11.40       330
## 1409 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 1410       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1411         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1412      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 1413              Doritos Cheese Supreme 330g        2     11.40       330
## 1414          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1415         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1416     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1417             Smiths Crinkle Original 330g        2     11.40       330
## 1418            Pringles Mystery Flavour 134g        2      7.40       134
## 1419                     Cheezels Cheese 330g        2     11.40       330
## 1420                     Cheezels Cheese 330g        2     11.40       330
## 1421                    Doritos Mexicana 170g        2      8.80       170
## 1422         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 1423                       Kettle Chilli 175g        2     10.80       175
## 1424                   Pringles Barbeque 134g        2      7.40       134
## 1425         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 1426         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 1427    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1428   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1429     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 1430         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 1431   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 1432            Pringles Original Crisps 134g        2      7.40       134
## 1433      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 1434   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1435  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 1436             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1437  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 1438  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 1439                     Cheezels Cheese 330g        2     11.40       330
## 1440          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1441                       Kettle Chilli 175g        2     10.80       175
## 1442             Dorito Corn Chp Supreme 380g        1      3.25       380
## 1443                 Pringles Slt Vingar 134g        2      7.40       134
## 1444    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1445            Pringles Mystery Flavour 134g        1      3.70       134
## 1446             Tostitos Lightly Salted 175g        2      8.80       175
## 1447     Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 1448 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 1449      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 1450            Pringles Mystery Flavour 134g        2      7.40       134
## 1451 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        1      3.80       110
## 1452   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 1453   Infzns Crn Crnchers Tangy Gcamole 110g        1      3.80       110
## 1454     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1455             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 1456                       Kettle Chilli 175g        2     10.80       175
## 1457  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 1458            Thins Chips Light& Tangy 175g        2      6.60       175
## 1459   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1460 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1461                     Twisties Cheese 270g        2      9.20       270
## 1462 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1463                     Twisties Chicken270g        2      9.20       270
## 1464 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 1465            Tostitos Smoked Chipotle 175g        2      8.80       175
## 1466             Smiths Crinkle Original 330g        2     11.40       330
## 1467         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 1468      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 1469                 Pringles Slt Vingar 134g        2      7.40       134
## 1470                       Kettle Chilli 175g        2     10.80       175
## 1471    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 1472   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1473         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1474                       Kettle Chilli 175g        2     10.80       175
## 1475     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 1476         Doritos Corn Chips Original 170g        2      8.80       170
## 1477     Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 1478 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1479   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1480            Tostitos Smoked Chipotle 175g        2      8.80       175
## 1481 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1482              Twisties Cheese Burger 250g        2      8.60       250
## 1483 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1484                   Pringles Barbeque 134g        2      7.40       134
## 1485       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1486                       Kettle Chilli 175g        2     10.80       175
## 1487         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1488         Thins Chips Seasonedchicken 175g        1      3.30       175
## 1489     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1490 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1491                     Cheezels Cheese 330g        2     11.40       330
## 1492             Smiths Crinkle Original 330g        2     11.40       330
## 1493                   Pringles Barbeque 134g        2      7.40       134
## 1494              Doritos Cheese Supreme 330g        2     11.40       330
## 1495                     Twisties Chicken270g        2      9.20       270
## 1496 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1497            Pringles SourCream Onion 134g        2      7.40       134
## 1498                     Twisties Cheese 270g        1      4.60       270
## 1499   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1500                     Cheezels Cheese 330g        2     11.40       330
## 1501      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 1502 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 1503          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1504  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 1505            Tostitos Smoked Chipotle 175g        2      8.80       175
## 1506    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1507  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 1508     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1509              Doritos Cheese Supreme 330g        2     11.40       330
## 1510          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1511    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 1512            Pringles SourCream Onion 134g        2      7.40       134
## 1513         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 1514                 Pringles Slt Vingar 134g        2      7.40       134
## 1515 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 1516             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 1517    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1518                   Pringles Barbeque 134g        2      7.40       134
## 1519            Thins Chips Light& Tangy 175g        2      6.60       175
## 1520    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 1521       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1522            Pringles SourCream Onion 134g        2      7.40       134
## 1523                     Twisties Chicken270g        1      4.60       270
## 1524    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1525            Pringles Original Crisps 134g        2      7.40       134
## 1526             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 1527 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 1528            Pringles SourCream Onion 134g        2      7.40       134
## 1529         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1530 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1531            Pringles Original Crisps 134g        2      7.40       134
## 1532         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1533              Doritos Cheese Supreme 330g        2     11.40       330
## 1534                     Cheezels Cheese 330g        2     11.40       330
## 1535         Doritos Corn Chips Original 170g        2      8.80       170
## 1536          Thins Chips Salt & Vinegar 175g        1      3.30       175
## 1537  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 1538     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1539              Doritos Cheese Supreme 330g        2     11.40       330
## 1540    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 1541 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1542     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1543  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 1544       Grain Waves Sour Cream&Chives 210G        3      7.20       210
## 1545                       Kettle Chilli 175g        2     10.80       175
## 1546    Infuzions BBQ Rib Prawn Crackers 110g        4      7.60       110
## 1547 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1548            Tostitos Smoked Chipotle 175g        2      8.80       175
## 1549            Thins Chips Light& Tangy 175g        2      6.60       175
## 1550                 Pringles Slt Vingar 134g        2      7.40       134
## 1551                     Twisties Cheese 270g        2      9.20       270
## 1552                     Twisties Chicken270g        2      9.20       270
## 1553   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 1554  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 1555             Tostitos Lightly Salted 175g        2      8.80       175
## 1556                     Kettle Original 175g        2     10.80       175
## 1557            Pringles Original Crisps 134g        2      7.40       134
## 1558                     Twisties Chicken270g        2      9.20       270
## 1559         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1560 Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 1561             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1562 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1563            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 1564            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 1565         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 1566            Pringles SourCream Onion 134g        1      3.70       134
## 1567 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1568     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 1569          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1570         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1571            Pringles Mystery Flavour 134g        2      7.40       134
## 1572      Thins Potato Chips Hot & Spicy 175g        1      3.30       175
## 1573             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 1574                     Twisties Chicken270g        2      9.20       270
## 1575     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1576            Kettle Honey Soy Chicken 175g        2     10.80       175
## 1577   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 1578 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1579                     Kettle Original 175g        2     10.80       175
## 1580            Pringles Original Crisps 134g        2      7.40       134
## 1581      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 1582    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1583     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1584    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1585         Thins Chips Seasonedchicken 175g        2      6.60       175
## 1586   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1587  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1588      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 1589         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1590                     Kettle Original 175g        2     10.80       175
## 1591 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1592    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1593  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1594 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1595         Doritos Corn Chips Original 170g        2      8.80       170
## 1596            Pringles Mystery Flavour 134g        2      7.40       134
## 1597     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 1598    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1599              Doritos Cheese Supreme 330g        2     11.40       330
## 1600             Tostitos Splash Of Lime 175g        2      8.80       175
## 1601            Pringles SourCream Onion 134g        2      7.40       134
## 1602              Doritos Cheese Supreme 330g        2     11.40       330
## 1603         Thins Chips Seasonedchicken 175g        2      6.60       175
## 1604                     Twisties Cheese 270g        2      9.20       270
## 1605          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1606   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 1607 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1608              Doritos Cheese Supreme 330g        2     11.40       330
## 1609              Twisties Cheese Burger 250g        2      8.60       250
## 1610     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 1611                       Kettle Chilli 175g        2     10.80       175
## 1612            Pringles Original Crisps 134g        2      7.40       134
## 1613 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1614                 Pringles Slt Vingar 134g        2      7.40       134
## 1615   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1616                   Pringles Barbeque 134g        2      7.40       134
## 1617            Pringles Original Crisps 134g        2      7.40       134
## 1618         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 1619 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1620 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1621            Pringles SourCream Onion 134g        2      7.40       134
## 1622 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 1623          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1624             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1625            Pringles SourCream Onion 134g        2      7.40       134
## 1626   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1627                     Twisties Cheese 270g        2      9.20       270
## 1628    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1629   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 1630             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1631                       Kettle Chilli 175g        2     10.80       175
## 1632 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 1633                     Cheezels Cheese 330g        2     11.40       330
## 1634                     Cheezels Cheese 330g        2     11.40       330
## 1635 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1636  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1637              Doritos Cheese Supreme 330g        2     11.40       330
## 1638   Kettle Sensations Camembert & Fig 150g        5      9.20       150
## 1639                   Pringles Barbeque 134g        2      7.40       134
## 1640   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 1641    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1642                     Cheezels Cheese 330g        2     11.40       330
## 1643         Thins Chips Seasonedchicken 175g        2      6.60       175
## 1644            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1645      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 1646            Pringles Original Crisps 134g        2      7.40       134
## 1647            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 1648    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1649             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 1650             Tostitos Splash Of Lime 175g        2      8.80       175
## 1651         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 1652 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 1653             Tostitos Lightly Salted 175g        2      8.80       175
## 1654         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1655     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1656             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 1657            Tostitos Smoked Chipotle 175g        2      8.80       175
## 1658    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 1659 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 1660         Doritos Corn Chips Original 170g        1      4.40       170
## 1661   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 1662                       Kettle Chilli 175g        2     10.80       175
## 1663    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1664            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1665             Smiths Crinkle Original 330g        1      5.70       330
## 1666         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1667 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1668       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1669     Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 1670   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 1671            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 1672      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 1673            Tostitos Smoked Chipotle 175g        2      8.80       175
## 1674            Thins Chips Light& Tangy 175g        2      6.60       175
## 1675          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1676     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1677            Kettle Honey Soy Chicken 175g        2     10.80       175
## 1678   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1679       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1680 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1681            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1682     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 1683              Twisties Cheese Burger 250g        2      8.60       250
## 1684                     Twisties Chicken270g        2      9.20       270
## 1685     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 1686    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1687  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 1688 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1689  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 1690         Thins Chips Seasonedchicken 175g        2      6.60       175
## 1691                    Doritos Mexicana 170g        2      8.80       170
## 1692       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1693 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1694            Kettle Honey Soy Chicken 175g        2     10.80       175
## 1695              Twisties Cheese Burger 250g        2      8.60       250
## 1696            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1697 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 1698 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 1699            Pringles SourCream Onion 134g        2      7.40       134
## 1700    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1701       Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 1702    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1703       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1704                     Cheezels Cheese 330g        2     11.40       330
## 1705              Doritos Cheese Supreme 330g        2     11.40       330
## 1706         Thins Chips Seasonedchicken 175g        2      6.60       175
## 1707         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 1708     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1709  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 1710     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1711  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1712            Pringles SourCream Onion 134g        2      7.40       134
## 1713             Tostitos Splash Of Lime 175g        2      8.80       175
## 1714  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1715         Doritos Corn Chips Original 170g        2      8.80       170
## 1716            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 1717             Tostitos Lightly Salted 175g        1      4.40       175
## 1718            Thins Chips Light& Tangy 175g        2      6.60       175
## 1719     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1720            Pringles SourCream Onion 134g        2      7.40       134
## 1721            Tostitos Smoked Chipotle 175g        2      8.80       175
## 1722            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1723            Thins Chips Light& Tangy 175g        2      6.60       175
## 1724             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 1725             Smiths Crinkle Original 330g        2     11.40       330
## 1726            Kettle Honey Soy Chicken 175g        2     10.80       175
## 1727 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1728                     Kettle Original 175g        2     10.80       175
## 1729      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 1730    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1731          Thins Chips Salt & Vinegar 175g        2      3.30       175
## 1732         Pringles Chicken Salt Crips 134g        3     11.10       134
## 1733 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1734                     Kettle Original 175g        1      5.40       175
## 1735         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1736     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 1737   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 1738         Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 1739            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 1740                   Pringles Barbeque 134g        2      7.40       134
## 1741 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1742 Infuzions Thai SweetChili PotatoMix 110g        1      3.80       110
## 1743            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1744      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 1745            Tostitos Smoked Chipotle 175g        2      8.80       175
## 1746    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1747              Twisties Cheese Burger 250g        1      4.30       250
## 1748            Pringles Original Crisps 134g        2      7.40       134
## 1749         Thins Chips Seasonedchicken 175g        2      6.60       175
## 1750                     Twisties Cheese 270g        2      9.20       270
## 1751            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 1752                       Kettle Chilli 175g        2     10.80       175
## 1753             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 1754            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1755       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1756 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1757     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1758                       Kettle Chilli 175g        2     10.80       175
## 1759             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 1760 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1761             Smiths Crinkle Original 330g        2     11.40       330
## 1762  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 1763   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1764            Kettle Honey Soy Chicken 175g        2     10.80       175
## 1765     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1766                 Pringles Slt Vingar 134g        2      7.40       134
## 1767     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 1768    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1769                     Kettle Original 175g        2     10.80       175
## 1770    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1771                    Doritos Mexicana 170g        2      8.80       170
## 1772            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1773  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 1774 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1775            Pringles SourCream Onion 134g        2      7.40       134
## 1776                   Pringles Barbeque 134g        2      7.40       134
## 1777             Tostitos Lightly Salted 175g        2      8.80       175
## 1778            Pringles Original Crisps 134g        2      7.40       134
## 1779             Tostitos Lightly Salted 175g        2      8.80       175
## 1780             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 1781                     Twisties Chicken270g        2      9.20       270
## 1782       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1783   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 1784    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1785         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 1786         Doritos Corn Chips Original 170g        2      8.80       170
## 1787                     Twisties Cheese 270g        2      9.20       270
## 1788 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1789     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 1790            Pringles Original Crisps 134g        2      7.40       134
## 1791    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 1792       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1793     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1794                     Twisties Cheese 270g        2      9.20       270
## 1795         Thins Chips Seasonedchicken 175g        2      6.60       175
## 1796 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1797         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1798     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1799          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1800 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 1801     Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 1802     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1803  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 1804    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1805       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1806 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 1807  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 1808            Pringles Mystery Flavour 134g        2      7.40       134
## 1809       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1810     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1811            Kettle Honey Soy Chicken 175g        2     10.80       175
## 1812            Pringles Mystery Flavour 134g        2      7.40       134
## 1813    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1814            Pringles SourCream Onion 134g        2      7.40       134
## 1815       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1816              Twisties Cheese Burger 250g        1      4.30       250
## 1817             Kettle 135g Swt Pot Sea Salt        1      4.20       135
## 1818     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1819         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1820   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1821 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1822                 Pringles Slt Vingar 134g        2      7.40       134
## 1823  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1824  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1825    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 1826       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1827     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1828 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1829            Pringles SourCream Onion 134g        1      3.70       134
## 1830    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1831 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1832            Tostitos Smoked Chipotle 175g        2      8.80       175
## 1833                     Twisties Chicken270g        2      9.20       270
## 1834              Doritos Cheese Supreme 330g        2     11.40       330
## 1835    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 1836             Tostitos Splash Of Lime 175g        2      8.80       175
## 1837         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1838  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 1839                     Twisties Chicken270g        2      9.20       270
## 1840             Tostitos Splash Of Lime 175g        2      8.80       175
## 1841             Tostitos Lightly Salted 175g        2      8.80       175
## 1842       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1843            Grain Waves Sweet Chilli 210g        1      3.60       210
## 1844                 Pringles Slt Vingar 134g        2      7.40       134
## 1845          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1846    Cobs Popd Sour Crm &Chives Chips 110g        1      3.80       110
## 1847             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 1848  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1849 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        1      3.80       110
## 1850     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1851    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1852      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 1853             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 1854      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 1855            Kettle Honey Soy Chicken 175g        2     10.80       175
## 1856     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1857     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1858                       Kettle Chilli 175g        2     10.80       175
## 1859 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1860    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 1861             Tostitos Lightly Salted 175g        2      8.80       175
## 1862 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1863 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1864            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1865    Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 1866             Tostitos Lightly Salted 175g        2      8.80       175
## 1867            Pringles Mystery Flavour 134g        2      7.40       134
## 1868         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1869  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1870             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1871         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 1872             Tostitos Lightly Salted 175g        2      8.80       175
## 1873            Thins Chips Light& Tangy 175g        2      6.60       175
## 1874 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1875   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1876       Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 1877             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1878         Doritos Corn Chips Original 170g        2      8.80       170
## 1879 Kettle Tortilla ChpsHny&Jlpno Chili 150g        1      4.60       150
## 1880       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1881            Pringles Mystery Flavour 134g        2      7.40       134
## 1882                     Kettle Original 175g        1      5.40       175
## 1883          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 1884             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1885              Twisties Cheese Burger 250g        2      8.60       250
## 1886            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1887            Thins Chips Light& Tangy 175g        2      6.60       175
## 1888     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 1889         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1890  Doritos Corn Chip Southern Chicken 150g        1      3.90       150
## 1891  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 1892            Pringles Original Crisps 134g        2      7.40       134
## 1893                   Pringles Barbeque 134g        1      3.70       134
## 1894         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 1895             Smiths Crinkle Original 330g        2     11.40       330
## 1896 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1897             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 1898            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 1899       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1900 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1901            Thins Chips Light& Tangy 175g        2      6.60       175
## 1902             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 1903            Tostitos Smoked Chipotle 175g        1      4.40       175
## 1904                       Kettle Chilli 175g        1      5.40       175
## 1905     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1906         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1907  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1908       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1909                       Kettle Chilli 175g        2     10.80       175
## 1910 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1911             Tostitos Splash Of Lime 175g        2      8.80       175
## 1912         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 1913   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 1914 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1915              Doritos Cheese Supreme 330g        2     11.40       330
## 1916                       Kettle Chilli 175g        2     10.80       175
## 1917 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1918            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 1919     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1920  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 1921 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 1922     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 1923     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1924       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1925      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 1926         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 1927    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 1928            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1929            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 1930      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 1931         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 1932     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1933   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 1934         Thins Chips Seasonedchicken 175g        2      6.60       175
## 1935                     Cheezels Cheese 330g        2     11.40       330
## 1936                     Twisties Cheese 270g        2      9.20       270
## 1937            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1938             Dorito Corn Chp Supreme 380g        2     13.00       380
## 1939 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1940         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1941            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1942             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 1943             Tostitos Splash Of Lime 175g        2      8.80       175
## 1944  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1945 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 1946     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 1947       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1948 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 1949            Pringles Mystery Flavour 134g        2      7.40       134
## 1950     Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 1951   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 1952             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 1953            Pringles Original Crisps 134g        2      7.40       134
## 1954                     Kettle Original 175g        2     10.80       175
## 1955         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1956    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 1957             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 1958       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1959       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1960   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1961 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1962             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 1963            Pringles Original Crisps 134g        2      7.40       134
## 1964      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 1965            Grain Waves Sweet Chilli 210g        2      7.20       210
## 1966 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1967            Pringles Original Crisps 134g        2      7.40       134
## 1968                    Doritos Mexicana 170g        2      8.80       170
## 1969 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 1970  Doritos Corn Chip Mexican Jalapeno 150g        1      3.90       150
## 1971 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 1972 Infuzions Thai SweetChili PotatoMix 110g        1      3.80       110
## 1973            Pringles SourCream Onion 134g        1      3.70       134
## 1974   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 1975             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 1976         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 1977  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 1978 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 1979   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 1980              Twisties Cheese Burger 250g        2      8.60       250
## 1981                     Cheezels Cheese 330g        2     11.40       330
## 1982       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1983         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1984             Smiths Crinkle Original 330g        2     11.40       330
## 1985 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 1986  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1987      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 1988     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 1989                       Kettle Chilli 175g        2     10.80       175
## 1990  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 1991       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 1992              Twisties Cheese Burger 250g        2      8.60       250
## 1993         Pringles Chicken Salt Crips 134g        2      7.40       134
## 1994             Smiths Crinkle Original 330g        2     11.40       330
## 1995         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 1996         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 1997     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 1998       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 1999            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2000            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2001            Pringles SourCream Onion 134g        2      7.40       134
## 2002         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 2003            Pringles Mystery Flavour 134g        2      7.40       134
## 2004             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2005         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2006 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2007                     Cheezels Cheese 330g        2     11.40       330
## 2008 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2009 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2010            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2011   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2012                     Cheezels Cheese 330g        2     11.40       330
## 2013    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2014            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2015         Doritos Corn Chips Original 170g        2      8.80       170
## 2016         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2017             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 2018  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2019                     Twisties Chicken270g        2      9.20       270
## 2020 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2021             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 2022                     Cheezels Cheese 330g        2     11.40       330
## 2023            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2024         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 2025     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2026                     Twisties Cheese 270g        2      9.20       270
## 2027 Infuzions SourCream&Herbs Veg Strws 110g        1      3.80       110
## 2028         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 2029                     Twisties Chicken270g        2      9.20       270
## 2030    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2031      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2032            Grain Waves Sweet Chilli 210g        2      7.20       210
## 2033  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2034         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 2035                     Kettle Original 175g        2     10.80       175
## 2036     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2037         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2038                    Doritos Mexicana 170g        2      8.80       170
## 2039            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2040       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 2041 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2042 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2043             Smiths Crinkle Original 330g        2     11.40       330
## 2044            Pringles SourCream Onion 134g        2      7.40       134
## 2045 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2046  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2047                       Kettle Chilli 175g        2     10.80       175
## 2048         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 2049      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2050   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 2051             Tostitos Lightly Salted 175g        2      8.80       175
## 2052                   Pringles Barbeque 134g        2      7.40       134
## 2053    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2054     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2055             Smiths Crinkle Original 330g        1      5.70       330
## 2056          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2057                 Pringles Slt Vingar 134g        2      7.40       134
## 2058 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2059      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2060         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2061 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2062    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2063       Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 2064            Pringles Mystery Flavour 134g        2      7.40       134
## 2065             Tostitos Splash Of Lime 175g        2      8.80       175
## 2066   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 2067                     Twisties Chicken270g        2      9.20       270
## 2068              Doritos Cheese Supreme 330g        2     11.40       330
## 2069            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2070   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2071                     Kettle Original 175g        2     10.80       175
## 2072         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2073 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2074                     Twisties Chicken270g        2      9.20       270
## 2075         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2076  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2077         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 2078   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2079         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2080             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2081                     Cheezels Cheese 330g        2     11.40       330
## 2082              Doritos Cheese Supreme 330g        2     11.40       330
## 2083      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2084                    Doritos Mexicana 170g        2      8.80       170
## 2085            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2086            Pringles SourCream Onion 134g        1      3.70       134
## 2087  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2088         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2089  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2090     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2091    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2092                       Kettle Chilli 175g        2     10.80       175
## 2093 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2094          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2095 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2096         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2097         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 2098    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2099                       Kettle Chilli 175g        2     10.80       175
## 2100                       Kettle Chilli 175g        1      5.40       175
## 2101            Thins Chips Light& Tangy 175g        2      6.60       175
## 2102   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2103             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2104       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 2105  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2106             Kettle 135g Swt Pot Sea Salt        1      4.20       135
## 2107            Pringles Original Crisps 134g        2      7.40       134
## 2108             Tostitos Splash Of Lime 175g        1      4.40       175
## 2109            Grain Waves Sweet Chilli 210g        2      7.20       210
## 2110   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2111            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2112    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2113            Pringles Original Crisps 134g        2      7.40       134
## 2114 Infuzions Thai SweetChili PotatoMix 110g        1      3.80       110
## 2115     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2116             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2117             Tostitos Lightly Salted 175g        2      8.80       175
## 2118      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2119    Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 2120                       Kettle Chilli 175g        2     10.80       175
## 2121            Grain Waves Sweet Chilli 210g        2      7.20       210
## 2122            Pringles Mystery Flavour 134g        2      7.40       134
## 2123     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2124             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 2125             Smiths Crinkle Original 330g        2     11.40       330
## 2126       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 2127             Tostitos Splash Of Lime 175g        2      8.80       175
## 2128 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        1      3.80       110
## 2129                     Twisties Cheese 270g        2      9.20       270
## 2130            Grain Waves Sweet Chilli 210g        2      7.20       210
## 2131         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2132          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2133         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 2134    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2135         Doritos Corn Chips Original 170g        2      8.80       170
## 2136         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2137    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2138            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2139                    Doritos Mexicana 170g        2      8.80       170
## 2140     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2141                     Twisties Cheese 270g        2      9.20       270
## 2142 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2143            Pringles Mystery Flavour 134g        2      7.40       134
## 2144    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2145            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2146       Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 2147       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2148         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2149          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2150    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2151         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2152              Twisties Cheese Burger 250g        2      8.60       250
## 2153                     Twisties Chicken270g        2      9.20       270
## 2154                    Doritos Mexicana 170g        2      8.80       170
## 2155            Pringles Mystery Flavour 134g        2      7.40       134
## 2156            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2157         Doritos Corn Chips Original 170g        2      8.80       170
## 2158    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2159         Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 2160      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2161                       Kettle Chilli 175g        1      5.40       175
## 2162            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2163         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2164       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2165       Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 2166         Doritos Corn Chips Original 170g        2      8.80       170
## 2167         Doritos Corn Chips Original 170g        2      8.80       170
## 2168     Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 2169                 Pringles Slt Vingar 134g        2      7.40       134
## 2170   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 2171   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2172         Doritos Corn Chips Original 170g        2      8.80       170
## 2173       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 2174             Tostitos Lightly Salted 175g        2      8.80       175
## 2175 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2176  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2177              Twisties Cheese Burger 250g        2      8.60       250
## 2178      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2179                    Doritos Mexicana 170g        2      8.80       170
## 2180            Pringles SourCream Onion 134g        2      7.40       134
## 2181            Pringles Mystery Flavour 134g        2      7.40       134
## 2182             Tostitos Lightly Salted 175g        2      8.80       175
## 2183 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2184                 Pringles Slt Vingar 134g        2      7.40       134
## 2185      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2186      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2187         Doritos Corn Chips Original 170g        1      4.40       170
## 2188       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 2189            Thins Chips Light& Tangy 175g        2      6.60       175
## 2190      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2191  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2192      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2193 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2194      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2195                 Pringles Slt Vingar 134g        2      7.40       134
## 2196       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2197             Smiths Crinkle Original 330g        2     11.40       330
## 2198   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2199            Grain Waves Sweet Chilli 210g        2      7.20       210
## 2200    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2201            Pringles Original Crisps 134g        2      7.40       134
## 2202            Pringles SourCream Onion 134g        2      7.40       134
## 2203      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2204   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2205             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 2206   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2207  Doritos Corn Chip Southern Chicken 150g        1      3.90       150
## 2208 Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 2209    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2210  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2211             Tostitos Splash Of Lime 175g        2      8.80       175
## 2212         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2213         Doritos Corn Chips Original 170g        2      8.80       170
## 2214            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2215         Doritos Corn Chips Original 170g        2      8.80       170
## 2216   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2217            Thins Chips Light& Tangy 175g        2      6.60       175
## 2218              Doritos Cheese Supreme 330g        2     11.40       330
## 2219   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2220         Doritos Corn Chips Original 170g        2      8.80       170
## 2221                 Pringles Slt Vingar 134g        1      3.70       134
## 2222 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2223             Tostitos Lightly Salted 175g        2      8.80       175
## 2224             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2225         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2226      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2227                 Pringles Slt Vingar 134g        2      7.40       134
## 2228   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2229  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2230         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2231  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2232              Doritos Cheese Supreme 330g        2     11.40       330
## 2233                     Cheezels Cheese 330g        2     11.40       330
## 2234 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2235 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2236         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2237 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2238                   Pringles Barbeque 134g        2      7.40       134
## 2239            Pringles Original Crisps 134g        2      7.40       134
## 2240                 Pringles Slt Vingar 134g        2      7.40       134
## 2241                     Twisties Cheese 270g        2      9.20       270
## 2242   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 2243         Doritos Corn Chips Original 170g        2      8.80       170
## 2244       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2245          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2246             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 2247  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 2248 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 2249             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2250 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 2251    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2252 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2253     Kettle Tortilla ChpsFeta&Garlic 150g        1      4.60       150
## 2254         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 2255  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2256       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2257  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2258     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2259      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2260                     Kettle Original 175g        2     10.80       175
## 2261                    Doritos Mexicana 170g        2      8.80       170
## 2262       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2263   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2264      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2265      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2266  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2267                   Pringles Barbeque 134g        2      7.40       134
## 2268      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2269    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2270             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 2271             Tostitos Splash Of Lime 175g        2      8.80       175
## 2272             Tostitos Splash Of Lime 175g        2      8.80       175
## 2273            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2274   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2275     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2276         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2277            Pringles Original Crisps 134g        2      7.40       134
## 2278            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2279     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2280       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2281    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2282            Thins Chips Light& Tangy 175g        2      6.60       175
## 2283         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2284     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2285     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2286            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2287  Kettle Sweet Chilli And Sour Cream 175g        5     10.80       175
## 2288          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2289                     Twisties Cheese 270g        2      9.20       270
## 2290                       Kettle Chilli 175g        2     10.80       175
## 2291   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 2292 Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 2293 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2294 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2295             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 2296                     Cheezels Cheese 330g        2     11.40       330
## 2297            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2298            Pringles SourCream Onion 134g        2      7.40       134
## 2299 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2300         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2301  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2302       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2303                       Kettle Chilli 175g        2     10.80       175
## 2304                   Pringles Barbeque 134g        2      7.40       134
## 2305       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2306            Pringles SourCream Onion 134g        2      7.40       134
## 2307    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2308         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2309            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2310    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2311                       Kettle Chilli 175g        2     10.80       175
## 2312              Doritos Cheese Supreme 330g        2     11.40       330
## 2313                     Twisties Chicken270g        2      9.20       270
## 2314              Doritos Cheese Supreme 330g        2     11.40       330
## 2315   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 2316             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 2317 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 2318                       Kettle Chilli 175g        2     10.80       175
## 2319          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2320  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2321         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2322  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2323                     Twisties Cheese 270g        2      9.20       270
## 2324            Pringles SourCream Onion 134g        2      7.40       134
## 2325            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2326            Pringles Original Crisps 134g        2      7.40       134
## 2327 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 2328       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 2329            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2330            Grain Waves Sweet Chilli 210g        1      3.60       210
## 2331       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 2332 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2333             Tostitos Splash Of Lime 175g        2      8.80       175
## 2334            Pringles Mystery Flavour 134g        2      7.40       134
## 2335         Doritos Corn Chips Original 170g        2      8.80       170
## 2336                 Pringles Slt Vingar 134g        2      7.40       134
## 2337   Infzns Crn Crnchers Tangy Gcamole 110g        1      3.80       110
## 2338   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2339         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 2340 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2341   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 2342            Pringles Mystery Flavour 134g        2      7.40       134
## 2343            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2344 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 2345   Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 2346       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2347  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2348             Smiths Crinkle Original 330g        2     11.40       330
## 2349         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2350     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2351     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2352    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2353          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2354                 Pringles Slt Vingar 134g        2      7.40       134
## 2355       Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 2356  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2357  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2358     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2359 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2360         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2361  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2362                 Pringles Slt Vingar 134g        2      7.40       134
## 2363     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2364  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 2365       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2366             Tostitos Lightly Salted 175g        2      8.80       175
## 2367            Pringles SourCream Onion 134g        2      7.40       134
## 2368            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2369            Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 2370  Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 2371         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2372                     Cheezels Cheese 330g        2     11.40       330
## 2373    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2374  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2375   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 2376     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2377          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2378          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2379                     Cheezels Cheese 330g        2     11.40       330
## 2380                     Cheezels Cheese 330g        2     11.40       330
## 2381            Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 2382                     Twisties Cheese 270g        2      9.20       270
## 2383                    Doritos Mexicana 170g        2      8.80       170
## 2384                     Twisties Cheese 270g        2      9.20       270
## 2385            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2386     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2387            Grain Waves Sweet Chilli 210g        1      3.60       210
## 2388 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2389    Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 2390     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 2391            Pringles Original Crisps 134g        2      7.40       134
## 2392                   Pringles Barbeque 134g        2      7.40       134
## 2393 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 2394  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2395   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 2396      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2397                 Pringles Slt Vingar 134g        2      7.40       134
## 2398             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 2399         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2400 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2401   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2402             Smiths Crinkle Original 330g        2     11.40       330
## 2403         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 2404         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2405                       Kettle Chilli 175g        1      5.40       175
## 2406                     Kettle Original 175g        2     10.80       175
## 2407             Tostitos Lightly Salted 175g        2      8.80       175
## 2408      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2409            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2410 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 2411 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2412                    Doritos Mexicana 170g        2      8.80       170
## 2413            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2414            Pringles Mystery Flavour 134g        1      3.70       134
## 2415                     Kettle Original 175g        2     10.80       175
## 2416              Doritos Cheese Supreme 330g        2     11.40       330
## 2417         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 2418  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2419  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2420    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2421     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 2422         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 2423            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2424              Doritos Cheese Supreme 330g        2     11.40       330
## 2425     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2426    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2427 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2428         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2429   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2430 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2431 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2432            Pringles Original Crisps 134g        2      7.40       134
## 2433             Tostitos Lightly Salted 175g        2      8.80       175
## 2434            Grain Waves Sweet Chilli 210g        2      7.20       210
## 2435         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2436    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2437 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2438          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2439 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 2440                     Twisties Chicken270g        2      9.20       270
## 2441         Doritos Corn Chips Original 170g        2      8.80       170
## 2442            Pringles Mystery Flavour 134g        2      7.40       134
## 2443             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 2444                   Pringles Barbeque 134g        2      7.40       134
## 2445  Doritos Corn Chip Southern Chicken 150g        1      3.90       150
## 2446                     Twisties Cheese 270g        2      9.20       270
## 2447     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2448                     Twisties Chicken270g        2      9.20       270
## 2449            Pringles Mystery Flavour 134g        2      7.40       134
## 2450      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2451             Smiths Crinkle Original 330g        2     11.40       330
## 2452  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2453    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2454         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 2455         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2456    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2457             Smiths Crinkle Original 330g        2     11.40       330
## 2458    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2459             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2460         Doritos Corn Chips Original 170g        2      8.80       170
## 2461            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2462          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2463 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 2464                     Twisties Chicken270g        2      9.20       270
## 2465       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2466      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2467    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2468       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 2469    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2470                     Cheezels Cheese 330g        2     11.40       330
## 2471             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 2472       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2473            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2474                     Twisties Chicken270g        2      9.20       270
## 2475            Thins Chips Light& Tangy 175g        2      6.60       175
## 2476  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2477         Doritos Corn Chips Original 170g        2      8.80       170
## 2478         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2479                     Kettle Original 175g        2     10.80       175
## 2480     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2481                       Kettle Chilli 175g        2     10.80       175
## 2482                     Twisties Cheese 270g        2      9.20       270
## 2483            Pringles Original Crisps 134g        2      7.40       134
## 2484            Thins Chips Light& Tangy 175g        2      6.60       175
## 2485            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2486    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2487            Thins Chips Light& Tangy 175g        2      6.60       175
## 2488         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 2489         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 2490            Thins Chips Light& Tangy 175g        2      6.60       175
## 2491                     Cheezels Cheese 330g        2     11.40       330
## 2492             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2493            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2494             Smiths Crinkle Original 330g        2     11.40       330
## 2495  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2496                   Pringles Barbeque 134g        2      7.40       134
## 2497            Pringles Original Crisps 134g        2      7.40       134
## 2498            Pringles SourCream Onion 134g        2      7.40       134
## 2499    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2500                     Cheezels Cheese 330g        1      5.70       330
## 2501         Doritos Corn Chips Original 170g        2      8.80       170
## 2502 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2503      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2504             Tostitos Lightly Salted 175g        2      8.80       175
## 2505          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2506                 Pringles Slt Vingar 134g        2      7.40       134
## 2507 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2508       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 2509                     Twisties Cheese 270g        2      9.20       270
## 2510       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2511             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 2512     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 2513       Tyrrells Crisps Ched & Chives 165g        3      8.40       165
## 2514         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2515                       Kettle Chilli 175g        2     10.80       175
## 2516                    Doritos Mexicana 170g        2      8.80       170
## 2517      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2518         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2519       Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 2520     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 2521         Doritos Corn Chips Original 170g        2      8.80       170
## 2522  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2523      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2524            Pringles Mystery Flavour 134g        2      7.40       134
## 2525            Thins Chips Light& Tangy 175g        2      6.60       175
## 2526     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2527                     Twisties Chicken270g        2      9.20       270
## 2528                     Kettle Original 175g        2     10.80       175
## 2529         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2530    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2531             Tostitos Splash Of Lime 175g        2      8.80       175
## 2532             Tostitos Lightly Salted 175g        2      8.80       175
## 2533 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 2534                     Kettle Original 175g        2     10.80       175
## 2535    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2536 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2537      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2538         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 2539 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2540            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2541                     Kettle Original 175g        2     10.80       175
## 2542    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2543            Thins Chips Light& Tangy 175g        2      6.60       175
## 2544            Grain Waves Sweet Chilli 210g        1      3.60       210
## 2545             Tostitos Splash Of Lime 175g        2      8.80       175
## 2546         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2547                     Twisties Chicken270g        2      9.20       270
## 2548    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2549         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 2550            Pringles SourCream Onion 134g        2      7.40       134
## 2551            Pringles SourCream Onion 134g        2      7.40       134
## 2552             Smiths Crinkle Original 330g        2     11.40       330
## 2553   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2554                       Kettle Chilli 175g        2     10.80       175
## 2555            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2556   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2557  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2558 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2559         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2560    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2561         Doritos Corn Chips Original 170g        2      8.80       170
## 2562                       Kettle Chilli 175g        2     10.80       175
## 2563         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 2564  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2565     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2566              Twisties Cheese Burger 250g        1      4.30       250
## 2567    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2568                       Kettle Chilli 175g        2     10.80       175
## 2569  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2570             Smiths Crinkle Original 330g        2     11.40       330
## 2571             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 2572         Doritos Corn Chips Original 170g        2      8.80       170
## 2573             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 2574            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2575  Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 2576                       Kettle Chilli 175g        2     10.80       175
## 2577      Tyrrells Crisps Lightly Salted 165g        1      4.20       165
## 2578            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2579  Doritos Corn Chip Mexican Jalapeno 150g        1      3.90       150
## 2580   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2581     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 2582   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2583    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2584  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2585   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2586         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 2587            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2588         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2589  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2590         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 2591      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2592         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 2593 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2594       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 2595 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2596  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 2597              Doritos Cheese Supreme 330g        2     11.40       330
## 2598                     Twisties Cheese 270g        2      9.20       270
## 2599             Smiths Crinkle Original 330g        2     11.40       330
## 2600              Doritos Cheese Supreme 330g        2     11.40       330
## 2601                     Twisties Cheese 270g        2      9.20       270
## 2602   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2603         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2604  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2605   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 2606            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2607              Twisties Cheese Burger 250g        2      8.60       250
## 2608         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2609      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2610   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 2611              Twisties Cheese Burger 250g        2      8.60       250
## 2612   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 2613 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2614  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2615            Tostitos Smoked Chipotle 175g        1      4.40       175
## 2616         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2617            Pringles Original Crisps 134g        2      7.40       134
## 2618         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 2619            Pringles SourCream Onion 134g        2      7.40       134
## 2620             Tostitos Splash Of Lime 175g        2      8.80       175
## 2621         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2622  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 2623 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        1      3.80       110
## 2624     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 2625      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2626             Tostitos Splash Of Lime 175g        2      8.80       175
## 2627       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2628         Doritos Corn Chips Original 170g        2      8.80       170
## 2629             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 2630      Tyrrells Crisps Lightly Salted 165g        1      4.20       165
## 2631    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2632         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2633 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2634          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2635     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 2636            Grain Waves Sweet Chilli 210g        2      7.20       210
## 2637 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2638   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2639       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2640            Pringles SourCream Onion 134g        2      7.40       134
## 2641 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2642      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2643             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 2644                     Cheezels Cheese 330g        2     11.40       330
## 2645                    Doritos Mexicana 170g        2      8.80       170
## 2646                     Cheezels Cheese 330g        2     11.40       330
## 2647            Grain Waves Sweet Chilli 210g        2      7.20       210
## 2648 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2649 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2650                   Pringles Barbeque 134g        2      7.40       134
## 2651  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2652     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2653             Smiths Crinkle Original 330g        2     11.40       330
## 2654                     Twisties Cheese 270g        2      9.20       270
## 2655     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2656         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 2657                    Doritos Mexicana 170g        2      8.80       170
## 2658     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 2659         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2660     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 2661      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2662            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2663            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2664 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2665              Twisties Cheese Burger 250g        2      8.60       250
## 2666   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2667            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2668 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2669 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 2670             Tostitos Lightly Salted 175g        2      8.80       175
## 2671      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2672    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2673    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2674     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 2675       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 2676         Doritos Corn Chips Original 170g        2      8.80       170
## 2677             Tostitos Splash Of Lime 175g        2      8.80       175
## 2678                     Cheezels Cheese 330g        2     11.40       330
## 2679                     Kettle Original 175g        2     10.80       175
## 2680                     Twisties Chicken270g        2      9.20       270
## 2681      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2682                   Pringles Barbeque 134g        2      7.40       134
## 2683     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2684  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2685   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 2686                   Pringles Barbeque 134g        2      7.40       134
## 2687         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 2688            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2689      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2690  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2691 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2692                     Twisties Chicken270g        2      9.20       270
## 2693  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2694            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2695             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 2696                    Doritos Mexicana 170g        2      8.80       170
## 2697                     Twisties Chicken270g        2      9.20       270
## 2698      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2699         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2700                     Cheezels Cheese 330g        1      5.70       330
## 2701             Tostitos Splash Of Lime 175g        2      8.80       175
## 2702 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2703             Tostitos Lightly Salted 175g        2      8.80       175
## 2704    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2705            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2706         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2707 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2708    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2709   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2710                     Twisties Cheese 270g        2      9.20       270
## 2711 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2712            Thins Chips Light& Tangy 175g        2      6.60       175
## 2713    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2714             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2715    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2716              Doritos Cheese Supreme 330g        2     11.40       330
## 2717    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2718         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 2719             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 2720         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2721            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2722             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 2723             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 2724            Pringles Mystery Flavour 134g        2      7.40       134
## 2725         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2726         Doritos Corn Chips Original 170g        2      8.80       170
## 2727 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2728         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 2729                     Twisties Cheese 270g        2      9.20       270
## 2730         Doritos Corn Chips Original 170g        1      4.40       170
## 2731    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2732   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2733 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2734 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 2735    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2736            Thins Chips Light& Tangy 175g        2      6.60       175
## 2737     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 2738                     Twisties Cheese 270g        2      9.20       270
## 2739             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2740         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2741            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2742    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2743    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2744   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2745         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2746            Pringles SourCream Onion 134g        1      3.70       134
## 2747                   Pringles Barbeque 134g        2      7.40       134
## 2748            Grain Waves Sweet Chilli 210g        2      7.20       210
## 2749         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2750     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 2751                     Cheezels Cheese 330g        2     11.40       330
## 2752                 Pringles Slt Vingar 134g        2      7.40       134
## 2753             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2754                    Doritos Mexicana 170g        2      8.80       170
## 2755     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2756      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2757  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2758    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2759            Pringles Mystery Flavour 134g        2      7.40       134
## 2760                    Doritos Mexicana 170g        2      8.80       170
## 2761              Twisties Cheese Burger 250g        2      8.60       250
## 2762 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2763         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 2764            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2765  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2766             Tostitos Lightly Salted 175g        2      8.80       175
## 2767   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2768 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2769    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2770             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 2771                       Kettle Chilli 175g        2     10.80       175
## 2772    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2773            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2774                   Pringles Barbeque 134g        2      7.40       134
## 2775 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2776  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2777            Pringles SourCream Onion 134g        2      7.40       134
## 2778            Pringles SourCream Onion 134g        2      7.40       134
## 2779       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 2780                 Pringles Slt Vingar 134g        2      7.40       134
## 2781            Pringles Original Crisps 134g        2      7.40       134
## 2782         Doritos Corn Chips Original 170g        2      8.80       170
## 2783          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2784            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2785            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2786      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2787  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2788            Pringles Original Crisps 134g        2      7.40       134
## 2789                     Kettle Original 175g        2     10.80       175
## 2790             Tostitos Splash Of Lime 175g        2      8.80       175
## 2791    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2792            Pringles Original Crisps 134g        1      3.70       134
## 2793             Tostitos Splash Of Lime 175g        2      8.80       175
## 2794            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2795         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 2796  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2797             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 2798            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2799 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 2800                 Pringles Slt Vingar 134g        2      7.40       134
## 2801            Thins Chips Light& Tangy 175g        2      6.60       175
## 2802  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2803             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2804     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2805         Doritos Corn Chips Original 170g        2      8.80       170
## 2806      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2807              Twisties Cheese Burger 250g        2      8.60       250
## 2808         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 2809   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2810            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2811  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2812              Twisties Cheese Burger 250g        2      8.60       250
## 2813            Pringles Mystery Flavour 134g        2      7.40       134
## 2814             Tostitos Splash Of Lime 175g        2      8.80       175
## 2815            Pringles Mystery Flavour 134g        2      7.40       134
## 2816    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2817            Pringles SourCream Onion 134g        2      7.40       134
## 2818    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2819     Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 2820      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2821            Grain Waves Sweet Chilli 210g        2      7.20       210
## 2822            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2823              Doritos Cheese Supreme 330g        2     11.40       330
## 2824                     Cheezels Cheese 330g        2     11.40       330
## 2825    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 2826    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2827            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2828  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2829            Pringles Original Crisps 134g        2      7.40       134
## 2830      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2831             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 2832      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2833            Pringles Mystery Flavour 134g        2      7.40       134
## 2834              Twisties Cheese Burger 250g        2      8.60       250
## 2835     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 2836                     Cheezels Cheese 330g        2     11.40       330
## 2837 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2838         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2839                     Cheezels Cheese 330g        2     11.40       330
## 2840 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2841          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2842 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2843 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2844 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2845            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2846 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2847         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 2848  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2849 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2850             Pringles Sweet&Spcy BBQ 134g        1      3.70       134
## 2851            Thins Chips Light& Tangy 175g        2      6.60       175
## 2852   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2853                     Twisties Chicken270g        2      9.20       270
## 2854                     Kettle Original 175g        2     10.80       175
## 2855             Tostitos Splash Of Lime 175g        2      8.80       175
## 2856                     Twisties Cheese 270g        2      9.20       270
## 2857                     Cheezels Cheese 330g        2     11.40       330
## 2858             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2859         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2860         Doritos Corn Chips Original 170g        2      8.80       170
## 2861            Pringles SourCream Onion 134g        2      7.40       134
## 2862              Doritos Cheese Supreme 330g        2     11.40       330
## 2863      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2864  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2865     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2866                     Kettle Original 175g        2     10.80       175
## 2867                 Pringles Slt Vingar 134g        2      7.40       134
## 2868         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2869                     Twisties Cheese 270g        2      9.20       270
## 2870      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2871   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2872         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2873                   Pringles Barbeque 134g        2      7.40       134
## 2874            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2875                   Pringles Barbeque 134g        2      7.40       134
## 2876 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2877                     Twisties Cheese 270g        2      9.20       270
## 2878                     Twisties Chicken270g        2      9.20       270
## 2879         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2880         Doritos Corn Chips Original 170g        2      8.80       170
## 2881             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 2882 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 2883     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2884              Twisties Cheese Burger 250g        2      8.60       250
## 2885 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2886  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2887                 Pringles Slt Vingar 134g        2      7.40       134
## 2888                 Pringles Slt Vingar 134g        2      7.40       134
## 2889                     Twisties Chicken270g        2      9.20       270
## 2890            Grain Waves Sweet Chilli 210g        2      7.20       210
## 2891  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2892      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2893    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 2894       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 2895                     Twisties Chicken270g        2      9.20       270
## 2896          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2897      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2898          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2899     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2900   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2901 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2902  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 2903            Pringles Original Crisps 134g        2      7.40       134
## 2904 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 2905 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2906                     Twisties Cheese 270g        2      9.20       270
## 2907      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2908   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2909             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2910                     Kettle Original 175g        2     10.80       175
## 2911 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2912     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2913   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 2914            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2915             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 2916  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2917 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 2918         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2919         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2920            Thins Chips Light& Tangy 175g        2      6.60       175
## 2921  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2922                   Pringles Barbeque 134g        2      7.40       134
## 2923     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2924             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2925            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2926       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 2927          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2928            Pringles Original Crisps 134g        2      7.40       134
## 2929             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2930            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 2931                 Pringles Slt Vingar 134g        2      7.40       134
## 2932      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2933             Tostitos Splash Of Lime 175g        2      8.80       175
## 2934         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2935                       Kettle Chilli 175g        2     10.80       175
## 2936                     Twisties Chicken270g        2      9.20       270
## 2937              Twisties Cheese Burger 250g        2      8.60       250
## 2938            Kettle Honey Soy Chicken 175g        2     10.80       175
## 2939  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2940                    Doritos Mexicana 170g        2      8.80       170
## 2941                     Kettle Original 175g        2     10.80       175
## 2942                     Twisties Cheese 270g        2      9.20       270
## 2943      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2944 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2945      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2946             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2947         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2948 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2949                   Pringles Barbeque 134g        2      7.40       134
## 2950                       Kettle Chilli 175g        2     10.80       175
## 2951              Doritos Cheese Supreme 330g        2     11.40       330
## 2952      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2953   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 2954            Grain Waves Sweet Chilli 210g        2      7.20       210
## 2955     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 2956            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2957     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2958  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 2959                 Pringles Slt Vingar 134g        2      7.40       134
## 2960      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 2961            Tostitos Smoked Chipotle 175g        2      8.80       175
## 2962     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 2963                       Kettle Chilli 175g        2     10.80       175
## 2964      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2965      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2966                 Pringles Slt Vingar 134g        2      7.40       134
## 2967             Tostitos Lightly Salted 175g        2      8.80       175
## 2968         Doritos Corn Chips Original 170g        2      8.80       170
## 2969             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 2970      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 2971            Pringles Mystery Flavour 134g        2      7.40       134
## 2972  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 2973            Pringles Mystery Flavour 134g        2      7.40       134
## 2974          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 2975       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 2976     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 2977                     Twisties Chicken270g        2      9.20       270
## 2978             Dorito Corn Chp Supreme 380g        2     13.00       380
## 2979     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2980         Pringles Chicken Salt Crips 134g        2      7.40       134
## 2981              Twisties Cheese Burger 250g        2      8.60       250
## 2982  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 2983      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 2984   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 2985                     Kettle Original 175g        2     10.80       175
## 2986            Pringles SourCream Onion 134g        2      7.40       134
## 2987 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 2988 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 2989     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2990                     Twisties Chicken270g        2      9.20       270
## 2991       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 2992    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 2993                    Doritos Mexicana 170g        2      8.80       170
## 2994            Thins Chips Light& Tangy 175g        1      3.30       175
## 2995         Thins Chips Seasonedchicken 175g        2      6.60       175
## 2996         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 2997     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 2998 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 2999                       Kettle Chilli 175g        2     10.80       175
## 3000   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3001   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3002         Doritos Corn Chips Original 170g        2      8.80       170
## 3003 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 3004    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3005   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3006    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3007              Doritos Cheese Supreme 330g        2     11.40       330
## 3008    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3009     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 3010 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 3011  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3012     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 3013         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 3014         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3015         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3016         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3017          Thins Chips Salt & Vinegar 175g        1      3.30       175
## 3018              Twisties Cheese Burger 250g        2      8.60       250
## 3019     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 3020   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3021             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3022      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 3023         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3024  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3025             Dorito Corn Chp Supreme 380g        2     13.00       380
## 3026         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3027         Doritos Corn Chips Original 170g        2      8.80       170
## 3028         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3029            Pringles SourCream Onion 134g        2      7.40       134
## 3030     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 3031     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3032         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 3033 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3034         Doritos Corn Chips Original 170g        2      8.80       170
## 3035 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3036          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 3037                       Kettle Chilli 175g        2     10.80       175
## 3038              Twisties Cheese Burger 250g        2      8.60       250
## 3039  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3040                     Twisties Cheese 270g        2      9.20       270
## 3041                       Kettle Chilli 175g        2     10.80       175
## 3042      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 3043   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3044    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3045   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3046          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 3047         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 3048      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 3049     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 3050                    Doritos Mexicana 170g        2      8.80       170
## 3051                       Kettle Chilli 175g        2     10.80       175
## 3052                     Cheezels Cheese 330g        2     11.40       330
## 3053            Thins Chips Light& Tangy 175g        2      6.60       175
## 3054     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3055    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3056 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3057                       Kettle Chilli 175g        2     10.80       175
## 3058  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3059            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3060          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 3061             Dorito Corn Chp Supreme 380g        2     13.00       380
## 3062 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 3063          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 3064                     Kettle Original 175g        2     10.80       175
## 3065  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3066  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3067                     Kettle Original 175g        2     10.80       175
## 3068 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3069    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3070         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3071      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 3072 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3073            Thins Chips Light& Tangy 175g        2      6.60       175
## 3074       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3075         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3076         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3077   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3078 Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 3079    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3080                     Kettle Original 175g        2     10.80       175
## 3081       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3082 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 3083                    Doritos Mexicana 170g        2      8.80       170
## 3084  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3085 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 3086                    Doritos Mexicana 170g        2      8.80       170
## 3087                   Pringles Barbeque 134g        2      7.40       134
## 3088             Tostitos Splash Of Lime 175g        2      8.80       175
## 3089      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 3090              Doritos Cheese Supreme 330g        2     11.40       330
## 3091             Tostitos Lightly Salted 175g        2      8.80       175
## 3092         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3093                   Pringles Barbeque 134g        2      7.40       134
## 3094         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3095            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3096 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3097  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3098            Thins Chips Light& Tangy 175g        2      6.60       175
## 3099     Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 3100  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3101 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3102     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 3103   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3104  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3105     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 3106         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3107    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3108             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3109         Doritos Corn Chips Original 170g        2      8.80       170
## 3110          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 3111   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3112             Smiths Crinkle Original 330g        2     11.40       330
## 3113         Doritos Corn Chips Original 170g        2      8.80       170
## 3114                     Twisties Cheese 270g        2      9.20       270
## 3115                    Doritos Mexicana 170g        2      8.80       170
## 3116              Doritos Cheese Supreme 330g        2     11.40       330
## 3117            Pringles SourCream Onion 134g        2      7.40       134
## 3118                     Cheezels Cheese 330g        2     11.40       330
## 3119            Pringles SourCream Onion 134g        2      7.40       134
## 3120            Pringles Mystery Flavour 134g        2      7.40       134
## 3121            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3122   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3123         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3124         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3125                     Cheezels Cheese 330g        2     11.40       330
## 3126             Dorito Corn Chp Supreme 380g        1      3.25       380
## 3127            Pringles Original Crisps 134g        2      7.40       134
## 3128                   Pringles Barbeque 134g        2      7.40       134
## 3129 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3130   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3131             Smiths Crinkle Original 330g        2     11.40       330
## 3132                     Twisties Cheese 270g        2      9.20       270
## 3133     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 3134       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3135  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3136 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3137             Smiths Crinkle Original 330g        2     11.40       330
## 3138  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3139     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 3140     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3141                     Twisties Cheese 270g        2      9.20       270
## 3142  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3143   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3144   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3145         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3146             Tostitos Splash Of Lime 175g        2      8.80       175
## 3147    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3148    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3149            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3150  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3151  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3152            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3153             Smiths Crinkle Original 330g        2     11.40       330
## 3154            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3155  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3156                     Twisties Chicken270g        2      9.20       270
## 3157                     Twisties Cheese 270g        2      9.20       270
## 3158  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3159         Doritos Corn Chips Original 170g        2      8.80       170
## 3160  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3161       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3162 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 3163              Doritos Cheese Supreme 330g        2     11.40       330
## 3164 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3165         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 3166      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 3167             Dorito Corn Chp Supreme 380g        2     13.00       380
## 3168  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3169         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3170 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 3171         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3172 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 3173            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3174              Doritos Cheese Supreme 330g        2     11.40       330
## 3175                       Kettle Chilli 175g        2     10.80       175
## 3176         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3177             Tostitos Lightly Salted 175g        2      8.80       175
## 3178       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3179             Dorito Corn Chp Supreme 380g        2     13.00       380
## 3180 Infuzions SourCream&Herbs Veg Strws 110g        1      3.80       110
## 3181             Tostitos Lightly Salted 175g        2      8.80       175
## 3182                     Twisties Chicken270g        2      9.20       270
## 3183            Pringles Mystery Flavour 134g        1      3.70       134
## 3184  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3185            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3186         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 3187              Doritos Cheese Supreme 330g        2     11.40       330
## 3188         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 3189                 Pringles Slt Vingar 134g        2      7.40       134
## 3190              Twisties Cheese Burger 250g        2      8.60       250
## 3191   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3192                       Kettle Chilli 175g        2     10.80       175
## 3193            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3194            Pringles Mystery Flavour 134g        2      7.40       134
## 3195         Pringles Chicken Salt Crips 134g        1      3.70       134
## 3196                 Pringles Slt Vingar 134g        2      7.40       134
## 3197  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3198            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3199         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3200   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3201     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3202   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3203              Twisties Cheese Burger 250g        2      8.60       250
## 3204       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3205  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3206            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3207            Grain Waves Sweet Chilli 210g        2      7.20       210
## 3208          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 3209   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3210 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3211                    Doritos Mexicana 170g        2      8.80       170
## 3212      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 3213            Pringles Mystery Flavour 134g        2      7.40       134
## 3214             Dorito Corn Chp Supreme 380g        2     13.00       380
## 3215            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3216                     Twisties Chicken270g        2      9.20       270
## 3217      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 3218    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3219  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3220             Tostitos Lightly Salted 175g        2      8.80       175
## 3221         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 3222       Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 3223       Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 3224  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3225  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3226         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 3227         Doritos Corn Chips Original 170g        2      8.80       170
## 3228             Tostitos Splash Of Lime 175g        2      8.80       175
## 3229         Doritos Corn Chips Original 170g        2      8.80       170
## 3230         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 3231  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3232     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3233   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3234                 Pringles Slt Vingar 134g        2      7.40       134
## 3235            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3236         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 3237         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3238         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3239     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3240  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3241 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3242 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3243            Pringles Mystery Flavour 134g        2      7.40       134
## 3244     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 3245      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 3246              Twisties Cheese Burger 250g        2      8.60       250
## 3247            Thins Chips Light& Tangy 175g        2      6.60       175
## 3248         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3249                     Cheezels Cheese 330g        2     11.40       330
## 3250      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 3251    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3252   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3253   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3254 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3255    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3256      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 3257            Thins Chips Light& Tangy 175g        2      6.60       175
## 3258             Smiths Crinkle Original 330g        2     11.40       330
## 3259                    Doritos Mexicana 170g        2      8.80       170
## 3260    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3261       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3262         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 3263     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3264                    Doritos Mexicana 170g        2      8.80       170
## 3265          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 3266             Smiths Crinkle Original 330g        2     11.40       330
## 3267              Doritos Cheese Supreme 330g        2     11.40       330
## 3268            Grain Waves Sweet Chilli 210g        1      3.60       210
## 3269  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3270     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 3271      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 3272 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3273   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3274                 Pringles Slt Vingar 134g        2      7.40       134
## 3275  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3276 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3277   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3278    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3279             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 3280         Doritos Corn Chips Original 170g        2      8.80       170
## 3281             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3282                     Kettle Original 175g        2     10.80       175
## 3283                     Cheezels Cheese 330g        2     11.40       330
## 3284                 Pringles Slt Vingar 134g        2      7.40       134
## 3285  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3286                     Cheezels Cheese 330g        2     11.40       330
## 3287             Tostitos Lightly Salted 175g        2      8.80       175
## 3288                     Cheezels Cheese 330g        2     11.40       330
## 3289  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3290 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3291 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3292      Thins Potato Chips Hot & Spicy 175g        1      3.30       175
## 3293     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3294    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3295 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 3296              Twisties Cheese Burger 250g        2      8.60       250
## 3297                       Kettle Chilli 175g        2     10.80       175
## 3298   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3299              Twisties Cheese Burger 250g        2      8.60       250
## 3300              Doritos Cheese Supreme 330g        2     11.40       330
## 3301    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3302             Dorito Corn Chp Supreme 380g        2     13.00       380
## 3303 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3304         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3305       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3306             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3307            Pringles Mystery Flavour 134g        2      7.40       134
## 3308       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3309   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3310   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3311    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3312     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3313  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3314    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3315              Twisties Cheese Burger 250g        2      8.60       250
## 3316      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 3317    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3318    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3319      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 3320             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3321                    Doritos Mexicana 170g        2      8.80       170
## 3322                       Kettle Chilli 175g        2     10.80       175
## 3323                     Cheezels Cheese 330g        2     11.40       330
## 3324                     Kettle Original 175g        2     10.80       175
## 3325         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3326         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3327             Tostitos Lightly Salted 175g        2      8.80       175
## 3328 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3329            Pringles Mystery Flavour 134g        2      7.40       134
## 3330  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3331  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3332 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 3333            Thins Chips Light& Tangy 175g        2      6.60       175
## 3334         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3335     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 3336             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3337                     Twisties Cheese 270g        2      9.20       270
## 3338    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3339 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3340   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3341  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3342      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 3343                   Pringles Barbeque 134g        2      7.40       134
## 3344            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3345  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3346 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 3347             Tostitos Splash Of Lime 175g        2      8.80       175
## 3348            Grain Waves Sweet Chilli 210g        2      7.20       210
## 3349             Tostitos Splash Of Lime 175g        2      8.80       175
## 3350            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3351             Tostitos Lightly Salted 175g        2      8.80       175
## 3352   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3353            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3354            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3355    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3356                   Pringles Barbeque 134g        2      7.40       134
## 3357         Doritos Corn Chips Original 170g        2      8.80       170
## 3358            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3359 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3360             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3361      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 3362                   Pringles Barbeque 134g        2      7.40       134
## 3363         Doritos Corn Chips Original 170g        2      8.80       170
## 3364      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 3365                     Kettle Original 175g        2     10.80       175
## 3366            Pringles SourCream Onion 134g        2      7.40       134
## 3367                   Pringles Barbeque 134g        2      7.40       134
## 3368         Doritos Corn Chips Original 170g        2      8.80       170
## 3369  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3370     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3371       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3372             Dorito Corn Chp Supreme 380g        2     13.00       380
## 3373             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3374   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3375 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3376 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 3377     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3378             Smiths Crinkle Original 330g        2     11.40       330
## 3379    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3380            Pringles Original Crisps 134g        2      7.40       134
## 3381  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3382            Pringles Original Crisps 134g        2      7.40       134
## 3383            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3384  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3385            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3386  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3387            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3388            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3389            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3390              Doritos Cheese Supreme 330g        2     11.40       330
## 3391                    Doritos Mexicana 170g        2      8.80       170
## 3392   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3393            Thins Chips Light& Tangy 175g        2      6.60       175
## 3394          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 3395             Tostitos Lightly Salted 175g        2      8.80       175
## 3396         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 3397                       Kettle Chilli 175g        2     10.80       175
## 3398     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 3399 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3400                   Pringles Barbeque 134g        3     11.10       134
## 3401     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3402  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3403       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3404                     Twisties Cheese 270g        2      9.20       270
## 3405            Thins Chips Light& Tangy 175g        2      6.60       175
## 3406            Pringles Mystery Flavour 134g        2      7.40       134
## 3407             Tostitos Splash Of Lime 175g        2      8.80       175
## 3408         Doritos Corn Chips Original 170g        2      8.80       170
## 3409 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3410         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3411                     Cheezels Cheese 330g        2     11.40       330
## 3412   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3413     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 3414    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3415              Twisties Cheese Burger 250g        2      8.60       250
## 3416             Tostitos Splash Of Lime 175g        2      8.80       175
## 3417    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3418             Dorito Corn Chp Supreme 380g        2     13.00       380
## 3419         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3420            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3421       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3422    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3423                   Pringles Barbeque 134g        2      7.40       134
## 3424            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3425            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3426      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 3427 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3428            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3429                     Kettle Original 175g        2     10.80       175
## 3430         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 3431  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3432              Twisties Cheese Burger 250g        1      4.30       250
## 3433            Pringles Mystery Flavour 134g        2      7.40       134
## 3434   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3435       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3436      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 3437            Pringles Mystery Flavour 134g        2      7.40       134
## 3438             Tostitos Lightly Salted 175g        2      8.80       175
## 3439   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3440         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 3441 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3442            Pringles Mystery Flavour 134g        2      7.40       134
## 3443      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 3444            Grain Waves Sweet Chilli 210g        2      7.20       210
## 3445                 Pringles Slt Vingar 134g        2      7.40       134
## 3446       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3447      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 3448            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3449      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 3450             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 3451       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3452                 Pringles Slt Vingar 134g        2      7.40       134
## 3453            Thins Chips Light& Tangy 175g        2      6.60       175
## 3454       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3455             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 3456             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 3457       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3458 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3459  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3460                       Kettle Chilli 175g        2     10.80       175
## 3461    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3462     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 3463                    Doritos Mexicana 170g        2      8.80       170
## 3464     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 3465             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 3466         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 3467            Pringles SourCream Onion 134g        2      7.40       134
## 3468     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3469 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 3470                     Twisties Chicken270g        2      9.20       270
## 3471  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3472  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3473 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3474                       Kettle Chilli 175g        2     10.80       175
## 3475             Smiths Crinkle Original 330g        2     11.40       330
## 3476         Doritos Corn Chips Original 170g        2      8.80       170
## 3477                     Twisties Cheese 270g        2      9.20       270
## 3478     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 3479             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3480            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3481 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3482             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 3483                    Doritos Mexicana 170g        2      8.80       170
## 3484  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3485             Smiths Crinkle Original 330g        2     11.40       330
## 3486       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3487            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3488 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 3489                     Cheezels Cheese 330g        1      5.70       330
## 3490  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3491         Doritos Corn Chips Original 170g        2      8.80       170
## 3492      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 3493             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3494    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3495            Pringles Original Crisps 134g        2      7.40       134
## 3496                     Twisties Cheese 270g        2      9.20       270
## 3497         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3498     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 3499  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3500         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 3501         Pringles Chicken Salt Crips 134g        1      3.70       134
## 3502            Pringles Original Crisps 134g        2      7.40       134
## 3503                       Kettle Chilli 175g        2     10.80       175
## 3504            Pringles Original Crisps 134g        2      7.40       134
## 3505   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3506       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3507    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3508            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3509            Pringles Original Crisps 134g        2      7.40       134
## 3510            Pringles Mystery Flavour 134g        2      7.40       134
## 3511 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3512 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3513   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3514  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3515             Dorito Corn Chp Supreme 380g        2     13.00       380
## 3516    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3517            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3518     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3519             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 3520 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3521  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3522         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3523  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3524            Pringles SourCream Onion 134g        2      7.40       134
## 3525  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3526             Dorito Corn Chp Supreme 380g        2     13.00       380
## 3527             Tostitos Splash Of Lime 175g        2      8.80       175
## 3528             Tostitos Lightly Salted 175g        2      8.80       175
## 3529         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3530         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 3531   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3532                     Twisties Chicken270g        3     13.80       270
## 3533             Tostitos Splash Of Lime 175g        2      8.80       175
## 3534 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3535                    Doritos Mexicana 170g        2      8.80       170
## 3536   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3537            Pringles Mystery Flavour 134g        2      7.40       134
## 3538            Thins Chips Light& Tangy 175g        2      6.60       175
## 3539            Pringles Original Crisps 134g        2      7.40       134
## 3540  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3541         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3542       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3543            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3544            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3545    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3546     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3547                    Doritos Mexicana 170g        2      8.80       170
## 3548    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3549         Doritos Corn Chips Original 170g        2      8.80       170
## 3550         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3551                   Pringles Barbeque 134g        2      7.40       134
## 3552 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3553            Grain Waves Sweet Chilli 210g        2      7.20       210
## 3554         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 3555             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 3556  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3557    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3558      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 3559                     Twisties Chicken270g        2      9.20       270
## 3560         Doritos Corn Chips Original 170g        2      8.80       170
## 3561         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 3562                    Doritos Mexicana 170g        2      8.80       170
## 3563             Smiths Crinkle Original 330g        2     11.40       330
## 3564                    Doritos Mexicana 170g        2      8.80       170
## 3565            Pringles SourCream Onion 134g        2      7.40       134
## 3566   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3567                     Twisties Cheese 270g        2      9.20       270
## 3568     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 3569   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3570     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 3571 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3572   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3573  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3574 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3575            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3576 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 3577             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3578         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3579   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3580 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 3581   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3582                     Twisties Chicken270g        2      9.20       270
## 3583   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3584  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3585  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3586                     Kettle Original 175g        2     10.80       175
## 3587 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 3588         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3589       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3590             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3591                     Cheezels Cheese 330g        2     11.40       330
## 3592            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3593            Pringles Original Crisps 134g        2      7.40       134
## 3594  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3595         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3596 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3597            Pringles Original Crisps 134g        2      7.40       134
## 3598   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3599                       Kettle Chilli 175g        2     10.80       175
## 3600    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3601   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3602         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3603       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3604    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3605 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3606      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 3607            Pringles Original Crisps 134g        2      7.40       134
## 3608     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 3609            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3610   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3611                 Pringles Slt Vingar 134g        2      7.40       134
## 3612  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3613                     Twisties Chicken270g        2      9.20       270
## 3614         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 3615       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3616  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3617 Kettle Tortilla ChpsHny&Jlpno Chili 150g        3     13.80       150
## 3618  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3619 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3620    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3621     Kettle Tortilla ChpsFeta&Garlic 150g        1      4.60       150
## 3622            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3623            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3624            Thins Chips Light& Tangy 175g        2      6.60       175
## 3625  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3626  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3627         Doritos Corn Chips Original 170g        2      8.80       170
## 3628             Smiths Crinkle Original 330g        2     11.40       330
## 3629                   Pringles Barbeque 134g        2      7.40       134
## 3630    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3631              Twisties Cheese Burger 250g        2      8.60       250
## 3632    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3633                     Twisties Cheese 270g        2      9.20       270
## 3634             Tostitos Lightly Salted 175g        2      8.80       175
## 3635            Thins Chips Light& Tangy 175g        2      6.60       175
## 3636     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3637             Tostitos Splash Of Lime 175g        2      8.80       175
## 3638            Grain Waves Sweet Chilli 210g        1      3.60       210
## 3639     Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 3640       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3641   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3642  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3643    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3644                     Kettle Original 175g        2     10.80       175
## 3645                   Pringles Barbeque 134g        2      7.40       134
## 3646 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3647     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 3648         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 3649         Doritos Corn Chips Original 170g        2      8.80       170
## 3650 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 3651                 Pringles Slt Vingar 134g        2      7.40       134
## 3652   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3653            Thins Chips Light& Tangy 175g        2      6.60       175
## 3654            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3655            Pringles Original Crisps 134g        2      7.40       134
## 3656 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3657                   Pringles Barbeque 134g        2      7.40       134
## 3658         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 3659                    Doritos Mexicana 170g        2      8.80       170
## 3660            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3661 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3662   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3663                    Doritos Mexicana 170g        2      8.80       170
## 3664 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3665                     Cheezels Cheese 330g        2     11.40       330
## 3666  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3667             Smiths Crinkle Original 330g        2     11.40       330
## 3668   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3669    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3670  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3671            Pringles Original Crisps 134g        1      3.70       134
## 3672             Dorito Corn Chp Supreme 380g        2     13.00       380
## 3673    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3674 Kettle Tortilla ChpsHny&Jlpno Chili 150g        1      4.60       150
## 3675            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3676 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3677            Thins Chips Light& Tangy 175g        2      6.60       175
## 3678                     Cheezels Cheese 330g        2     11.40       330
## 3679      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 3680                       Kettle Chilli 175g        2     10.80       175
## 3681                     Cheezels Cheese 330g        2     11.40       330
## 3682       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3683                       Kettle Chilli 175g        2     10.80       175
## 3684      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 3685 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3686             Tostitos Splash Of Lime 175g        2      8.80       175
## 3687            Pringles Original Crisps 134g        2      7.40       134
## 3688    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3689                     Cheezels Cheese 330g        2     11.40       330
## 3690             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 3691              Twisties Cheese Burger 250g        2      8.60       250
## 3692 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3693              Doritos Cheese Supreme 330g        2     11.40       330
## 3694 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3695            Pringles Mystery Flavour 134g        2      7.40       134
## 3696   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3697     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 3698         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3699            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3700                     Kettle Original 175g        2     10.80       175
## 3701             Dorito Corn Chp Supreme 380g        2     13.00       380
## 3702            Pringles SourCream Onion 134g        2      7.40       134
## 3703 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3704     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 3705            Pringles SourCream Onion 134g        2      7.40       134
## 3706  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3707 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3708  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3709      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 3710                     Twisties Chicken270g        2      9.20       270
## 3711         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3712    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3713            Grain Waves Sweet Chilli 210g        2      7.20       210
## 3714         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3715            Pringles SourCream Onion 134g        2      7.40       134
## 3716   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3717       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3718         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3719             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3720 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3721 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3722         Doritos Corn Chips Original 170g        2      8.80       170
## 3723 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 3724         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 3725         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3726         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3727         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 3728            Pringles SourCream Onion 134g        2      7.40       134
## 3729 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 3730    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3731     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 3732         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3733            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3734             Dorito Corn Chp Supreme 380g        2     13.00       380
## 3735       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3736   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3737            Grain Waves Sweet Chilli 210g        2      7.20       210
## 3738 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3739      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 3740         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3741      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 3742            Pringles Mystery Flavour 134g        2      7.40       134
## 3743         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3744            Pringles SourCream Onion 134g        2      7.40       134
## 3745         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3746 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3747             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3748            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3749       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3750            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3751    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3752  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3753                   Pringles Barbeque 134g        2      7.40       134
## 3754    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3755            Grain Waves Sweet Chilli 210g        1      3.60       210
## 3756            Pringles SourCream Onion 134g        2      7.40       134
## 3757            Pringles Mystery Flavour 134g        2      7.40       134
## 3758              Doritos Cheese Supreme 330g        2     11.40       330
## 3759         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3760                 Pringles Slt Vingar 134g        2      7.40       134
## 3761            Pringles SourCream Onion 134g        2      7.40       134
## 3762       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3763            Pringles SourCream Onion 134g        2      7.40       134
## 3764   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3765  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3766  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3767 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 3768   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3769            Pringles SourCream Onion 134g        2      7.40       134
## 3770         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 3771  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3772             Dorito Corn Chp Supreme 380g        2     13.00       380
## 3773             Dorito Corn Chp Supreme 380g        2     13.00       380
## 3774  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3775                     Twisties Chicken270g        2      9.20       270
## 3776  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3777   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3778             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 3779             Tostitos Splash Of Lime 175g        2      8.80       175
## 3780            Grain Waves Sweet Chilli 210g        2      7.20       210
## 3781            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3782   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3783 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 3784              Doritos Cheese Supreme 330g        2     11.40       330
## 3785     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3786            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3787            Pringles Mystery Flavour 134g        2      7.40       134
## 3788     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3789    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3790    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3791            Pringles SourCream Onion 134g        2      7.40       134
## 3792       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3793   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3794            Grain Waves Sweet Chilli 210g        1      3.60       210
## 3795            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3796 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3797   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3798   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3799    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3800    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3801      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 3802  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3803  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3804                     Twisties Chicken270g        2      9.20       270
## 3805 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3806  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3807                     Kettle Original 175g        2     10.80       175
## 3808            Pringles Mystery Flavour 134g        1      3.70       134
## 3809  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3810             Tostitos Lightly Salted 175g        2      8.80       175
## 3811                     Kettle Original 175g        2     10.80       175
## 3812 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 3813            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3814                   Pringles Barbeque 134g        2      7.40       134
## 3815            Pringles Original Crisps 134g        2      7.40       134
## 3816            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3817         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 3818     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 3819                     Twisties Chicken270g        2      9.20       270
## 3820             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3821         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 3822         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 3823     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 3824   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3825              Twisties Cheese Burger 250g        2      8.60       250
## 3826              Twisties Cheese Burger 250g        2      8.60       250
## 3827  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 3828            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3829              Doritos Cheese Supreme 330g        2     11.40       330
## 3830 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3831   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3832 Kettle Tortilla ChpsHny&Jlpno Chili 150g        1      4.60       150
## 3833  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3834      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 3835             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3836            Pringles Original Crisps 134g        2      7.40       134
## 3837         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3838                     Twisties Chicken270g        2      9.20       270
## 3839         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 3840       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3841                   Pringles Barbeque 134g        2      7.40       134
## 3842    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3843                     Twisties Cheese 270g        2      9.20       270
## 3844            Thins Chips Light& Tangy 175g        2      6.60       175
## 3845      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 3846  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3847             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 3848                     Twisties Chicken270g        2      9.20       270
## 3849                   Pringles Barbeque 134g        2      7.40       134
## 3850 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3851                     Twisties Cheese 270g        2      9.20       270
## 3852 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 3853             Smiths Crinkle Original 330g        2     11.40       330
## 3854       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3855  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3856              Doritos Cheese Supreme 330g        2     11.40       330
## 3857                       Kettle Chilli 175g        2     10.80       175
## 3858                     Twisties Chicken270g        2      9.20       270
## 3859    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3860   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3861            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3862                 Pringles Slt Vingar 134g        2      7.40       134
## 3863  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3864          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 3865       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3866              Doritos Cheese Supreme 330g        2     11.40       330
## 3867   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3868      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 3869             Tostitos Splash Of Lime 175g        2      8.80       175
## 3870 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3871            Pringles Original Crisps 134g        2      7.40       134
## 3872         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3873             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 3874            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3875             Tostitos Splash Of Lime 175g        2      8.80       175
## 3876         Doritos Corn Chips Original 170g        2      8.80       170
## 3877      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 3878            Grain Waves Sweet Chilli 210g        2      7.20       210
## 3879     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3880  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3881             Tostitos Lightly Salted 175g        2      8.80       175
## 3882       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3883 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 3884             Smiths Crinkle Original 330g        2     11.40       330
## 3885            Pringles Mystery Flavour 134g        2      7.40       134
## 3886 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3887            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3888                     Cheezels Cheese 330g        2     11.40       330
## 3889         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 3890                     Twisties Chicken270g        1      4.60       270
## 3891    Smiths Crnkle Chip Orgnl Big Bag 380g        3     17.70       380
## 3892                 Pringles Slt Vingar 134g        2      7.40       134
## 3893                     Twisties Cheese 270g        2      9.20       270
## 3894                   Pringles Barbeque 134g        2      7.40       134
## 3895 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 3896  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 3897                     Kettle Original 175g        2     10.80       175
## 3898             Tostitos Splash Of Lime 175g        2      8.80       175
## 3899       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 3900                     Twisties Cheese 270g        2      9.20       270
## 3901            Thins Chips Light& Tangy 175g        2      6.60       175
## 3902       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3903 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3904         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3905             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 3906       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3907            Thins Chips Light& Tangy 175g        2      6.60       175
## 3908         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3909                     Cheezels Cheese 330g        2     11.40       330
## 3910                    Doritos Mexicana 170g        2      8.80       170
## 3911            Grain Waves Sweet Chilli 210g        2      7.20       210
## 3912             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 3913            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3914 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 3915                     Cheezels Cheese 330g        2     11.40       330
## 3916                   Pringles Barbeque 134g        1      3.70       134
## 3917         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3918     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 3919                     Cheezels Cheese 330g        2     11.40       330
## 3920         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3921       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3922              Twisties Cheese Burger 250g        2      8.60       250
## 3923      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 3924   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3925 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3926              Doritos Cheese Supreme 330g        2     11.40       330
## 3927          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 3928                 Pringles Slt Vingar 134g        2      7.40       134
## 3929    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3930 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3931                   Pringles Barbeque 134g        2      7.40       134
## 3932     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3933 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 3934            Thins Chips Light& Tangy 175g        2      6.60       175
## 3935                       Kettle Chilli 175g        2     10.80       175
## 3936                     Twisties Chicken270g        2      9.20       270
## 3937     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3938            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3939            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3940   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3941       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3942                   Pringles Barbeque 134g        2      7.40       134
## 3943    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3944         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3945   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3946                 Pringles Slt Vingar 134g        2      7.40       134
## 3947                    Doritos Mexicana 170g        2      8.80       170
## 3948     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3949   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3950    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 3951         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3952      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 3953                     Twisties Cheese 270g        2      9.20       270
## 3954              Doritos Cheese Supreme 330g        2     11.40       330
## 3955            Pringles SourCream Onion 134g        2      7.40       134
## 3956            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3957    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3958 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3959                     Twisties Cheese 270g        2      9.20       270
## 3960    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3961     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3962              Doritos Cheese Supreme 330g        2     11.40       330
## 3963  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 3964         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 3965             Tostitos Lightly Salted 175g        2      8.80       175
## 3966         Pringles Chicken Salt Crips 134g        2      7.40       134
## 3967    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 3968            Tostitos Smoked Chipotle 175g        2      8.80       175
## 3969            Pringles Original Crisps 134g        2      7.40       134
## 3970   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3971   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3972  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 3973         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3974 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3975    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 3976                     Cheezels Cheese 330g        2     11.40       330
## 3977       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 3978                       Kettle Chilli 175g        2     10.80       175
## 3979              Twisties Cheese Burger 250g        2      8.60       250
## 3980   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 3981     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3982 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 3983     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 3984          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 3985   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 3986                       Kettle Chilli 175g        2     10.80       175
## 3987         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 3988 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 3989            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 3990            Pringles Mystery Flavour 134g        2      7.40       134
## 3991            Kettle Honey Soy Chicken 175g        2     10.80       175
## 3992   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 3993              Twisties Cheese Burger 250g        2      8.60       250
## 3994          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 3995              Twisties Cheese Burger 250g        2      8.60       250
## 3996     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 3997                     Twisties Cheese 270g        2      9.20       270
## 3998         Thins Chips Seasonedchicken 175g        2      6.60       175
## 3999      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4000            Kettle Honey Soy Chicken 175g        2     10.80       175
## 4001 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 4002         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 4003    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 4004                     Twisties Cheese 270g        2      9.20       270
## 4005         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 4006            Thins Chips Light& Tangy 175g        2      6.60       175
## 4007             Tostitos Splash Of Lime 175g        2      8.80       175
## 4008                       Kettle Chilli 175g        2     10.80       175
## 4009             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 4010  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 4011 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 4012                 Pringles Slt Vingar 134g        2      7.40       134
## 4013         Pringles Chicken Salt Crips 134g        2      7.40       134
## 4014             Tostitos Splash Of Lime 175g        2      8.80       175
## 4015         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 4016             Tostitos Splash Of Lime 175g        2      8.80       175
## 4017 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 4018  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 4019            Pringles Mystery Flavour 134g        2      7.40       134
## 4020     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 4021                     Twisties Cheese 270g        2      9.20       270
## 4022            Grain Waves Sweet Chilli 210g        2      7.20       210
## 4023          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 4024              WW Crinkle Cut Chicken 175g        2      3.40       175
## 4025                       Cheetos Puffs 165g        2      5.60       165
## 4026             WW Crinkle Cut Original 175g        2      3.40       175
## 4027                     Kettle Original 175g        2     10.80       175
## 4028     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 4029       Smiths Thinly Swt Chli&S/Cream175G        2      6.00       175
## 4030                 Pringles Slt Vingar 134g        2      7.40       134
## 4031                     Twisties Cheese 270g        2      9.20       270
## 4032                 Cheezels Cheese Box 125g        2      4.20       125
## 4033          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4034   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 4035          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 4036                    CCs Tasty Cheese 175g        2      4.20       175
## 4037            Pringles Original Crisps 134g        2      7.40       134
## 4038      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 4039                   RRD Lime & Pepper 165g        2      6.00       165
## 4040                     Cheezels Cheese 330g        2     11.40       330
## 4041           French Fries Potato Chips 175g        2      6.00       175
## 4042        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 4043   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 4044 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 4045              Doritos Cheese Supreme 330g        2     11.40       330
## 4046     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 4047  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 4048            Grain Waves Sweet Chilli 210g        2      7.20       210
## 4049     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 4050          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 4051    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 4052    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 4053        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 4054  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 4055          Natural Chip Compny SeaSalt175g        2      6.00       175
## 4056      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4057     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 4058                     Twisties Chicken270g        2      9.20       270
## 4059       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 4060       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 4061   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 4062    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 4063      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 4064      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4065      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 4066             Tostitos Lightly Salted 175g        2      8.80       175
## 4067    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 4068  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 4069  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 4070          Natural Chip Compny SeaSalt175g        2      6.00       175
## 4071     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 4072     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 4073           WW Original Stacked Chips 160g        2      3.80       160
## 4074      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 4075   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 4076      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 4077             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 4078            Pringles Original Crisps 134g        2      7.40       134
## 4079                        Burger Rings 220g        2      4.60       220
## 4080  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 4081            Grain Waves Sweet Chilli 210g        2      7.20       210
## 4082    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 4083     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 4084             RRD Steak & Chimuchurri 150g        2      5.40       150
## 4085  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 4086                     Twisties Chicken270g        2      9.20       270
## 4087        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 4088   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 4089            Kettle Honey Soy Chicken 175g        2     10.80       175
## 4090            Pringles SourCream Onion 134g        2      7.40       134
## 4091                 RRD Chilli& Coconut 150g        2      5.40       150
## 4092 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 4093                   Pringles Barbeque 134g        2      7.40       134
## 4094     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 4095      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4096   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 4097  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 4098   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 4099 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 4100 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 4101                    Doritos Mexicana 170g        2      8.80       170
## 4102      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 4103            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 4104           Thins Chips Originl saltd 175g        2      6.60       175
## 4105 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 4106            Pringles Original Crisps 134g        2      7.40       134
## 4107  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 4108     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 4109                   Pringles Barbeque 134g        2      7.40       134
## 4110   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 4111              WW Crinkle Cut Chicken 175g        2      3.40       175
## 4112      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4113                    CCs Nacho Cheese 175g        2      4.20       175
## 4114        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 4115      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4116                     Twisties Chicken270g        2      9.20       270
## 4117                       Kettle Chilli 175g        2     10.80       175
## 4118                    CCs Tasty Cheese 175g        2      4.20       175
## 4119                    CCs Nacho Cheese 175g        2      4.20       175
## 4120       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 4121       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 4122            Pringles Mystery Flavour 134g        2      7.40       134
## 4123             Tostitos Splash Of Lime 175g        1      4.40       175
## 4124                     RRD Pc Sea Salt 165g        2      6.00       165
## 4125                    CCs Nacho Cheese 175g        2      4.20       175
## 4126   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 4127            Thins Chips Light& Tangy 175g        2      6.60       175
## 4128    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 4129             Smiths Crinkle Original 330g        2     11.40       330
## 4130             WW Crinkle Cut Original 175g        2      3.40       175
## 4131            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 4132        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 4133    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 4134            Pringles Mystery Flavour 134g        2      7.40       134
## 4135   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 4136    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 4137              Twisties Cheese Burger 250g        2      8.60       250
## 4138         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 4139                   RRD Lime & Pepper 165g        2      6.00       165
## 4140            Pringles SourCream Onion 134g        2      7.40       134
## 4141                 RRD Chilli& Coconut 150g        2      5.40       150
## 4142              Doritos Cheese Supreme 330g        2     11.40       330
## 4143    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 4144    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 4145            Pringles Original Crisps 134g        2      7.40       134
## 4146     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 4147          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 4148    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 4149    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 4150         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 4151                     RRD Pc Sea Salt 165g        2      6.00       165
## 4152           WW Original Stacked Chips 160g        2      3.80       160
## 4153  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 4154         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 4155             Dorito Corn Chp Supreme 380g        2     13.00       380
## 4156            Tostitos Smoked Chipotle 175g        2      8.80       175
## 4157      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 4158                        CCs Original 175g        2      4.20       175
## 4159                 Cheezels Cheese Box 125g        2      4.20       125
## 4160    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 4161          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 4162            Pringles Mystery Flavour 134g        2      7.40       134
## 4163      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 4164         Pringles Chicken Salt Crips 134g        2      7.40       134
## 4165     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 4166          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4167 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 4168    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 4169   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 4170                    Doritos Mexicana 170g        2      8.80       170
## 4171            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 4172            Thins Chips Light& Tangy 175g        2      6.60       175
## 4173      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 4174    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 4175  Doritos Corn Chip Mexican Jalapeno 150g        1      3.90       150
## 4176                 RRD Chilli& Coconut 150g        2      5.40       150
## 4177      Smith Crinkle Cut Mac N Cheese 150g        2      5.20       150
## 4178            Pringles Mystery Flavour 134g        2      7.40       134
## 4179             Smiths Crinkle Original 330g        2     11.40       330
## 4180 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 4181                    CCs Nacho Cheese 175g        2      4.20       175
## 4182      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4183                   Pringles Barbeque 134g        2      7.40       134
## 4184                 RRD Chilli& Coconut 150g        2      5.40       150
## 4185    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 4186              WW Crinkle Cut Chicken 175g        2      3.40       175
## 4187                        Burger Rings 220g        2      4.60       220
## 4188      Smith Crinkle Cut Mac N Cheese 150g        2      5.20       150
## 4189           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 4190                   RRD Lime & Pepper 165g        2      6.00       165
## 4191          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 4192  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 4193          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 4194                 RRD Chilli& Coconut 150g        1      2.70       150
## 4195                 RRD Chilli& Coconut 150g        2      5.40       150
## 4196            Grain Waves Sweet Chilli 210g        2      7.20       210
## 4197            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 4198      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 4199              Doritos Cheese Supreme 330g        1      5.70       330
## 4200         Doritos Corn Chips Original 170g        2      8.80       170
## 4201     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 4202 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 4203   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 4204    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 4205               RRD Honey Soy Chicken 165g        2      6.00       165
## 4206     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 4207         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 4208                     Kettle Original 175g        1      5.40       175
## 4209      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 4210           French Fries Potato Chips 175g        2      6.00       175
## 4211    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 4212           French Fries Potato Chips 175g        2      6.00       175
## 4213      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 4214              Doritos Cheese Supreme 330g        2     11.40       330
## 4215                 Pringles Slt Vingar 134g        2      7.40       134
## 4216            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 4217             Smiths Crinkle Original 330g        2     11.40       330
## 4218            Pringles Original Crisps 134g        2      7.40       134
## 4219                       Cheetos Puffs 165g        2      5.60       165
## 4220    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 4221               RRD Honey Soy Chicken 165g        2      6.00       165
## 4222            Pringles Mystery Flavour 134g        2      7.40       134
## 4223    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 4224                       Kettle Chilli 175g        2     10.80       175
## 4225      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 4226      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 4227                     RRD Pc Sea Salt 165g        2      6.00       165
## 4228     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 4229             Dorito Corn Chp Supreme 380g        2     13.00       380
## 4230    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 4231             RRD Steak & Chimuchurri 150g        2      5.40       150
## 4232    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 4233   Smiths Crinkle Cut Chips Barbecue 170g        2      5.80       170
## 4234      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 4235     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 4236        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 4237            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 4238      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4239             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 4240     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 4241            Pringles Mystery Flavour 134g        2      7.40       134
## 4242     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 4243 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 4244      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 4245              WW Original Corn Chips 200g        2      3.80       200
## 4246          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4247         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 4248   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 4249                 Pringles Slt Vingar 134g        2      7.40       134
## 4250     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 4251     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 4252   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 4253                    CCs Nacho Cheese 175g        2      4.20       175
## 4254            Pringles Original Crisps 134g        2      7.40       134
## 4255                   Pringles Barbeque 134g        2      7.40       134
## 4256                    CCs Nacho Cheese 175g        2      4.20       175
## 4257            Grain Waves Sweet Chilli 210g        2      7.20       210
## 4258      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4259    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 4260              WW Crinkle Cut Chicken 175g        1      1.70       175
## 4261             Tostitos Lightly Salted 175g        2      8.80       175
## 4262      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 4263  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 4264                       Kettle Chilli 175g        2     10.80       175
## 4265               RRD Honey Soy Chicken 165g        2      6.00       165
## 4266            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 4267     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 4268      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4269          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4270                 RRD Chilli& Coconut 150g        2      5.40       150
## 4271    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 4272 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 4273                     Twisties Cheese 270g        2      9.20       270
## 4274           WW Original Stacked Chips 160g        2      3.80       160
## 4275            Grain Waves Sweet Chilli 210g        2      7.20       210
## 4276           WW Original Stacked Chips 160g        2      3.80       160
## 4277              Doritos Cheese Supreme 330g        2     11.40       330
## 4278  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 4279             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 4280      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4281            Grain Waves Sweet Chilli 210g        2      7.20       210
## 4282       Smiths Crinkle Cut Snag&Sauce 150g        2      5.20       150
## 4283 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 4284 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 4285        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 4286        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 4287                    Doritos Mexicana 170g        2      8.80       170
## 4288  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 4289         Pringles Chicken Salt Crips 134g        2      7.40       134
## 4290                 Pringles Slt Vingar 134g        2      7.40       134
## 4291    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 4292         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 4293                       Kettle Chilli 175g        2     10.80       175
## 4294                  RRD Salt & Vinegar 165g        2      6.00       165
## 4295                    CCs Nacho Cheese 175g        2      4.20       175
## 4296                 Cheezels Cheese Box 125g        2      4.20       125
## 4297     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 4298               RRD Honey Soy Chicken 165g        2      6.00       165
## 4299              Doritos Cheese Supreme 330g        2     11.40       330
## 4300          Natural Chip Compny SeaSalt175g        2      6.00       175
## 4301                 RRD Chilli& Coconut 150g        2      5.40       150
## 4302                   Pringles Barbeque 134g        2      7.40       134
## 4303    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 4304      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 4305           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 4306             Dorito Corn Chp Supreme 380g        2     13.00       380
## 4307          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4308      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 4309    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 4310 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 4311 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 4312           WW Original Stacked Chips 160g        2      3.80       160
## 4313            Pringles SourCream Onion 134g        2      7.40       134
## 4314             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 4315     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 4316    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 4317                       Kettle Chilli 175g        2     10.80       175
## 4318          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4319   Smiths Crinkle Cut Chips Barbecue 170g        2      5.80       170
## 4320              Doritos Cheese Supreme 330g        2     11.40       330
## 4321   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 4322                     Twisties Cheese 270g        2      9.20       270
## 4323     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 4324                 Cheezels Cheese Box 125g        2      4.20       125
## 4325    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 4326                 RRD Chilli& Coconut 150g        2      5.40       150
## 4327    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 4328           Thins Chips Originl saltd 175g        2      6.60       175
## 4329 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 4330      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 4331         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 4332                       Cheetos Puffs 165g        2      5.60       165
## 4333               RRD Honey Soy Chicken 165g        2      6.00       165
## 4334                 RRD Chilli& Coconut 150g        2      5.40       150
## 4335 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 4336         Doritos Corn Chips Original 170g        2      8.80       170
## 4337     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 4338                    Doritos Mexicana 170g        2      8.80       170
## 4339  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 4340             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 4341                     Twisties Cheese 270g        2      9.20       270
## 4342           WW Original Stacked Chips 160g        2      3.80       160
## 4343             Tostitos Lightly Salted 175g        2      8.80       175
## 4344    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 4345             WW Crinkle Cut Original 175g        2      3.40       175
## 4346           Thins Chips Originl saltd 175g        2      6.60       175
## 4347      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 4348                    CCs Nacho Cheese 175g        2      4.20       175
## 4349   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 4350              Doritos Cheese Supreme 330g        2     11.40       330
## 4351                    CCs Tasty Cheese 175g        2      4.20       175
## 4352      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 4353  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 4354     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 4355                     Twisties Cheese 270g        2      9.20       270
## 4356      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 4357                     Twisties Cheese 270g        2      9.20       270
## 4358                     Twisties Chicken270g        2      9.20       270
## 4359                 RRD Chilli& Coconut 150g        2      5.40       150
## 4360           French Fries Potato Chips 175g        2      6.00       175
## 4361                   RRD Lime & Pepper 165g        2      6.00       165
## 4362                   Pringles Barbeque 134g        2      7.40       134
## 4363  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 4364                   Pringles Barbeque 134g        2      7.40       134
## 4365                     Kettle Original 175g        2     10.80       175
## 4366               RRD Honey Soy Chicken 165g        2      6.00       165
## 4367            Pringles SourCream Onion 134g        2      7.40       134
## 4368   Doritos Corn Chips Cheese Supreme 170g        5     22.00       170
## 4369      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4370                  RRD Salt & Vinegar 165g        2      6.00       165
## 4371            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 4372 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 4373       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 4374           Thins Chips Originl saltd 175g        2      6.60       175
## 4375                     Kettle Original 175g        2     10.80       175
## 4376             Tostitos Lightly Salted 175g        2      8.80       175
## 4377                     Cheezels Cheese 330g        2     11.40       330
## 4378      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 4379      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 4380                     Twisties Cheese 270g        4     18.40       270
## 4381         Kettle Sea Salt And Vinegar 175g        1      5.40       175
## 4382    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 4383                    CCs Nacho Cheese 175g        2      4.20       175
## 4384    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 4385     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 4386            Kettle Honey Soy Chicken 175g        2     10.80       175
## 4387             Tostitos Lightly Salted 175g        2      8.80       175
## 4388     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 4389   Smiths Crinkle Cut Chips Barbecue 170g        2      5.80       170
## 4390 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 4391     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 4392    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 4393            Grain Waves Sweet Chilli 210g        2      7.20       210
## 4394   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 4395    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 4396                     RRD Pc Sea Salt 165g        2      6.00       165
## 4397           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 4398           French Fries Potato Chips 175g        2      6.00       175
## 4399             Woolworths Cheese Rings 190g        2      3.60       190
## 4400                    CCs Nacho Cheese 175g        2      4.20       175
## 4401      Kettle Sensations Siracha Lime 150g        1      4.60       150
## 4402             Smiths Crinkle Original 330g        2     11.40       330
## 4403      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 4404           Thins Chips Originl saltd 175g        2      6.60       175
## 4405       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 4406            Tostitos Smoked Chipotle 175g        2      8.80       175
## 4407                    Doritos Mexicana 170g        2      8.80       170
## 4408             WW Crinkle Cut Original 175g        2      3.40       175
## 4409                       Cheetos Puffs 165g        2      5.60       165
## 4410               RRD Honey Soy Chicken 165g        2      6.00       165
## 4411        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 4412       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 4413 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 4414  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 4415     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 4416            Pringles Mystery Flavour 134g        2      7.40       134
## 4417  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 4418                     Twisties Cheese 270g        2      9.20       270
## 4419            Tostitos Smoked Chipotle 175g        2      8.80       175
## 4420       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 4421                    CCs Tasty Cheese 175g        2      4.20       175
## 4422    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 4423     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 4424            Pringles SourCream Onion 134g        2      7.40       134
## 4425    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 4426                     Twisties Cheese 270g        2      9.20       270
## 4427    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 4428 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 4429  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 4430          Natural Chip Compny SeaSalt175g        2      6.00       175
## 4431       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 4432     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 4433      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4434 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 4435 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 4436                     Kettle Original 175g        2     10.80       175
## 4437    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 4438            Thins Chips Light& Tangy 175g        2      6.60       175
## 4439               RRD Honey Soy Chicken 165g        2      6.00       165
## 4440     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 4441        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 4442             Smiths Crinkle Original 330g        2     11.40       330
## 4443    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 4444              Twisties Cheese Burger 250g        2      8.60       250
## 4445     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 4446       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 4447   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 4448    Smiths Chip Thinly CutSalt/Vinegr175g        5     15.00       175
## 4449             Woolworths Cheese Rings 190g        2      3.60       190
## 4450     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 4451            Tostitos Smoked Chipotle 175g        2      8.80       175
## 4452      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 4453        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 4454                     Cheezels Cheese 330g        2     11.40       330
## 4455            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 4456         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 4457             Dorito Corn Chp Supreme 380g        2     13.00       380
## 4458           French Fries Potato Chips 175g        2      6.00       175
## 4459             Tostitos Splash Of Lime 175g        2      8.80       175
## 4460         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 4461                     Kettle Original 175g        2     10.80       175
## 4462          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 4463  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 4464     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 4465             Tostitos Lightly Salted 175g        2      8.80       175
## 4466   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 4467            Tostitos Smoked Chipotle 175g        2      8.80       175
## 4468       Smiths Crinkle Cut Snag&Sauce 150g        2      5.20       150
## 4469      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 4470   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 4471      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4472      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 4473      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 4474       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 4475          Natural Chip Compny SeaSalt175g        2      6.00       175
## 4476                     Twisties Cheese 270g        2      9.20       270
## 4477           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 4478                     RRD Pc Sea Salt 165g        2      6.00       165
## 4479     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 4480      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4481      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 4482      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4483                       Kettle Chilli 175g        2     10.80       175
## 4484         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 4485       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 4486     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 4487              Doritos Cheese Supreme 330g        2     11.40       330
## 4488             Woolworths Cheese Rings 190g        2      3.60       190
## 4489            Pringles SourCream Onion 134g        2      7.40       134
## 4490 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 4491                 Pringles Slt Vingar 134g        2      7.40       134
## 4492                    Doritos Mexicana 170g        2      8.80       170
## 4493     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 4494 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 4495    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 4496     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 4497    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 4498    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 4499    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 4500            Pringles SourCream Onion 134g        2      7.40       134
## 4501                        Burger Rings 220g        2      4.60       220
## 4502        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 4503    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 4504            Pringles SourCream Onion 134g        2      7.40       134
## 4505   Smiths Crinkle Cut Chips Original 170g        2      5.80       170
## 4506    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 4507              WW Crinkle Cut Chicken 175g        2      3.40       175
## 4508  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 4509                     RRD Pc Sea Salt 165g        2      6.00       165
## 4510 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 4511   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 4512      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 4513   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 4514      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 4515      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4516          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4517     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 4518             Kettle 135g Swt Pot Sea Salt        1      4.20       135
## 4519           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 4520     Kettle Tortilla ChpsFeta&Garlic 150g        1      4.60       150
## 4521                 Cheezels Cheese Box 125g        2      4.20       125
## 4522     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 4523         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 4524       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 4525                   RRD Lime & Pepper 165g        2      6.00       165
## 4526                   RRD Lime & Pepper 165g        2      6.00       165
## 4527          Natural Chip Compny SeaSalt175g        2      6.00       175
## 4528            Kettle Honey Soy Chicken 175g        2     10.80       175
## 4529              WW Original Corn Chips 200g        2      3.80       200
## 4530           Thins Chips Originl saltd 175g        2      6.60       175
## 4531     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 4532     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 4533                     Kettle Original 175g        2     10.80       175
## 4534                     Cheezels Cheese 330g        2     11.40       330
## 4535     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 4536        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 4537             Woolworths Cheese Rings 190g        2      3.60       190
## 4538                    CCs Tasty Cheese 175g        2      4.20       175
## 4539    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 4540              WW Original Corn Chips 200g        2      3.80       200
## 4541                    CCs Tasty Cheese 175g        2      4.20       175
## 4542             WW Crinkle Cut Original 175g        2      3.40       175
## 4543          Natural Chip Compny SeaSalt175g        2      6.00       175
## 4544      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4545            Pringles Mystery Flavour 134g        2      7.40       134
## 4546                       Cheetos Puffs 165g        2      5.60       165
## 4547            Pringles Original Crisps 134g        2      7.40       134
## 4548            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 4549    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 4550   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 4551         Doritos Corn Chips Original 170g        2      8.80       170
## 4552            Thins Chips Light& Tangy 175g        2      6.60       175
## 4553       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 4554                   Pringles Barbeque 134g        2      7.40       134
## 4555      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 4556          Natural Chip Compny SeaSalt175g        2      6.00       175
## 4557    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 4558       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 4559         Doritos Corn Chips Original 170g        2      8.80       170
## 4560            Thins Chips Light& Tangy 175g        2      6.60       175
## 4561             Tostitos Lightly Salted 175g        2      8.80       175
## 4562            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 4563      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 4564         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 4565             Woolworths Cheese Rings 190g        2      3.60       190
## 4566            Pringles SourCream Onion 134g        2      7.40       134
## 4567       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 4568   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 4569    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 4570       Smiths Thinly Swt Chli&S/Cream175G        2      6.00       175
## 4571       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 4572      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 4573        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 4574                     Twisties Chicken270g        2      9.20       270
## 4575       Smiths Thinly Swt Chli&S/Cream175G        2      6.00       175
## 4576            Pringles Mystery Flavour 134g        2      7.40       134
## 4577     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 4578       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 4579      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 4580            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 4581                     Twisties Cheese 270g        2      9.20       270
## 4582                     RRD Pc Sea Salt 165g        2      6.00       165
## 4583      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 4584             Tostitos Splash Of Lime 175g        2      8.80       175
## 4585   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 4586     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 4587                     RRD Pc Sea Salt 165g        2      6.00       165
## 4588             Dorito Corn Chp Supreme 380g        2     13.00       380
## 4589    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 4590            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 4591     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 4592             Tostitos Splash Of Lime 175g        2      8.80       175
## 4593           Thins Chips Originl saltd 175g        2      6.60       175
## 4594                    CCs Nacho Cheese 175g        2      4.20       175
## 4595    Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 4596                       Cheetos Puffs 165g        2      5.60       165
## 4597        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 4598     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 4599    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 4600               RRD Honey Soy Chicken 165g        2      6.00       165
## 4601                     Twisties Chicken270g        2      9.20       270
## 4602   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 4603            Pringles SourCream Onion 134g        2      7.40       134
## 4604     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 4605           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 4606              Twisties Cheese Burger 250g        2      8.60       250
## 4607            Grain Waves Sweet Chilli 210g        2      7.20       210
## 4608            Pringles Original Crisps 134g        2      7.40       134
## 4609 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 4610     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 4611       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 4612     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 4613             RRD Steak & Chimuchurri 150g        2      5.40       150
## 4614    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 4615            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 4616            Grain Waves Sweet Chilli 210g        2      7.20       210
## 4617 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 4618  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 4619            Kettle Honey Soy Chicken 175g        2     10.80       175
## 4620              Twisties Cheese Burger 250g        2      8.60       250
## 4621  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 4622  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 4623               RRD Honey Soy Chicken 165g        2      6.00       165
## 4624             RRD Steak & Chimuchurri 150g        2      5.40       150
## 4625            Tostitos Smoked Chipotle 175g        2      8.80       175
## 4626            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 4627    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 4628            Pringles Mystery Flavour 134g        2      7.40       134
## 4629        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 4630         Thins Chips Seasonedchicken 175g        2      6.60       175
## 4631    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 4632   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 4633            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 4634         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 4635                    CCs Nacho Cheese 175g        2      4.20       175
## 4636    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 4637      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 4638   Smiths Crinkle Cut Chips Barbecue 170g        2      5.80       170
## 4639 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 4640    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 4641            Pringles SourCream Onion 134g        2      7.40       134
## 4642              Doritos Cheese Supreme 330g        2     11.40       330
## 4643   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 4644               RRD Honey Soy Chicken 165g        2      6.00       165
## 4645            Pringles Mystery Flavour 134g        2      7.40       134
## 4646            Pringles Mystery Flavour 134g        3     11.10       134
## 4647    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 4648                     Twisties Chicken270g        2      9.20       270
## 4649 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 4650     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 4651     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 4652               RRD Honey Soy Chicken 165g        2      6.00       165
## 4653                     Kettle Original 175g        1      5.40       175
## 4654    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 4655 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 4656                   RRD Lime & Pepper 165g        2      6.00       165
## 4657                        Burger Rings 220g        2      4.60       220
## 4658  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 4659            Grain Waves Sweet Chilli 210g        2      7.20       210
## 4660  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 4661                    Doritos Mexicana 170g        2      8.80       170
## 4662              WW Crinkle Cut Chicken 175g        2      3.40       175
## 4663           Thins Chips Originl saltd 175g        2      6.60       175
## 4664    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 4665              Doritos Cheese Supreme 330g        2     11.40       330
## 4666       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 4667            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 4668         Pringles Chicken Salt Crips 134g        2      7.40       134
## 4669 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 4670              WW Crinkle Cut Chicken 175g        2      3.40       175
## 4671       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 4672                     Twisties Chicken270g        1      4.60       270
## 4673      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 4674      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 4675    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 4676  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 4677   Smiths Crinkle Cut Chips Original 170g        2      5.80       170
## 4678   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 4679     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 4680    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 4681        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 4682                   Pringles Barbeque 134g        2      7.40       134
## 4683             Tostitos Lightly Salted 175g        2      8.80       175
## 4684           French Fries Potato Chips 175g        2      6.00       175
## 4685    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 4686    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 4687    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 4688             Tostitos Splash Of Lime 175g        2      8.80       175
## 4689                     Cheezels Cheese 330g        2     11.40       330
## 4690            Pringles SourCream Onion 134g        2      7.40       134
## 4691           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 4692      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 4693     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 4694          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4695   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 4696      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4697     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 4698   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 4699    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 4700       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 4701       Smiths Crinkle Cut Snag&Sauce 150g        2      5.20       150
## 4702     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 4703    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 4704 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 4705              Doritos Cheese Supreme 330g        2     11.40       330
## 4706                     Twisties Chicken270g        2      9.20       270
## 4707                       Cheetos Puffs 165g        2      5.60       165
## 4708 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 4709    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 4710            Grain Waves Sweet Chilli 210g        2      7.20       210
## 4711        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 4712             Smiths Crinkle Original 330g        1      5.70       330
## 4713   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 4714         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 4715                       Cheetos Puffs 165g        2      5.60       165
## 4716             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 4717             Tostitos Lightly Salted 175g        2      8.80       175
## 4718       Smiths Thinly Swt Chli&S/Cream175G        2      6.00       175
## 4719      Smith Crinkle Cut Mac N Cheese 150g        2      5.20       150
## 4720         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 4721             Tostitos Splash Of Lime 175g        2      8.80       175
## 4722         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 4723    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 4724            Pringles Original Crisps 134g        2      7.40       134
## 4725              Doritos Cheese Supreme 330g        2     11.40       330
## 4726   Smiths Crinkle Cut Chips Original 170g        2      5.80       170
## 4727             WW Crinkle Cut Original 175g        2      3.40       175
## 4728              Twisties Cheese Burger 250g        2      8.60       250
## 4729            Pringles Mystery Flavour 134g        2      7.40       134
## 4730            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 4731             Tostitos Lightly Salted 175g        2      8.80       175
## 4732                   RRD Lime & Pepper 165g        2      6.00       165
## 4733    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 4734     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 4735         Doritos Corn Chips Original 170g        2      8.80       170
## 4736      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 4737                    CCs Tasty Cheese 175g        2      4.20       175
## 4738  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 4739      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 4740                 Pringles Slt Vingar 134g        2      7.40       134
## 4741            Grain Waves Sweet Chilli 210g        2      7.20       210
## 4742        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 4743             Smiths Crinkle Original 330g        2     11.40       330
## 4744                 RRD Chilli& Coconut 150g        2      5.40       150
## 4745 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 4746       Smiths Thinly Swt Chli&S/Cream175G        2      6.00       175
## 4747             Tostitos Lightly Salted 175g        2      8.80       175
## 4748 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 4749     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 4750                    CCs Nacho Cheese 175g        2      4.20       175
## 4751 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 4752             Tostitos Lightly Salted 175g        2      8.80       175
## 4753    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 4754    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 4755    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 4756           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 4757  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 4758          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4759             Tostitos Lightly Salted 175g        2      8.80       175
## 4760            Pringles SourCream Onion 134g        2      7.40       134
## 4761      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4762      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 4763             Dorito Corn Chp Supreme 380g        2     13.00       380
## 4764                  RRD Salt & Vinegar 165g        2      6.00       165
## 4765            Tostitos Smoked Chipotle 175g        2      8.80       175
## 4766    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 4767     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 4768          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4769              Twisties Cheese Burger 250g        2      8.60       250
## 4770  Doritos Corn Chip Mexican Jalapeno 150g        1      3.90       150
## 4771           WW Original Stacked Chips 160g        2      3.80       160
## 4772            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 4773             Dorito Corn Chp Supreme 380g        2     13.00       380
## 4774                  RRD Salt & Vinegar 165g        2      6.00       165
## 4775         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 4776          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4777     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 4778 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 4779      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 4780  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 4781 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 4782    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 4783    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 4784   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 4785        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 4786             Dorito Corn Chp Supreme 380g        2     13.00       380
## 4787  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 4788          Natural Chip Compny SeaSalt175g        2      6.00       175
## 4789    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 4790     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 4791 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 4792      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 4793            Pringles Original Crisps 134g        2      7.40       134
## 4794   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 4795           WW Original Stacked Chips 160g        2      3.80       160
## 4796  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 4797    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 4798                        Burger Rings 220g        2      4.60       220
## 4799     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 4800  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 4801   Smiths Crinkle Cut Chips Barbecue 170g        2      5.80       170
## 4802     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 4803   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 4804             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 4805  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 4806                 Cheezels Cheese Box 125g        2      4.20       125
## 4807       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 4808      NCC Sour Cream & Garden Chives 175g        1      3.00       175
## 4809          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4810          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 4811            Pringles Original Crisps 134g        2      7.40       134
## 4812      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4813       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 4814                     Twisties Cheese 270g        2      9.20       270
## 4815             Smiths Crinkle Original 330g        2     11.40       330
## 4816              WW Crinkle Cut Chicken 175g        2      3.40       175
## 4817              WW Original Corn Chips 200g        2      3.80       200
## 4818         Pringles Chicken Salt Crips 134g        2      7.40       134
## 4819   Smiths Crinkle Cut Chips Original 170g        2      5.80       170
## 4820    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 4821           French Fries Potato Chips 175g        2      6.00       175
## 4822   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 4823      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 4824      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 4825                 RRD Chilli& Coconut 150g        2      5.40       150
## 4826             Woolworths Cheese Rings 190g        2      3.60       190
## 4827     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 4828             Dorito Corn Chp Supreme 380g        2     13.00       380
## 4829   Infzns Crn Crnchers Tangy Gcamole 110g        1      3.80       110
## 4830  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 4831    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 4832      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 4833   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 4834  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 4835     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 4836     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 4837          Natural Chip Compny SeaSalt175g        2      6.00       175
## 4838            Grain Waves Sweet Chilli 210g        2      7.20       210
## 4839            Pringles Original Crisps 134g        2      7.40       134
## 4840             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 4841      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 4842    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 4843                 Cheezels Cheese Box 125g        2      4.20       125
## 4844 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 4845  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 4846 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 4847                 RRD Chilli& Coconut 150g        2      5.40       150
## 4848           Thins Chips Originl saltd 175g        2      6.60       175
## 4849         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 4850            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 4851          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4852                 Pringles Slt Vingar 134g        2      7.40       134
## 4853                     Twisties Cheese 270g        2      9.20       270
## 4854     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 4855            Tostitos Smoked Chipotle 175g        2      8.80       175
## 4856                 Pringles Slt Vingar 134g        2      7.40       134
## 4857    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 4858            Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 4859       Smiths Crinkle Cut Snag&Sauce 150g        2      5.20       150
## 4860                 RRD Chilli& Coconut 150g        2      5.40       150
## 4861     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 4862         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 4863 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 4864        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 4865            Pringles SourCream Onion 134g        2      7.40       134
## 4866            Thins Chips Light& Tangy 175g        2      6.60       175
## 4867               RRD Honey Soy Chicken 165g        2      6.00       165
## 4868     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 4869                  RRD Salt & Vinegar 165g        2      6.00       165
## 4870       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 4871             Smiths Crinkle Original 330g        2     11.40       330
## 4872          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4873                     RRD Pc Sea Salt 165g        2      6.00       165
## 4874         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 4875                    CCs Nacho Cheese 175g        2      4.20       175
## 4876                   RRD Lime & Pepper 165g        2      6.00       165
## 4877          Natural Chip Compny SeaSalt175g        2      6.00       175
## 4878   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 4879       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 4880   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 4881  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 4882         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 4883          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4884                     Twisties Cheese 270g        2      9.20       270
## 4885  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 4886     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 4887     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 4888  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 4889   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 4890         Pringles Chicken Salt Crips 134g        2      7.40       134
## 4891                    CCs Tasty Cheese 175g        2      4.20       175
## 4892                    CCs Tasty Cheese 175g        2      4.20       175
## 4893    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 4894                 RRD Chilli& Coconut 150g        4     10.80       150
## 4895             Tostitos Splash Of Lime 175g        2      8.80       175
## 4896          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4897      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 4898                        CCs Original 175g        2      4.20       175
## 4899                    CCs Nacho Cheese 175g        2      4.20       175
## 4900            Grain Waves Sweet Chilli 210g        1      3.60       210
## 4901             Tostitos Splash Of Lime 175g        2      8.80       175
## 4902            Tostitos Smoked Chipotle 175g        2      8.80       175
## 4903    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 4904              Twisties Cheese Burger 250g        2      8.60       250
## 4905   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 4906      Smith Crinkle Cut Mac N Cheese 150g        2      5.20       150
## 4907           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 4908      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 4909   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 4910       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 4911       Smiths Thinly Swt Chli&S/Cream175G        2      6.00       175
## 4912     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 4913            Grain Waves Sweet Chilli 210g        2      7.20       210
## 4914 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 4915            Kettle Honey Soy Chicken 175g        2     10.80       175
## 4916                   Pringles Barbeque 134g        2      7.40       134
## 4917            Pringles Original Crisps 134g        2      7.40       134
## 4918     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 4919       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 4920             Dorito Corn Chp Supreme 380g        2     13.00       380
## 4921      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 4922             Dorito Corn Chp Supreme 380g        2     13.00       380
## 4923          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 4924   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 4925            Tostitos Smoked Chipotle 175g        2      8.80       175
## 4926            Thins Chips Light& Tangy 175g        2      6.60       175
## 4927           Thins Chips Originl saltd 175g        2      6.60       175
## 4928 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 4929      Smith Crinkle Cut Mac N Cheese 150g        2      5.20       150
## 4930            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 4931                       Kettle Chilli 175g        2     10.80       175
## 4932             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 4933                    CCs Tasty Cheese 175g        2      4.20       175
## 4934   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 4935             Tostitos Lightly Salted 175g        2      8.80       175
## 4936              WW Original Corn Chips 200g        2      3.80       200
## 4937          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4938                       Cheetos Puffs 165g        2      5.60       165
## 4939   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 4940  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 4941           WW Original Stacked Chips 160g        2      3.80       160
## 4942    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 4943      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 4944                       Kettle Chilli 175g        2     10.80       175
## 4945         Thins Chips Seasonedchicken 175g        2      6.60       175
## 4946    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 4947   Smiths Crinkle Cut Chips Barbecue 170g        2      5.80       170
## 4948      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 4949               RRD Honey Soy Chicken 165g        2      6.00       165
## 4950       Smiths Thinly Swt Chli&S/Cream175G        2      6.00       175
## 4951 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 4952        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 4953      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 4954             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 4955                  RRD Salt & Vinegar 165g        2      6.00       165
## 4956                 Cheezels Cheese Box 125g        2      4.20       125
## 4957    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 4958                     Twisties Chicken270g        2      9.20       270
## 4959           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 4960         Doritos Corn Chips Original 170g        2      8.80       170
## 4961            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 4962                        Burger Rings 220g        2      4.60       220
## 4963           WW Original Stacked Chips 160g        2      3.80       160
## 4964          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 4965            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 4966                       Cheetos Puffs 165g        2      5.60       165
## 4967   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 4968     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 4969                    CCs Tasty Cheese 175g        2      4.20       175
## 4970   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 4971             Tostitos Splash Of Lime 175g        2      8.80       175
## 4972             Tostitos Lightly Salted 175g        2      8.80       175
## 4973   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 4974   Smiths Crinkle Cut Chips Original 170g        2      5.80       170
## 4975          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 4976                     RRD Pc Sea Salt 165g        2      6.00       165
## 4977        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 4978  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 4979                       Kettle Chilli 175g        2     10.80       175
## 4980      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 4981            Kettle Honey Soy Chicken 175g        2     10.80       175
## 4982              WW Original Corn Chips 200g        2      3.80       200
## 4983         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 4984           Thins Chips Originl saltd 175g        2      6.60       175
## 4985      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 4986         Doritos Corn Chips Original 170g        2      8.80       170
## 4987                     Kettle Original 175g        2     10.80       175
## 4988       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 4989       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 4990  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 4991          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 4992                   RRD Lime & Pepper 165g        2      6.00       165
## 4993 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 4994              Doritos Cheese Supreme 330g        2     11.40       330
## 4995             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 4996    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 4997                 RRD Chilli& Coconut 150g        2      5.40       150
## 4998      Smith Crinkle Cut Mac N Cheese 150g        2      5.20       150
## 4999            Pringles SourCream Onion 134g        2      7.40       134
## 5000    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 5001    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 5002                 Cheezels Cheese Box 125g        2      4.20       125
## 5003             Tostitos Splash Of Lime 175g        2      8.80       175
## 5004 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 5005            Thins Chips Light& Tangy 175g        2      6.60       175
## 5006     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 5007         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 5008              Doritos Cheese Supreme 330g        2     11.40       330
## 5009                    CCs Nacho Cheese 175g        2      4.20       175
## 5010             RRD Steak & Chimuchurri 150g        2      5.40       150
## 5011       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 5012         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 5013                       Cheetos Puffs 165g        2      5.60       165
## 5014                 Pringles Slt Vingar 134g        2      7.40       134
## 5015     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 5016             Dorito Corn Chp Supreme 380g        2     13.00       380
## 5017          Natural Chip Compny SeaSalt175g        2      6.00       175
## 5018           WW Original Stacked Chips 160g        2      3.80       160
## 5019      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 5020                    CCs Nacho Cheese 175g        2      4.20       175
## 5021                   RRD Lime & Pepper 165g        2      6.00       165
## 5022 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 5023    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 5024      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 5025            Kettle Honey Soy Chicken 175g        2     10.80       175
## 5026         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 5027   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 5028            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 5029            Pringles SourCream Onion 134g        2      7.40       134
## 5030                    Doritos Mexicana 170g        2      8.80       170
## 5031             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 5032  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 5033         Pringles Chicken Salt Crips 134g        2      7.40       134
## 5034     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 5035               RRD Honey Soy Chicken 165g        2      6.00       165
## 5036              Twisties Cheese Burger 250g        2      8.60       250
## 5037 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 5038   Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 5039           Thins Chips Originl saltd 175g        2      6.60       175
## 5040   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 5041                     Cheezels Cheese 330g        2     11.40       330
## 5042              WW Crinkle Cut Chicken 175g        2      3.40       175
## 5043    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 5044                  RRD Salt & Vinegar 165g        2      6.00       165
## 5045      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 5046                   RRD Lime & Pepper 165g        2      6.00       165
## 5047            Pringles SourCream Onion 134g        2      7.40       134
## 5048             RRD Steak & Chimuchurri 150g        2      5.40       150
## 5049            Pringles Original Crisps 134g        2      7.40       134
## 5050      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 5051      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 5052        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 5053                        Burger Rings 220g        2      4.60       220
## 5054         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 5055   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 5056         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 5057             RRD Steak & Chimuchurri 150g        2      5.40       150
## 5058            Kettle Honey Soy Chicken 175g        2     10.80       175
## 5059            Pringles Original Crisps 134g        2      7.40       134
## 5060             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 5061              WW Crinkle Cut Chicken 175g        2      3.40       175
## 5062         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 5063     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 5064     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 5065     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 5066   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 5067        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 5068                    Doritos Mexicana 170g        2      8.80       170
## 5069          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 5070              Twisties Cheese Burger 250g        2      8.60       250
## 5071     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 5072 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 5073           WW Original Stacked Chips 160g        2      3.80       160
## 5074    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 5075                  RRD Salt & Vinegar 165g        2      6.00       165
## 5076                       Cheetos Puffs 165g        2      5.60       165
## 5077 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 5078            Pringles SourCream Onion 134g        2      7.40       134
## 5079      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 5080 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 5081                     RRD Pc Sea Salt 165g        2      6.00       165
## 5082   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 5083            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 5084            Tostitos Smoked Chipotle 175g        2      8.80       175
## 5085   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 5086        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 5087   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 5088 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 5089    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 5090            Pringles SourCream Onion 134g        2      7.40       134
## 5091     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 5092   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 5093                    CCs Nacho Cheese 175g        2      4.20       175
## 5094                     Cheezels Cheese 330g        2     11.40       330
## 5095                 Cheezels Cheese Box 125g        2      4.20       125
## 5096 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 5097            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 5098                        Burger Rings 220g        2      4.60       220
## 5099     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 5100            Kettle Honey Soy Chicken 175g        2     10.80       175
## 5101             Woolworths Cheese Rings 190g        2      3.60       190
## 5102                    CCs Tasty Cheese 175g        2      4.20       175
## 5103                  RRD Salt & Vinegar 165g        2      6.00       165
## 5104                     Twisties Cheese 270g        2      9.20       270
## 5105     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 5106    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 5107   Smiths Crinkle Cut Chips Original 170g        2      5.80       170
## 5108            Grain Waves Sweet Chilli 210g        2      7.20       210
## 5109      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 5110    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 5111       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 5112            Grain Waves Sweet Chilli 210g        1      3.60       210
## 5113                    CCs Nacho Cheese 175g        2      4.20       175
## 5114  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 5115      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 5116                    Doritos Mexicana 170g        2      8.80       170
## 5117   Smiths Crinkle Cut Chips Original 170g        2      5.80       170
## 5118       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 5119   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 5120       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 5121             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 5122   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 5123         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 5124             WW Crinkle Cut Original 175g        2      3.40       175
## 5125    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 5126                 Cheezels Cheese Box 125g        2      4.20       125
## 5127           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 5128    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 5129             Tostitos Splash Of Lime 175g        2      8.80       175
## 5130              Twisties Cheese Burger 250g        2      8.60       250
## 5131          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 5132       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 5133              WW Original Corn Chips 200g        2      3.80       200
## 5134            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 5135     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 5136             Dorito Corn Chp Supreme 380g        2     13.00       380
## 5137    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 5138  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 5139    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 5140                     RRD Pc Sea Salt 165g        2      6.00       165
## 5141     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 5142                 RRD Chilli& Coconut 150g        2      5.40       150
## 5143        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 5144                     Twisties Chicken270g        2      9.20       270
## 5145  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 5146          Natural Chip Compny SeaSalt175g        2      6.00       175
## 5147        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 5148       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 5149      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 5150    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 5151       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 5152              Twisties Cheese Burger 250g        2      8.60       250
## 5153      Smith Crinkle Cut Mac N Cheese 150g        2      5.20       150
## 5154    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 5155     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 5156             Smiths Crinkle Original 330g        2     11.40       330
## 5157                     Twisties Chicken270g        2      9.20       270
## 5158    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 5159              Doritos Cheese Supreme 330g        2     11.40       330
## 5160             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 5161            Pringles Mystery Flavour 134g        2      7.40       134
## 5162       Smiths Crinkle Cut Snag&Sauce 150g        2      5.20       150
## 5163                 Pringles Slt Vingar 134g        2      7.40       134
## 5164             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 5165                       Cheetos Puffs 165g        2      5.60       165
## 5166   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 5167                    Doritos Mexicana 170g        2      8.80       170
## 5168         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 5169     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 5170    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 5171                     Twisties Chicken270g        2      9.20       270
## 5172  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 5173         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 5174          Thins Chips Salt & Vinegar 175g        1      3.30       175
## 5175  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 5176    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 5177  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 5178       Smiths Crinkle Cut Snag&Sauce 150g        2      5.20       150
## 5179                   Pringles Barbeque 134g        2      7.40       134
## 5180                     Cheezels Cheese 330g        2     11.40       330
## 5181         Doritos Corn Chips Original 170g        2      8.80       170
## 5182                     Cheezels Cheese 330g        2     11.40       330
## 5183            Thins Chips Light& Tangy 175g        2      6.60       175
## 5184              WW Crinkle Cut Chicken 175g        2      3.40       175
## 5185     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 5186                     Cheezels Cheese 330g        2     11.40       330
## 5187    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 5188   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 5189     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 5190                     Twisties Cheese 270g        2      9.20       270
## 5191       Smiths Crinkle Cut Snag&Sauce 150g        4     10.40       150
## 5192    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 5193         Doritos Corn Chips Original 170g        2      8.80       170
## 5194         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 5195            Thins Chips Light& Tangy 175g        2      6.60       175
## 5196   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 5197    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 5198  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 5199    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 5200  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 5201             WW Crinkle Cut Original 175g        2      3.40       175
## 5202   Smiths Crinkle Cut Salt & Vinegar 170g        1      2.90       170
## 5203             RRD Steak & Chimuchurri 150g        2      5.40       150
## 5204      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 5205           WW Original Stacked Chips 160g        2      3.80       160
## 5206                     Cheezels Cheese 330g        2     11.40       330
## 5207    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 5208                     Twisties Cheese 270g        2      9.20       270
## 5209           WW Original Stacked Chips 160g        2      3.80       160
## 5210      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 5211                     Kettle Original 175g        2     10.80       175
## 5212    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 5213                 RRD Chilli& Coconut 150g        2      5.40       150
## 5214  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 5215     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 5216 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 5217            Pringles Mystery Flavour 134g        2      7.40       134
## 5218                 Pringles Slt Vingar 134g        2      7.40       134
## 5219      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 5220           French Fries Potato Chips 175g        2      6.00       175
## 5221                       Kettle Chilli 175g        2     10.80       175
## 5222 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 5223                     Twisties Chicken270g        2      9.20       270
## 5224       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 5225            Thins Chips Light& Tangy 175g        2      6.60       175
## 5226    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 5227 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 5228    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 5229 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 5230                    Doritos Mexicana 170g        2      8.80       170
## 5231      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 5232             Tostitos Splash Of Lime 175g        2      8.80       175
## 5233     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 5234    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 5235                     Twisties Cheese 270g        2      9.20       270
## 5236    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 5237     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 5238          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 5239      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 5240            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 5241                        Burger Rings 220g        2      4.60       220
## 5242                 RRD Chilli& Coconut 150g        1      2.70       150
## 5243         Kettle Sea Salt And Vinegar 175g        1      5.40       175
## 5244      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 5245      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 5246  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 5247 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 5248    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 5249         Doritos Corn Chips Original 170g        2      8.80       170
## 5250 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 5251                    CCs Nacho Cheese 175g        1      2.10       175
## 5252                  RRD Salt & Vinegar 165g        2      6.00       165
## 5253    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 5254   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 5255 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 5256           WW Original Stacked Chips 160g        2      3.80       160
## 5257       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 5258     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 5259                     Twisties Cheese 270g        2      9.20       270
## 5260    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 5261  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 5262                     RRD Pc Sea Salt 165g        2      6.00       165
## 5263      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 5264     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 5265                 RRD Chilli& Coconut 150g        2      5.40       150
## 5266           WW Original Stacked Chips 160g        2      3.80       160
## 5267  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 5268                   Pringles Barbeque 134g        2      7.40       134
## 5269    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 5270        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 5271                       Kettle Chilli 175g        2     10.80       175
## 5272   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 5273              WW Crinkle Cut Chicken 175g        2      3.40       175
## 5274           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 5275                     Twisties Chicken270g        1      4.60       270
## 5276                 RRD Chilli& Coconut 150g        2      5.40       150
## 5277   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 5278                  RRD Salt & Vinegar 165g        1      3.00       165
## 5279                        CCs Original 175g        2      4.20       175
## 5280         Pringles Chicken Salt Crips 134g        1      3.70       134
## 5281    Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 5282            Pringles SourCream Onion 134g        2      7.40       134
## 5283         Pringles Chicken Salt Crips 134g        2      7.40       134
## 5284      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 5285   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 5286                   Pringles Barbeque 134g        2      7.40       134
## 5287  Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 5288          RRD SR Slow Rst Pork Belly 150g        1      2.70       150
## 5289       Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 5290            Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 5291         Pringles Chicken Salt Crips 134g        1      3.70       134
## 5292         Doritos Corn Chips Original 170g        2      8.80       170
## 5293      Red Rock Deli Thai Chilli&Lime 150g        1      2.70       150
## 5294     Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 5295     Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 5296         Pringles Chicken Salt Crips 134g        2      7.40       134
## 5297  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 5298  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 5299            Pringles SourCream Onion 134g        2      7.40       134
## 5300             Smiths Crinkle Original 330g        1      5.70       330
## 5301            WW D/Style Chip Sea Salt 200g        1      1.90       200
## 5302   Smiths Crinkle Cut Chips Chs&Onion170g        1      2.90       170
## 5303   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 5304            Kettle Honey Soy Chicken 175g        1      5.40       175
## 5305 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 5306   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 5307       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 5308             RRD Steak & Chimuchurri 150g        1      2.70       150
## 5309                    CCs Nacho Cheese 175g        1      2.10       175
## 5310    Sunbites Whlegrn Crisps Frch/Onin 90g        1      1.70        90
## 5311                     Cheezels Cheese 330g        1      5.70       330
## 5312    Cobs Popd Sour Crm &Chives Chips 110g        1      3.80       110
## 5313                    Doritos Mexicana 170g        1      4.40       170
## 5314    Natural ChipCo Sea Salt & Vinegr 175g        1      3.00       175
## 5315      Natural Chip Co Tmato Hrb&Spce 175g        1      3.00       175
## 5316           Thins Chips Originl saltd 175g        2      6.60       175
## 5317      Kettle Sensations Siracha Lime 150g        1      4.60       150
## 5318              Doritos Cheese Supreme 330g        1      5.70       330
## 5319     Smiths Thinly Cut Roast Chicken 175g        1      3.00       175
## 5320        Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 5321                        Burger Rings 220g        2      4.60       220
## 5322       Smiths Thinly Swt Chli&S/Cream175G        1      3.00       175
## 5323      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 5324    Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 5325     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 5326                     Twisties Cheese 270g        1      4.60       270
## 5327       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 5328    Smiths Chip Thinly S/Cream&Onion 175g        1      3.00       175
## 5329                    CCs Nacho Cheese 175g        1      2.10       175
## 5330             Tostitos Splash Of Lime 175g        1      4.40       175
## 5331             Kettle 135g Swt Pot Sea Salt        1      4.20       135
## 5332         Doritos Corn Chips Original 170g        1      4.40       170
## 5333       RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 5334                    CCs Nacho Cheese 175g        1      2.10       175
## 5335             RRD Steak & Chimuchurri 150g        1      2.70       150
## 5336      Smith Crinkle Cut Mac N Cheese 150g        1      2.60       150
## 5337            Pringles Mystery Flavour 134g        2      7.40       134
## 5338 Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 5339                   Pringles Barbeque 134g        1      3.70       134
## 5340 Infuzions Thai SweetChili PotatoMix 110g        1      3.80       110
## 5341       RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 5342            Kettle Honey Soy Chicken 175g        2     10.80       175
## 5343            Tostitos Smoked Chipotle 175g        1      4.40       175
## 5344            Pringles SourCream Onion 134g        2      7.40       134
## 5345    Red Rock Deli Chikn&Garlic Aioli 150g        1      2.70       150
## 5346            Pringles Mystery Flavour 134g        2      7.40       134
## 5347 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        1      3.80       110
## 5348                     RRD Pc Sea Salt 165g        2      6.00       165
## 5349              WW Original Corn Chips 200g        1      1.90       200
## 5350           WW Original Stacked Chips 160g        1      1.90       160
## 5351            Grain Waves Sweet Chilli 210g        1      3.60       210
## 5352        Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 5353    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 5354                   RRD Lime & Pepper 165g        1      3.00       165
## 5355              WW Original Corn Chips 200g        1      1.90       200
## 5356 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 5357             WW Crinkle Cut Original 175g        2      3.40       175
## 5358    Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 5359                   RRD Lime & Pepper 165g        1      3.00       165
## 5360             Tostitos Splash Of Lime 175g        1      4.40       175
## 5361           WW Original Stacked Chips 160g        1      1.90       160
## 5362       Smiths Crinkle Cut Snag&Sauce 150g        1      2.60       150
## 5363                    CCs Tasty Cheese 175g        1      2.10       175
## 5364         Kettle Sea Salt And Vinegar 175g        1      5.40       175
## 5365             Tostitos Splash Of Lime 175g        2      8.80       175
## 5366                     RRD Pc Sea Salt 165g        2      6.00       165
## 5367       RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 5368    Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 5369 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 5370      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 5371              Doritos Cheese Supreme 330g        1      5.70       330
## 5372          Natural Chip Compny SeaSalt175g        1      3.00       175
## 5373         Thins Chips Seasonedchicken 175g        2      6.60       175
## 5374         Doritos Corn Chips Original 170g        1      4.40       170
## 5375     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 5376 Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 5377              WW Original Corn Chips 200g        1      1.90       200
## 5378            Thins Chips Light& Tangy 175g        1      3.30       175
## 5379     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 5380            Thins Chips Light& Tangy 175g        2      6.60       175
## 5381             Dorito Corn Chp Supreme 380g        1      6.50       380
## 5382                     Twisties Chicken270g        1      4.60       270
## 5383            Kettle Honey Soy Chicken 175g        2     10.80       175
## 5384      Kettle Sensations Siracha Lime 150g        1      4.60       150
## 5385     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        3      5.10        90
## 5386             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 5387                     RRD Pc Sea Salt 165g        1      3.00       165
## 5388   Infzns Crn Crnchers Tangy Gcamole 110g        1      3.80       110
## 5389   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 5390     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 5391            Tostitos Smoked Chipotle 175g        2      8.80       175
## 5392     Smiths Chip Thinly Cut Original 175g        1      3.00       175
## 5393      Kettle Sensations Siracha Lime 150g        1      4.60       150
## 5394    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 5395     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 5396   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 5397    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 5398 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 5399      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 5400             WW Crinkle Cut Original 175g        2      3.40       175
## 5401             Tostitos Lightly Salted 175g        1      4.40       175
## 5402              Twisties Cheese Burger 250g        1      4.30       250
## 5403                 Cheezels Cheese Box 125g        1      2.10       125
## 5404                        CCs Original 175g        1      2.10       175
## 5405            Thins Chips Light& Tangy 175g        1      3.30       175
## 5406       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 5407            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 5408              WW Crinkle Cut Chicken 175g        1      1.70       175
## 5409     Smiths Chip Thinly Cut Original 175g        1      3.00       175
## 5410                        Burger Rings 220g        1      2.30       220
## 5411                   Pringles Barbeque 134g        1      3.70       134
## 5412  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 5413     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 5414    Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 5415   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 5416                     Cheezels Cheese 330g        2     11.40       330
## 5417      Tyrrells Crisps Lightly Salted 165g        1      4.20       165
## 5418             RRD Steak & Chimuchurri 150g        2      5.40       150
## 5419           French Fries Potato Chips 175g        1      3.00       175
## 5420            Grain Waves Sweet Chilli 210g        1      3.60       210
## 5421                     Cheezels Cheese 330g        1      5.70       330
## 5422            Kettle Honey Soy Chicken 175g        1      5.40       175
## 5423   Smiths Crinkle Cut Salt & Vinegar 170g        1      2.90       170
## 5424         Doritos Corn Chips Original 170g        1      4.40       170
## 5425             Smiths Crinkle Original 330g        1      5.70       330
## 5426     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 5427                 Pringles Slt Vingar 134g        1      3.70       134
## 5428             Smiths Crinkle Original 330g        1      5.70       330
## 5429           French Fries Potato Chips 175g        1      3.00       175
## 5430      Smith Crinkle Cut Mac N Cheese 150g        1      2.60       150
## 5431 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 5432              Twisties Cheese Burger 250g        1      4.30       250
## 5433             WW Crinkle Cut Original 175g        1      1.70       175
## 5434          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 5435                     Twisties Chicken270g        1      4.60       270
## 5436     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 5437                     Twisties Cheese 270g        2      9.20       270
## 5438       Smiths Thinly Swt Chli&S/Cream175G        1      3.00       175
## 5439     Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 5440     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 5441                   Pringles Barbeque 134g        1      3.70       134
## 5442             WW Crinkle Cut Original 175g        1      1.70       175
## 5443              Doritos Cheese Supreme 330g        2     11.40       330
## 5444                    Doritos Mexicana 170g        2      8.80       170
## 5445            Tostitos Smoked Chipotle 175g        2      8.80       175
## 5446       Smiths Thinly Swt Chli&S/Cream175G        1      3.00       175
## 5447            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 5448             Tostitos Lightly Salted 175g        1      4.40       175
## 5449      Infuzions Mango Chutny Papadums 70g        1      2.40        70
## 5450     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 5451    GrnWves Plus Btroot & Chilli Jam 180g        1      3.10       180
## 5452                       Kettle Chilli 175g        2     10.80       175
## 5453                  RRD Salt & Vinegar 165g        1      3.00       165
## 5454            Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 5455 Kettle Tortilla ChpsHny&Jlpno Chili 150g        1      4.60       150
## 5456           Cheetos Chs & Bacon Balls 190g        3      9.90       190
## 5457                   Pringles Barbeque 134g        2      7.40       134
## 5458      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 5459                   RRD Lime & Pepper 165g        1      3.00       165
## 5460  Doritos Corn Chip Mexican Jalapeno 150g        1      3.90       150
## 5461                       Cheetos Puffs 165g        2      5.60       165
## 5462              WW Original Corn Chips 200g        1      1.90       200
## 5463    Smiths Chip Thinly S/Cream&Onion 175g        1      3.00       175
## 5464      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 5465             Smiths Crinkle Original 330g        2     11.40       330
## 5466       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 5467                    CCs Nacho Cheese 175g        2      4.20       175
## 5468     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 5469   Smiths Crinkle Cut Chips Original 170g        1      2.90       170
## 5470 Infuzions Thai SweetChili PotatoMix 110g        1      3.80       110
## 5471   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 5472             WW Crinkle Cut Original 175g        2      3.40       175
## 5473   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 5474                  RRD Salt & Vinegar 165g        1      3.00       165
## 5475            Pringles Mystery Flavour 134g        1      3.70       134
## 5476             Smiths Crinkle Original 330g        1      5.70       330
## 5477             Woolworths Cheese Rings 190g        2      3.60       190
## 5478      Thins Potato Chips Hot & Spicy 175g        1      3.30       175
## 5479    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 5480                    Doritos Mexicana 170g        1      4.40       170
## 5481                       Cheetos Puffs 165g        2      5.60       165
## 5482      Smith Crinkle Cut Mac N Cheese 150g        1      2.60       150
## 5483                 Pringles Slt Vingar 134g        1      3.70       134
## 5484                       Kettle Chilli 175g        2     10.80       175
## 5485            Tostitos Smoked Chipotle 175g        2      8.80       175
## 5486      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 5487 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 5488                       Cheetos Puffs 165g        2      5.60       165
## 5489     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 5490                    CCs Tasty Cheese 175g        1      2.10       175
## 5491           Thins Chips Originl saltd 175g        2      6.60       175
## 5492       Smiths Thinly Swt Chli&S/Cream175G        2      6.00       175
## 5493             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 5494  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 5495          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 5496       Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 5497    Natural ChipCo Sea Salt & Vinegr 175g        1      3.00       175
## 5498              WW Original Corn Chips 200g        2      3.80       200
## 5499              WW Original Corn Chips 200g        1      1.90       200
## 5500             Woolworths Cheese Rings 190g        1      1.80       190
## 5501       RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 5502         Pringles Sthrn FriedChicken 134g        1      3.70       134
## 5503           Thins Chips Originl saltd 175g        2      6.60       175
## 5504         Doritos Corn Chips Original 170g        1      4.40       170
## 5505     Smiths Thinly Cut Roast Chicken 175g        1      3.00       175
## 5506       Smiths Crinkle Cut Snag&Sauce 150g        2      5.20       150
## 5507    Smiths Chip Thinly S/Cream&Onion 175g        1      3.00       175
## 5508     Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 5509         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 5510         Pringles Chicken Salt Crips 134g        2      7.40       134
## 5511          Thins Chips Salt & Vinegar 175g        1      3.30       175
## 5512         Pringles Sthrn FriedChicken 134g        1      3.70       134
## 5513         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 5514       Smiths Crinkle Cut Snag&Sauce 150g        1      2.60       150
## 5515     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 5516      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 5517      Tyrrells Crisps Lightly Salted 165g        1      4.20       165
## 5518                    CCs Nacho Cheese 175g        1      2.10       175
## 5519             Tostitos Splash Of Lime 175g        2      8.80       175
## 5520       Smiths Thinly Swt Chli&S/Cream175G        2      6.00       175
## 5521           French Fries Potato Chips 175g        1      3.00       175
## 5522            Pringles Original Crisps 134g        2      7.40       134
## 5523                        Burger Rings 220g        1      2.30       220
## 5524 Kettle Tortilla ChpsHny&Jlpno Chili 150g        1      4.60       150
## 5525            WW D/Style Chip Sea Salt 200g        1      1.90       200
## 5526    Natural ChipCo Sea Salt & Vinegr 175g        1      3.00       175
## 5527           WW Original Stacked Chips 160g        1      1.90       160
## 5528                     Twisties Cheese 270g        1      4.60       270
## 5529           French Fries Potato Chips 175g        1      3.00       175
## 5530                   RRD Lime & Pepper 165g        1      3.00       165
## 5531      Smith Crinkle Cut Mac N Cheese 150g        2      5.20       150
## 5532    Sunbites Whlegrn Crisps Frch/Onin 90g        1      1.70        90
## 5533            WW D/Style Chip Sea Salt 200g        1      1.90       200
## 5534                       Kettle Chilli 175g        2     10.80       175
## 5535      Natural Chip Co Tmato Hrb&Spce 175g        1      3.00       175
## 5536            Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 5537          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 5538             Woolworths Cheese Rings 190g        2      3.60       190
## 5539    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 5540                     Twisties Chicken270g        2      9.20       270
## 5541               RRD Honey Soy Chicken 165g        2      6.00       165
## 5542       Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 5543  Smiths Crinkle Cut French OnionDip 150g        1      2.60       150
## 5544            Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 5545     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 5546   WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 5547    Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 5548         Pringles Sthrn FriedChicken 134g        1      3.70       134
## 5549           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 5550  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 5551  Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 5552     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        1      1.70        90
## 5553             Tostitos Lightly Salted 175g        2      8.80       175
## 5554         Smith Crinkle Cut Bolognese 150g        1      2.60       150
## 5555  Smiths Crinkle Cut French OnionDip 150g        1      2.60       150
## 5556                 Pringles Slt Vingar 134g        1      3.70       134
## 5557                    CCs Tasty Cheese 175g        1      2.10       175
## 5558       Smiths Crinkle Cut Snag&Sauce 150g        1      2.60       150
## 5559     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 5560  Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 5561 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 5562        WW Supreme Cheese Corn Chips 200g        1      1.90       200
## 5563                        Burger Rings 220g        2      4.60       220
## 5564      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 5565    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 5566         Pringles Chicken Salt Crips 134g        2      7.40       134
## 5567          Natural Chip Compny SeaSalt175g        2      6.00       175
## 5568   Smiths Crinkle Cut Chips Chs&Onion170g        1      2.90       170
## 5569            Thins Chips Light& Tangy 175g        2      6.60       175
## 5570       RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 5571         Pringles Chicken Salt Crips 134g        2      7.40       134
## 5572                     Kettle Original 175g        1      5.40       175
## 5573    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 5574       RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 5575         Pringles Chicken Salt Crips 134g        1      3.70       134
## 5576                 Cheezels Cheese Box 125g        1      2.10       125
## 5577          RRD SR Slow Rst Pork Belly 150g        1      2.70       150
## 5578    Smiths Chip Thinly S/Cream&Onion 175g        1      3.00       175
## 5579            WW D/Style Chip Sea Salt 200g        1      1.90       200
## 5580                   Pringles Barbeque 134g        1      3.70       134
## 5581    Smiths Chip Thinly S/Cream&Onion 175g        1      3.00       175
## 5582    Cobs Popd Sour Crm &Chives Chips 110g        1      3.80       110
## 5583   Smiths Crinkle Cut Chips Original 170g        2      5.80       170
## 5584   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 5585    Smiths Crinkle Cut Chips Chicken 170g        1      2.90       170
## 5586    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 5587               RRD Honey Soy Chicken 165g        2      6.00       165
## 5588   Smiths Crinkle Cut Chips Original 170g        2      5.80       170
## 5589             Tostitos Splash Of Lime 175g        1      4.40       175
## 5590       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 5591             Pringles Sweet&Spcy BBQ 134g        1      3.70       134
## 5592       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 5593      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 5594              Doritos Cheese Supreme 330g        1      5.70       330
## 5595                 Pringles Slt Vingar 134g        1      3.70       134
## 5596                 Cheezels Cheese Box 125g        1      2.10       125
## 5597    Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 5598             Smiths Crinkle Original 330g        2     11.40       330
## 5599  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 5600          RRD SR Slow Rst Pork Belly 150g        1      2.70       150
## 5601      Tyrrells Crisps Lightly Salted 165g        1      4.20       165
## 5602              Doritos Cheese Supreme 330g        2     11.40       330
## 5603   Smiths Crinkle Cut Chips Original 170g        1      2.90       170
## 5604            Pringles Original Crisps 134g        1      3.70       134
## 5605           WW Original Stacked Chips 160g        1      1.90       160
## 5606            Kettle Honey Soy Chicken 175g        2     10.80       175
## 5607    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 5608                       Cheetos Puffs 165g        1      2.80       165
## 5609         Thins Chips Seasonedchicken 175g        2      6.60       175
## 5610         Thins Chips Seasonedchicken 175g        2      6.60       175
## 5611            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 5612         Pringles Chicken Salt Crips 134g        1      3.70       134
## 5613            Pringles Mystery Flavour 134g        1      3.70       134
## 5614    Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 5615       RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 5616       RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 5617            Pringles Mystery Flavour 134g        2      7.40       134
## 5618          RRD SR Slow Rst Pork Belly 150g        1      2.70       150
## 5619 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 5620                    CCs Tasty Cheese 175g        2      4.20       175
## 5621   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 5622         Smith Crinkle Cut Bolognese 150g        1      2.60       150
## 5623            Pringles Original Crisps 134g        1      3.70       134
## 5624     Red Rock Deli Sp Salt & Truffle 150G        1      2.70       150
## 5625      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 5626   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 5627             WW Crinkle Cut Original 175g        1      1.70       175
## 5628           French Fries Potato Chips 175g        2      6.00       175
## 5629   Smiths Crinkle Cut Chips Original 170g        1      2.90       170
## 5630    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 5631       Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 5632                   RRD Lime & Pepper 165g        2      6.00       165
## 5633          Natural Chip Compny SeaSalt175g        1      3.00       175
## 5634       Smiths Crinkle Cut Snag&Sauce 150g        1      2.60       150
## 5635   Smiths Crinkle Cut Chips Chs&Onion170g        1      2.90       170
## 5636  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 5637               RRD Honey Soy Chicken 165g        1      3.00       165
## 5638        Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 5639      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 5640            Kettle Honey Soy Chicken 175g        1      5.40       175
## 5641       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 5642              Twisties Cheese Burger 250g        2      8.60       250
## 5643  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 5644    Red Rock Deli Chikn&Garlic Aioli 150g        1      2.70       150
## 5645                   Pringles Barbeque 134g        2      7.40       134
## 5646            Pringles Mystery Flavour 134g        2      7.40       134
## 5647         Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 5648                        Burger Rings 220g        1      2.30       220
## 5649    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 5650            Pringles SourCream Onion 134g        2      7.40       134
## 5651       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 5652          Natural Chip Compny SeaSalt175g        1      3.00       175
## 5653     Kettle Tortilla ChpsFeta&Garlic 150g        1      4.60       150
## 5654                    CCs Nacho Cheese 175g        1      2.10       175
## 5655             Dorito Corn Chp Supreme 380g        2     13.00       380
## 5656                       Cheetos Puffs 165g        1      2.80       165
## 5657  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 5658            Kettle Honey Soy Chicken 175g        1      5.40       175
## 5659     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 5660           WW Original Stacked Chips 160g        1      1.90       160
## 5661  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 5662            Tostitos Smoked Chipotle 175g        1      4.40       175
## 5663     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 5664                        CCs Original 175g        2      4.20       175
## 5665    Natural ChipCo Sea Salt & Vinegr 175g        1      3.00       175
## 5666              WW Crinkle Cut Chicken 175g        2      3.40       175
## 5667                        CCs Original 175g        2      4.20       175
## 5668                     Kettle Original 175g        1      5.40       175
## 5669                     Cheezels Cheese 330g        2     11.40       330
## 5670      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 5671                     Kettle Original 175g        1      5.40       175
## 5672                 Cheezels Cheese Box 125g        1      2.10       125
## 5673              WW Original Corn Chips 200g        1      1.90       200
## 5674                   Pringles Barbeque 134g        1      3.70       134
## 5675    Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 5676   Smiths Crinkle Cut Chips Chs&Onion170g        1      2.90       170
## 5677    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 5678                     RRD Pc Sea Salt 165g        1      3.00       165
## 5679 Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 5680     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 5681           French Fries Potato Chips 175g        1      3.00       175
## 5682             Tostitos Splash Of Lime 175g        1      4.40       175
## 5683           Cheetos Chs & Bacon Balls 190g        1      3.30       190
## 5684      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 5685                        CCs Original 175g        1      2.10       175
## 5686 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 5687   Infzns Crn Crnchers Tangy Gcamole 110g        1      3.80       110
## 5688   Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 5689                    CCs Tasty Cheese 175g        2      4.20       175
## 5690           Thins Chips Originl saltd 175g        2      6.60       175
## 5691           French Fries Potato Chips 175g        1      3.00       175
## 5692                    Doritos Mexicana 170g        2      8.80       170
## 5693   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 5694      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 5695            Kettle Honey Soy Chicken 175g        2     10.80       175
## 5696  Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 5697    Red Rock Deli Chikn&Garlic Aioli 150g        1      2.70       150
## 5698           French Fries Potato Chips 175g        2      6.00       175
## 5699 Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 5700           Thins Chips Originl saltd 175g        1      3.30       175
## 5701            Tostitos Smoked Chipotle 175g        2      8.80       175
## 5702     Smiths Thinly Cut Roast Chicken 175g        1      3.00       175
## 5703   Smiths Crinkle Cut Chips Original 170g        1      2.90       170
## 5704             WW Crinkle Cut Original 175g        1      1.70       175
## 5705              WW Original Corn Chips 200g        2      3.80       200
## 5706         Thins Chips Seasonedchicken 175g        2      6.60       175
## 5707         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 5708         Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 5709   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 5710             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 5711                        Burger Rings 220g        1      2.30       220
## 5712            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 5713         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 5714     Smiths Chip Thinly Cut Original 175g        1      3.00       175
## 5715         Thins Chips Seasonedchicken 175g        1      3.30       175
## 5716                 RRD Chilli& Coconut 150g        2      5.40       150
## 5717    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 5718       Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 5719    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 5720            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 5721    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 5722 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 5723  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 5724     Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 5725            Thins Chips Light& Tangy 175g        2      6.60       175
## 5726     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 5727          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 5728              Twisties Cheese Burger 250g        2      8.60       250
## 5729    Natural ChipCo Sea Salt & Vinegr 175g        1      3.00       175
## 5730            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 5731            Pringles SourCream Onion 134g        1      3.70       134
## 5732            Grain Waves Sweet Chilli 210g        1      3.60       210
## 5733             Tostitos Lightly Salted 175g        1      4.40       175
## 5734          Natural Chip Compny SeaSalt175g        1      3.00       175
## 5735            Thins Chips Light& Tangy 175g        2      6.60       175
## 5736                 Pringles Slt Vingar 134g        1      3.70       134
## 5737 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        1      3.80       110
## 5738     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 5739         Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 5740             RRD Steak & Chimuchurri 150g        1      2.70       150
## 5741            Kettle Honey Soy Chicken 175g        1      5.40       175
## 5742      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 5743      Infuzions Mango Chutny Papadums 70g        1      2.40        70
## 5744            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 5745          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 5746       Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 5747   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 5748    Natural ChipCo Sea Salt & Vinegr 175g        1      3.00       175
## 5749                     Twisties Cheese 270g        2      9.20       270
## 5750            Pringles Mystery Flavour 134g        1      3.70       134
## 5751                     Twisties Cheese 270g        1      4.60       270
## 5752          RRD SR Slow Rst Pork Belly 150g        1      2.70       150
## 5753       Smiths Thinly Swt Chli&S/Cream175G        2      6.00       175
## 5754     Smiths Thinly Cut Roast Chicken 175g        1      3.00       175
## 5755     Red Rock Deli Sp Salt & Truffle 150G        1      2.70       150
## 5756                    CCs Nacho Cheese 175g        1      2.10       175
## 5757           WW Original Stacked Chips 160g        1      1.90       160
## 5758  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 5759             Kettle 135g Swt Pot Sea Salt        1      4.20       135
## 5760                     Kettle Original 175g        2     10.80       175
## 5761     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 5762     Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 5763 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 5764       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 5765      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 5766          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 5767                     Twisties Chicken270g        1      4.60       270
## 5768                     Cheezels Cheese 330g        1      5.70       330
## 5769                    Doritos Mexicana 170g        2      8.80       170
## 5770            Pringles SourCream Onion 134g        2      7.40       134
## 5771       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 5772    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 5773         Thins Chips Seasonedchicken 175g        2      6.60       175
## 5774   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 5775   Infzns Crn Crnchers Tangy Gcamole 110g        1      3.80       110
## 5776             Tostitos Splash Of Lime 175g        2      8.80       175
## 5777   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 5778    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 5779 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 5780    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 5781            Kettle Honey Soy Chicken 175g        2     10.80       175
## 5782      Kettle Sensations Siracha Lime 150g        1      4.60       150
## 5783            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 5784     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 5785                       Kettle Chilli 175g        2     10.80       175
## 5786   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 5787              Twisties Cheese Burger 250g        2      8.60       250
## 5788     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 5789 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 5790   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 5791  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 5792 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 5793 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 5794    Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 5795     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 5796      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 5797     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 5798  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 5799                 Pringles Slt Vingar 134g        2      7.40       134
## 5800    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 5801             Dorito Corn Chp Supreme 380g        2     13.00       380
## 5802                    Doritos Mexicana 170g        3     13.20       170
## 5803  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 5804                     Kettle Original 175g        2     10.80       175
## 5805         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 5806            Tostitos Smoked Chipotle 175g        2      8.80       175
## 5807                   Pringles Barbeque 134g        2      7.40       134
## 5808 Infuzions Thai SweetChili PotatoMix 110g        1      3.80       110
## 5809 Kettle Tortilla ChpsHny&Jlpno Chili 150g        1      4.60       150
## 5810      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 5811                     Twisties Chicken270g        2      9.20       270
## 5812             Dorito Corn Chp Supreme 380g        2     13.00       380
## 5813 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 5814 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 5815                     Kettle Original 175g        2     10.80       175
## 5816       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 5817         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 5818     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 5819         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 5820              Doritos Cheese Supreme 330g        2     11.40       330
## 5821         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 5822         Doritos Corn Chips Original 170g        2      8.80       170
## 5823              Twisties Cheese Burger 250g        2      8.60       250
## 5824 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 5825       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 5826                 Pringles Slt Vingar 134g        2      7.40       134
## 5827                     Kettle Original 175g        2     10.80       175
## 5828                     Cheezels Cheese 330g        2     11.40       330
## 5829       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 5830            Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 5831  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 5832      Kettle Sensations Siracha Lime 150g        1      4.60       150
## 5833             Tostitos Lightly Salted 175g        2      8.80       175
## 5834     Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 5835 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 5836          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 5837            Tostitos Smoked Chipotle 175g        2      8.80       175
## 5838             Tostitos Splash Of Lime 175g        2      8.80       175
## 5839   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 5840            Pringles SourCream Onion 134g        1      3.70       134
## 5841            Pringles Mystery Flavour 134g        2      7.40       134
## 5842 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 5843   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 5844                     Twisties Cheese 270g        2      9.20       270
## 5845            Thins Chips Light& Tangy 175g        2      6.60       175
## 5846            Thins Chips Light& Tangy 175g        2      6.60       175
## 5847         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 5848            Pringles SourCream Onion 134g        2      7.40       134
## 5849                 Pringles Slt Vingar 134g        2      7.40       134
## 5850  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 5851            Pringles Mystery Flavour 134g        2      7.40       134
## 5852             Dorito Corn Chp Supreme 380g        2     13.00       380
## 5853            Pringles Original Crisps 134g        1      3.70       134
## 5854             Smiths Crinkle Original 330g        2     11.40       330
## 5855         Thins Chips Seasonedchicken 175g        2      6.60       175
## 5856                       Kettle Chilli 175g        2     10.80       175
## 5857 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 5858         Doritos Corn Chips Original 170g        2      8.80       170
## 5859                     Twisties Chicken270g        2      9.20       270
## 5860    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 5861            Pringles Mystery Flavour 134g        2      7.40       134
## 5862       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 5863      Thins Potato Chips Hot & Spicy 175g        1      3.30       175
## 5864            Pringles Mystery Flavour 134g        2      7.40       134
## 5865 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 5866     Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 5867         Doritos Corn Chips Original 170g        2      8.80       170
## 5868             Smiths Crinkle Original 330g        2     11.40       330
## 5869                     Cheezels Cheese 330g        1      5.70       330
## 5870       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 5871             Tostitos Lightly Salted 175g        2      8.80       175
## 5872 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 5873         Kettle Sea Salt And Vinegar 175g        1      5.40       175
## 5874    Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 5875       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 5876                     Twisties Cheese 270g        2      9.20       270
## 5877    Cobs Popd Sour Crm &Chives Chips 110g        1      3.80       110
## 5878                     Cheezels Cheese 330g        2     11.40       330
## 5879   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 5880  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 5881            Thins Chips Light& Tangy 175g        2      6.60       175
## 5882       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 5883    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 5884             Tostitos Lightly Salted 175g        2      8.80       175
## 5885              Twisties Cheese Burger 250g        2      8.60       250
## 5886         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 5887                    Doritos Mexicana 170g        2      8.80       170
## 5888              Doritos Cheese Supreme 330g        1      5.70       330
## 5889 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 5890      Kettle Sensations Siracha Lime 150g        1      4.60       150
## 5891                     Cheezels Cheese 330g        2     11.40       330
## 5892  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 5893         Pringles Chicken Salt Crips 134g        2      7.40       134
## 5894         Thins Chips Seasonedchicken 175g        2      6.60       175
## 5895             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 5896              Doritos Cheese Supreme 330g        2     11.40       330
## 5897  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 5898          Thins Chips Salt & Vinegar 175g        1      3.30       175
## 5899         Kettle Sensations BBQ&Maple 150g        3     13.80       150
## 5900  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 5901   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 5902             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 5903         Kettle Sea Salt And Vinegar 175g        1      5.40       175
## 5904  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 5905            Tostitos Smoked Chipotle 175g        2      8.80       175
## 5906              Twisties Cheese Burger 250g        2      8.60       250
## 5907 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 5908         Doritos Corn Chips Original 170g        1      4.40       170
## 5909                     Kettle Original 175g        2     10.80       175
## 5910 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 5911              Doritos Cheese Supreme 330g        2     11.40       330
## 5912    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 5913             Dorito Corn Chp Supreme 380g        2     13.00       380
## 5914             Dorito Corn Chp Supreme 380g        2     13.00       380
## 5915            Thins Chips Light& Tangy 175g        2      6.60       175
## 5916  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 5917             Dorito Corn Chp Supreme 380g        2     13.00       380
## 5918                 Pringles Slt Vingar 134g        2      7.40       134
## 5919                 Pringles Slt Vingar 134g        2      7.40       134
## 5920  Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 5921  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 5922                     Cheezels Cheese 330g        2     11.40       330
## 5923            Pringles Original Crisps 134g        2      7.40       134
## 5924            Tostitos Smoked Chipotle 175g        2      8.80       175
## 5925            Thins Chips Light& Tangy 175g        1      3.30       175
## 5926 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 5927     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 5928                       Kettle Chilli 175g        2     10.80       175
## 5929            Pringles Mystery Flavour 134g        2      7.40       134
## 5930             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 5931         Thins Chips Seasonedchicken 175g        2      6.60       175
## 5932             Tostitos Lightly Salted 175g        2      8.80       175
## 5933            Kettle Honey Soy Chicken 175g        2     10.80       175
## 5934    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 5935 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 5936       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 5937             Tostitos Splash Of Lime 175g        2      8.80       175
## 5938             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 5939              Doritos Cheese Supreme 330g        1      5.70       330
## 5940         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 5941     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 5942            Pringles Original Crisps 134g        2      7.40       134
## 5943     Kettle Tortilla ChpsFeta&Garlic 150g        1      4.60       150
## 5944            Kettle Honey Soy Chicken 175g        2     10.80       175
## 5945             Smiths Crinkle Original 330g        2     11.40       330
## 5946             Smiths Crinkle Original 330g        2     11.40       330
## 5947                   Pringles Barbeque 134g        1      3.70       134
## 5948     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 5949  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 5950      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 5951                   Pringles Barbeque 134g        2      7.40       134
## 5952                       Kettle Chilli 175g        2     10.80       175
## 5953             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 5954             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 5955                     Twisties Cheese 270g        2      9.20       270
## 5956         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 5957             Dorito Corn Chp Supreme 380g        2     13.00       380
## 5958  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 5959       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 5960    Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 5961       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 5962       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 5963              Doritos Cheese Supreme 330g        2     11.40       330
## 5964 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 5965              Doritos Cheese Supreme 330g        2     11.40       330
## 5966              Doritos Cheese Supreme 330g        2     11.40       330
## 5967             Tostitos Lightly Salted 175g        2      8.80       175
## 5968            Pringles SourCream Onion 134g        2      7.40       134
## 5969 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 5970   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 5971                     Twisties Cheese 270g        2      9.20       270
## 5972            Pringles Mystery Flavour 134g        2      7.40       134
## 5973  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 5974            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 5975   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 5976              Twisties Cheese Burger 250g        2      8.60       250
## 5977            Pringles Original Crisps 134g        2      7.40       134
## 5978         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 5979 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 5980                       Kettle Chilli 175g        2     10.80       175
## 5981            Thins Chips Light& Tangy 175g        2      6.60       175
## 5982         Thins Chips Seasonedchicken 175g        2      6.60       175
## 5983 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 5984             Tostitos Lightly Salted 175g        2      8.80       175
## 5985  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 5986                     Twisties Chicken270g        2      9.20       270
## 5987                   Pringles Barbeque 134g        2      7.40       134
## 5988             Tostitos Splash Of Lime 175g        2      8.80       175
## 5989      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 5990    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 5991     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 5992             Smiths Crinkle Original 330g        2     11.40       330
## 5993             Smiths Crinkle Original 330g        2     11.40       330
## 5994       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 5995      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 5996            Grain Waves Sweet Chilli 210g        2      7.20       210
## 5997         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 5998                    Doritos Mexicana 170g        2      8.80       170
## 5999             Tostitos Lightly Salted 175g        2      8.80       175
## 6000              Twisties Cheese Burger 250g        2      8.60       250
## 6001                 Pringles Slt Vingar 134g        2      7.40       134
## 6002     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6003 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 6004         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6005             Tostitos Lightly Salted 175g        2      8.80       175
## 6006         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 6007            Thins Chips Light& Tangy 175g        1      3.30       175
## 6008     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6009    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 6010 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6011            Pringles SourCream Onion 134g        2      7.40       134
## 6012    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 6013            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6014              Doritos Cheese Supreme 330g        2     11.40       330
## 6015            Pringles SourCream Onion 134g        2      7.40       134
## 6016             Smiths Crinkle Original 330g        2     11.40       330
## 6017             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6018     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6019         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6020                    Doritos Mexicana 170g        2      8.80       170
## 6021             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6022                 Pringles Slt Vingar 134g        2      7.40       134
## 6023         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 6024 Infuzions Thai SweetChili PotatoMix 110g        1      3.80       110
## 6025            Pringles Original Crisps 134g        2      7.40       134
## 6026              Doritos Cheese Supreme 330g        2     11.40       330
## 6027                     Cheezels Cheese 330g        2     11.40       330
## 6028             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6029             Tostitos Lightly Salted 175g        2      8.80       175
## 6030     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 6031         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6032                    Doritos Mexicana 170g        2      8.80       170
## 6033                     Twisties Cheese 270g        2      9.20       270
## 6034                     Kettle Original 175g        2     10.80       175
## 6035   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6036         Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 6037            Pringles Mystery Flavour 134g        2      7.40       134
## 6038      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6039         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 6040                     Twisties Cheese 270g        2      9.20       270
## 6041         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6042             Tostitos Splash Of Lime 175g        2      8.80       175
## 6043             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6044             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6045             Smiths Crinkle Original 330g        2     11.40       330
## 6046   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6047                    Doritos Mexicana 170g        2      8.80       170
## 6048                     Kettle Original 175g        2     10.80       175
## 6049         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6050     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6051       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6052    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6053      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6054                 Pringles Slt Vingar 134g        1      3.70       134
## 6055     Kettle Tortilla ChpsFeta&Garlic 150g        1      4.60       150
## 6056     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6057   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6058         Pringles Chicken Salt Crips 134g        2      7.40       134
## 6059       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6060                 Pringles Slt Vingar 134g        2      7.40       134
## 6061      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6062             Dorito Corn Chp Supreme 380g        2     13.00       380
## 6063              Twisties Cheese Burger 250g        2      8.60       250
## 6064         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6065             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6066                     Twisties Chicken270g        2      9.20       270
## 6067         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6068              Doritos Cheese Supreme 330g        2     11.40       330
## 6069                       Kettle Chilli 175g        2     10.80       175
## 6070    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6071              Twisties Cheese Burger 250g        2      8.60       250
## 6072  Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 6073         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6074 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 6075         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6076 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6077  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6078 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6079            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6080      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6081   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6082            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6083      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6084 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 6085                     Cheezels Cheese 330g        2     11.40       330
## 6086                       Kettle Chilli 175g        2     10.80       175
## 6087            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6088            Tostitos Smoked Chipotle 175g        2      8.80       175
## 6089   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 6090              Doritos Cheese Supreme 330g        2     11.40       330
## 6091 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 6092  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 6093  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6094             Tostitos Splash Of Lime 175g        2      8.80       175
## 6095  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6096     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6097  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6098         Doritos Corn Chips Original 170g        2      8.80       170
## 6099         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6100 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 6101    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6102      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6103   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6104     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6105      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6106     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6107                     Cheezels Cheese 330g        2     11.40       330
## 6108    Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 6109         Pringles Chicken Salt Crips 134g        2      7.40       134
## 6110    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6111  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 6112    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6113 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 6114                    Doritos Mexicana 170g        2      8.80       170
## 6115    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6116                     Twisties Cheese 270g        2      9.20       270
## 6117          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 6118         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6119            Pringles Original Crisps 134g        2      7.40       134
## 6120  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6121   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6122  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 6123                    Doritos Mexicana 170g        1      4.40       170
## 6124             Tostitos Lightly Salted 175g        2      8.80       175
## 6125 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 6126            Thins Chips Light& Tangy 175g        2      6.60       175
## 6127   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6128         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6129   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6130    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6131     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6132  Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 6133                     Twisties Cheese 270g        2      9.20       270
## 6134            Thins Chips Light& Tangy 175g        2      6.60       175
## 6135     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6136                     Twisties Cheese 270g        2      9.20       270
## 6137            Pringles Original Crisps 134g        2      7.40       134
## 6138             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6139         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 6140            Thins Chips Light& Tangy 175g        2      6.60       175
## 6141              Doritos Cheese Supreme 330g        2     11.40       330
## 6142             Tostitos Splash Of Lime 175g        2      8.80       175
## 6143 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6144              Twisties Cheese Burger 250g        2      8.60       250
## 6145            Tostitos Smoked Chipotle 175g        1      4.40       175
## 6146    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6147              Twisties Cheese Burger 250g        2      8.60       250
## 6148    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6149   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 6150              Twisties Cheese Burger 250g        2      8.60       250
## 6151 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 6152         Doritos Corn Chips Original 170g        2      8.80       170
## 6153             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6154   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6155                     Twisties Cheese 270g        2      9.20       270
## 6156      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6157             Smiths Crinkle Original 330g        2     11.40       330
## 6158             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6159   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 6160            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6161            Pringles SourCream Onion 134g        2      7.40       134
## 6162 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6163                     Kettle Original 175g        2     10.80       175
## 6164   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6165      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6166         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 6167      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6168 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6169 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 6170      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6171         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6172             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6173            Tostitos Smoked Chipotle 175g        2      8.80       175
## 6174             Dorito Corn Chp Supreme 380g        2     13.00       380
## 6175      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6176            Tostitos Smoked Chipotle 175g        2      8.80       175
## 6177         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 6178         Pringles Sthrn FriedChicken 134g        1      3.70       134
## 6179            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 6180            Thins Chips Light& Tangy 175g        2      6.60       175
## 6181              Doritos Cheese Supreme 330g        2     11.40       330
## 6182             Smiths Crinkle Original 330g        1      5.70       330
## 6183         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 6184         Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 6185            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 6186                     Twisties Chicken270g        2      9.20       270
## 6187      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6188      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6189         Pringles Chicken Salt Crips 134g        2      7.40       134
## 6190 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 6191              Twisties Cheese Burger 250g        2      8.60       250
## 6192  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 6193             Dorito Corn Chp Supreme 380g        2     13.00       380
## 6194  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 6195             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6196              Doritos Cheese Supreme 330g        2     11.40       330
## 6197                     Twisties Chicken270g        2      9.20       270
## 6198  Doritos Corn Chip Southern Chicken 150g        1      3.90       150
## 6199             Tostitos Splash Of Lime 175g        1      4.40       175
## 6200         Pringles Chicken Salt Crips 134g        2      7.40       134
## 6201         Doritos Corn Chips Original 170g        2      8.80       170
## 6202   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 6203                     Twisties Cheese 270g        4     18.40       270
## 6204         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6205            Pringles Mystery Flavour 134g        2      7.40       134
## 6206          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 6207             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6208         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6209             Tostitos Splash Of Lime 175g        2      8.80       175
## 6210      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6211             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6212    Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 6213         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6214      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6215  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6216          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 6217             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6218            Kettle Honey Soy Chicken 175g        2     10.80       175
## 6219     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6220                     Twisties Chicken270g        2      9.20       270
## 6221       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 6222             Tostitos Splash Of Lime 175g        2      8.80       175
## 6223    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6224   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6225                   Pringles Barbeque 134g        2      7.40       134
## 6226             Tostitos Splash Of Lime 175g        2      8.80       175
## 6227         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6228                       Kettle Chilli 175g        2     10.80       175
## 6229         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6230   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 6231                       Kettle Chilli 175g        2     10.80       175
## 6232 Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 6233 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 6234                     Twisties Chicken270g        2      9.20       270
## 6235    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6236                   Pringles Barbeque 134g        2      7.40       134
## 6237       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 6238                    Doritos Mexicana 170g        2      8.80       170
## 6239                     Twisties Chicken270g        2      9.20       270
## 6240            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 6241    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6242     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6243              Twisties Cheese Burger 250g        2      8.60       250
## 6244            Pringles SourCream Onion 134g        2      7.40       134
## 6245   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6246                    Doritos Mexicana 170g        2      8.80       170
## 6247              Doritos Cheese Supreme 330g        2     11.40       330
## 6248             Tostitos Lightly Salted 175g        2      8.80       175
## 6249            Tostitos Smoked Chipotle 175g        2      8.80       175
## 6250             Smiths Crinkle Original 330g        2     11.40       330
## 6251            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 6252                   Pringles Barbeque 134g        2      7.40       134
## 6253             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6254   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 6255         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6256         Doritos Corn Chips Original 170g        2      8.80       170
## 6257         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6258   Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 6259                       Kettle Chilli 175g        2     10.80       175
## 6260     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6261          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 6262    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 6263             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6264 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6265            Pringles Original Crisps 134g        2      7.40       134
## 6266            Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 6267  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6268         Doritos Corn Chips Original 170g        2      8.80       170
## 6269  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 6270                 Pringles Slt Vingar 134g        2      7.40       134
## 6271     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 6272             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6273         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6274                     Twisties Chicken270g        2      9.20       270
## 6275            Thins Chips Light& Tangy 175g        1      3.30       175
## 6276       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 6277       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6278    Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 6279 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6280         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6281             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6282 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 6283             Dorito Corn Chp Supreme 380g        2     13.00       380
## 6284                 Pringles Slt Vingar 134g        2      7.40       134
## 6285                     Kettle Original 175g        2     10.80       175
## 6286                     Kettle Original 175g        2     10.80       175
## 6287 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6288      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6289            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6290             Tostitos Splash Of Lime 175g        2      8.80       175
## 6291            Thins Chips Light& Tangy 175g        2      6.60       175
## 6292         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6293          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 6294         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6295   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6296            Thins Chips Light& Tangy 175g        1      3.30       175
## 6297       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6298 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6299                     Twisties Cheese 270g        2      9.20       270
## 6300     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6301         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6302  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6303         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6304 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6305             Smiths Crinkle Original 330g        2     11.40       330
## 6306   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 6307                   Pringles Barbeque 134g        1      3.70       134
## 6308             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6309         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6310            Pringles SourCream Onion 134g        2      7.40       134
## 6311     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6312    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6313                    Doritos Mexicana 170g        2      8.80       170
## 6314 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 6315      Tyrrells Crisps Lightly Salted 165g        1      4.20       165
## 6316 Kettle Tortilla ChpsHny&Jlpno Chili 150g        1      4.60       150
## 6317                   Pringles Barbeque 134g        2      7.40       134
## 6318                    Doritos Mexicana 170g        2      8.80       170
## 6319 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 6320      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6321            Tostitos Smoked Chipotle 175g        2      8.80       175
## 6322    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6323    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6324       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6325 Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 6326         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6327            Pringles Original Crisps 134g        2      7.40       134
## 6328         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6329            Pringles SourCream Onion 134g        2      7.40       134
## 6330            Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 6331 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 6332   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 6333   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 6334       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 6335             Smiths Crinkle Original 330g        2     11.40       330
## 6336            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6337    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6338  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6339             Smiths Crinkle Original 330g        2     11.40       330
## 6340            Pringles Mystery Flavour 134g        2      7.40       134
## 6341         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 6342         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6343  Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 6344     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6345             Tostitos Lightly Salted 175g        2      8.80       175
## 6346      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6347             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6348            Pringles Original Crisps 134g        2      7.40       134
## 6349  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6350     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6351          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 6352                 Pringles Slt Vingar 134g        2      7.40       134
## 6353         Pringles Chicken Salt Crips 134g        2      7.40       134
## 6354         Pringles Sthrn FriedChicken 134g        1      3.70       134
## 6355         Doritos Corn Chips Original 170g        2      8.80       170
## 6356  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6357              Twisties Cheese Burger 250g        2      8.60       250
## 6358            Tostitos Smoked Chipotle 175g        2      8.80       175
## 6359                     Kettle Original 175g        2     10.80       175
## 6360                    Doritos Mexicana 170g        2      8.80       170
## 6361   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 6362 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6363   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6364            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6365      Kettle Sensations Siracha Lime 150g        1      4.60       150
## 6366       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 6367    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6368       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 6369             Smiths Crinkle Original 330g        2     11.40       330
## 6370             Dorito Corn Chp Supreme 380g        2     13.00       380
## 6371             Dorito Corn Chp Supreme 380g        2     13.00       380
## 6372 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6373                     Twisties Cheese 270g        2      9.20       270
## 6374         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6375     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6376            Pringles Mystery Flavour 134g        2      7.40       134
## 6377         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 6378  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 6379    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6380  Doritos Corn Chip Southern Chicken 150g        1      3.90       150
## 6381       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 6382     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6383                       Kettle Chilli 175g        2     10.80       175
## 6384      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6385      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6386              Doritos Cheese Supreme 330g        2     11.40       330
## 6387         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6388            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 6389     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6390         Pringles Chicken Salt Crips 134g        2      7.40       134
## 6391   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 6392      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6393         Doritos Corn Chips Original 170g        2      8.80       170
## 6394  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6395            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6396         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6397  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6398         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6399                   Pringles Barbeque 134g        2      7.40       134
## 6400         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6401     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6402  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 6403    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6404              Doritos Cheese Supreme 330g        1      5.70       330
## 6405    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6406  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 6407  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6408    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6409             Smiths Crinkle Original 330g        2     11.40       330
## 6410             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6411 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6412            Thins Chips Light& Tangy 175g        2      6.60       175
## 6413                       Kettle Chilli 175g        2     10.80       175
## 6414            Thins Chips Light& Tangy 175g        1      3.30       175
## 6415  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6416   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6417            Pringles Mystery Flavour 134g        2      7.40       134
## 6418   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6419      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6420                   Pringles Barbeque 134g        2      7.40       134
## 6421 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 6422    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6423  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6424    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6425         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6426                     Twisties Chicken270g        2      9.20       270
## 6427             Dorito Corn Chp Supreme 380g        2     13.00       380
## 6428                     Twisties Cheese 270g        2      9.20       270
## 6429         Doritos Corn Chips Original 170g        2      8.80       170
## 6430         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 6431 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 6432 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 6433             Smiths Crinkle Original 330g        2     11.40       330
## 6434             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6435     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 6436                       Kettle Chilli 175g        1      5.40       175
## 6437             Dorito Corn Chp Supreme 380g        2     13.00       380
## 6438     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 6439  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6440         Pringles Chicken Salt Crips 134g        2      7.40       134
## 6441     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6442   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 6443            Pringles Original Crisps 134g        2      7.40       134
## 6444         Doritos Corn Chips Original 170g        2      8.80       170
## 6445             Tostitos Lightly Salted 175g        2      8.80       175
## 6446 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 6447             Tostitos Splash Of Lime 175g        2      8.80       175
## 6448             Tostitos Splash Of Lime 175g        2      8.80       175
## 6449    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 6450       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6451            Tostitos Smoked Chipotle 175g        2      8.80       175
## 6452    Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 6453     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6454                   Pringles Barbeque 134g        1      3.70       134
## 6455            Thins Chips Light& Tangy 175g        2      6.60       175
## 6456    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6457             Tostitos Lightly Salted 175g        2      8.80       175
## 6458             Tostitos Lightly Salted 175g        2      8.80       175
## 6459    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6460         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6461            Grain Waves Sweet Chilli 210g        1      3.60       210
## 6462         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 6463          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 6464 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 6465         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6466                       Kettle Chilli 175g        2     10.80       175
## 6467                     Twisties Cheese 270g        2      9.20       270
## 6468          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 6469         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6470    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6471            Tostitos Smoked Chipotle 175g        2      8.80       175
## 6472         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6473     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6474  Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 6475      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6476  Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 6477                     Cheezels Cheese 330g        2     11.40       330
## 6478    Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 6479            Thins Chips Light& Tangy 175g        2      6.60       175
## 6480    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6481            Pringles SourCream Onion 134g        2      7.40       134
## 6482          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 6483   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6484      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6485          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 6486  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6487         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6488                     Twisties Chicken270g        2      9.20       270
## 6489                     Twisties Chicken270g        2      9.20       270
## 6490 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6491             Tostitos Splash Of Lime 175g        2      8.80       175
## 6492 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6493   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6494    Cobs Popd Sour Crm &Chives Chips 110g        1      3.80       110
## 6495     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6496  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6497                     Twisties Cheese 270g        2      9.20       270
## 6498  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6499 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 6500   Infzns Crn Crnchers Tangy Gcamole 110g        1      3.80       110
## 6501    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6502                     Kettle Original 175g        1      5.40       175
## 6503  Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 6504   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 6505 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 6506                 Pringles Slt Vingar 134g        2      7.40       134
## 6507              Twisties Cheese Burger 250g        2      8.60       250
## 6508       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 6509              Doritos Cheese Supreme 330g        2     11.40       330
## 6510            Pringles Original Crisps 134g        2      7.40       134
## 6511                       Kettle Chilli 175g        2     10.80       175
## 6512                       Kettle Chilli 175g        2     10.80       175
## 6513 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6514            Pringles Original Crisps 134g        2      7.40       134
## 6515         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 6516         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6517         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6518 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6519  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6520            Thins Chips Light& Tangy 175g        2      6.60       175
## 6521    Cobs Popd Sour Crm &Chives Chips 110g        1      3.80       110
## 6522                     Cheezels Cheese 330g        2     11.40       330
## 6523  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6524     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 6525    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6526  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 6527                     Twisties Cheese 270g        1      4.60       270
## 6528   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6529              Twisties Cheese Burger 250g        2      8.60       250
## 6530             Smiths Crinkle Original 330g        2     11.40       330
## 6531     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6532 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6533                     Kettle Original 175g        1      5.40       175
## 6534                   Pringles Barbeque 134g        2      7.40       134
## 6535     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6536             Dorito Corn Chp Supreme 380g        2     13.00       380
## 6537 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 6538             Smiths Crinkle Original 330g        2     11.40       330
## 6539       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 6540                     Twisties Chicken270g        2      9.20       270
## 6541 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6542             Smiths Crinkle Original 330g        2     11.40       330
## 6543 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 6544   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6545                       Kettle Chilli 175g        2     10.80       175
## 6546         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6547             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6548   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 6549              Twisties Cheese Burger 250g        1      4.30       250
## 6550  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6551          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 6552      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6553                    Doritos Mexicana 170g        2      8.80       170
## 6554 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6555             Dorito Corn Chp Supreme 380g        2     13.00       380
## 6556    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6557                    Doritos Mexicana 170g        2      8.80       170
## 6558       Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 6559            Pringles SourCream Onion 134g        2      7.40       134
## 6560 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 6561   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 6562            Thins Chips Light& Tangy 175g        1      3.30       175
## 6563              Doritos Cheese Supreme 330g        2     11.40       330
## 6564                     Twisties Chicken270g        2      9.20       270
## 6565            Tostitos Smoked Chipotle 175g        2      8.80       175
## 6566                     Cheezels Cheese 330g        2     11.40       330
## 6567    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 6568            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6569         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6570       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6571      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6572             Tostitos Lightly Salted 175g        2      8.80       175
## 6573  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6574                       Kettle Chilli 175g        2     10.80       175
## 6575            Pringles Mystery Flavour 134g        2      7.40       134
## 6576      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6577 Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 6578                     Kettle Original 175g        2     10.80       175
## 6579         Pringles Chicken Salt Crips 134g        2      7.40       134
## 6580      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6581    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6582 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6583         Doritos Corn Chips Original 170g        2      8.80       170
## 6584              Twisties Cheese Burger 250g        2      8.60       250
## 6585             Tostitos Splash Of Lime 175g        1      4.40       175
## 6586            Kettle Honey Soy Chicken 175g        1      5.40       175
## 6587          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 6588     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6589    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 6590            Pringles Mystery Flavour 134g        2      7.40       134
## 6591   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6592    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 6593              Twisties Cheese Burger 250g        2      8.60       250
## 6594                     Twisties Chicken270g        2      9.20       270
## 6595              Twisties Cheese Burger 250g        2      8.60       250
## 6596                   Pringles Barbeque 134g        2      7.40       134
## 6597 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 6598    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6599 Infuzions SourCream&Herbs Veg Strws 110g        1      3.80       110
## 6600   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 6601             Pringles Sweet&Spcy BBQ 134g        1      3.70       134
## 6602     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6603      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6604         Pringles Chicken Salt Crips 134g        2      7.40       134
## 6605            Pringles Mystery Flavour 134g        1      3.70       134
## 6606            Pringles Original Crisps 134g        1      3.70       134
## 6607            Thins Chips Light& Tangy 175g        2      6.60       175
## 6608            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 6609      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6610  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6611         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6612    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6613            Kettle Honey Soy Chicken 175g        2     10.80       175
## 6614             Tostitos Lightly Salted 175g        2      8.80       175
## 6615     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6616             Tostitos Lightly Salted 175g        1      4.40       175
## 6617                 Pringles Slt Vingar 134g        2      7.40       134
## 6618                 Pringles Slt Vingar 134g        2      7.40       134
## 6619  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 6620       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6621         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6622 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6623     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 6624             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6625   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6626                     Kettle Original 175g        2     10.80       175
## 6627            Thins Chips Light& Tangy 175g        2      6.60       175
## 6628  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 6629     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 6630                     Kettle Original 175g        2     10.80       175
## 6631    Infuzions BBQ Rib Prawn Crackers 110g        4     15.20       110
## 6632   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 6633 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6634                       Kettle Chilli 175g        1      5.40       175
## 6635                     Cheezels Cheese 330g        2     11.40       330
## 6636            Tostitos Smoked Chipotle 175g        2      8.80       175
## 6637                 Pringles Slt Vingar 134g        2      7.40       134
## 6638            Pringles Mystery Flavour 134g        2      7.40       134
## 6639                   Pringles Barbeque 134g        2      7.40       134
## 6640 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 6641             Smiths Crinkle Original 330g        2     11.40       330
## 6642         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6643                   Pringles Barbeque 134g        2      7.40       134
## 6644             Tostitos Splash Of Lime 175g        2      8.80       175
## 6645            Kettle Honey Soy Chicken 175g        2     10.80       175
## 6646              Doritos Cheese Supreme 330g        2     11.40       330
## 6647     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6648              Doritos Cheese Supreme 330g        2     11.40       330
## 6649                    Doritos Mexicana 170g        2      8.80       170
## 6650            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 6651  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 6652   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 6653                       Kettle Chilli 175g        2     10.80       175
## 6654 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 6655             Smiths Crinkle Original 330g        2     11.40       330
## 6656             Tostitos Lightly Salted 175g        2      8.80       175
## 6657                     Cheezels Cheese 330g        2     11.40       330
## 6658     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6659                    Doritos Mexicana 170g        2      8.80       170
## 6660             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6661         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6662             Tostitos Lightly Salted 175g        2      8.80       175
## 6663            Pringles Original Crisps 134g        2      7.40       134
## 6664      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6665            Pringles SourCream Onion 134g        2      7.40       134
## 6666                       Kettle Chilli 175g        2     10.80       175
## 6667                     Cheezels Cheese 330g        2     11.40       330
## 6668         Doritos Corn Chips Original 170g        2      8.80       170
## 6669 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 6670   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6671      Tyrrells Crisps Lightly Salted 165g        1      4.20       165
## 6672            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6673            Pringles Original Crisps 134g        2      7.40       134
## 6674         Pringles Chicken Salt Crips 134g        3     11.10       134
## 6675                     Twisties Cheese 270g        2      9.20       270
## 6676         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6677      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6678 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6679   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6680            Pringles SourCream Onion 134g        2      7.40       134
## 6681     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6682         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6683  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 6684      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6685 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6686   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6687                     Twisties Chicken270g        2      9.20       270
## 6688    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6689                     Cheezels Cheese 330g        2     11.40       330
## 6690      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6691             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6692             Tostitos Splash Of Lime 175g        1      4.40       175
## 6693         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 6694  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6695            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 6696             Smiths Crinkle Original 330g        2     11.40       330
## 6697     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6698         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 6699                     Twisties Chicken270g        2      9.20       270
## 6700                       Kettle Chilli 175g        1      5.40       175
## 6701            Pringles Original Crisps 134g        2      7.40       134
## 6702             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6703       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6704  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6705            Kettle Honey Soy Chicken 175g        2     10.80       175
## 6706         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6707                 Pringles Slt Vingar 134g        2      7.40       134
## 6708 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 6709            Pringles Original Crisps 134g        1      3.70       134
## 6710            Pringles SourCream Onion 134g        1      3.70       134
## 6711     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6712             Dorito Corn Chp Supreme 380g        2      6.50       380
## 6713                     Kettle Original 175g        2     10.80       175
## 6714         Doritos Corn Chips Original 170g        2      8.80       170
## 6715         Doritos Corn Chips Original 170g        2      8.80       170
## 6716 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6717      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6718  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6719            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 6720            Pringles Original Crisps 134g        2      7.40       134
## 6721     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 6722   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6723             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6724  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6725          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 6726       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 6727       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 6728            Thins Chips Light& Tangy 175g        2      6.60       175
## 6729         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6730       Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 6731                    Doritos Mexicana 170g        2      8.80       170
## 6732    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6733     Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 6734      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6735            Pringles SourCream Onion 134g        2      7.40       134
## 6736   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 6737     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 6738                     Twisties Chicken270g        2      9.20       270
## 6739            Pringles SourCream Onion 134g        2      7.40       134
## 6740                 Pringles Slt Vingar 134g        2      7.40       134
## 6741  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6742 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6743            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6744                     Twisties Chicken270g        2      9.20       270
## 6745    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6746     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6747      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6748         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6749             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6750                       Kettle Chilli 175g        2     10.80       175
## 6751             Smiths Crinkle Original 330g        1      5.70       330
## 6752      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6753            Kettle Honey Soy Chicken 175g        2     10.80       175
## 6754     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 6755            Kettle Honey Soy Chicken 175g        2     10.80       175
## 6756              Twisties Cheese Burger 250g        2      8.60       250
## 6757 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6758     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 6759       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6760             Tostitos Lightly Salted 175g        2      8.80       175
## 6761                   Pringles Barbeque 134g        2      7.40       134
## 6762             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6763 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6764            Tostitos Smoked Chipotle 175g        2      8.80       175
## 6765     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 6766                 Pringles Slt Vingar 134g        1      3.70       134
## 6767              Doritos Cheese Supreme 330g        2     11.40       330
## 6768            Tostitos Smoked Chipotle 175g        2      8.80       175
## 6769              Twisties Cheese Burger 250g        2      8.60       250
## 6770  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6771 Infuzions Thai SweetChili PotatoMix 110g        1      3.80       110
## 6772 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6773             Smiths Crinkle Original 330g        2     11.40       330
## 6774   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6775             Dorito Corn Chp Supreme 380g        2     13.00       380
## 6776 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6777                     Twisties Chicken270g        2      9.20       270
## 6778  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6779                     Twisties Chicken270g        2      9.20       270
## 6780  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 6781    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6782            Pringles Mystery Flavour 134g        2      7.40       134
## 6783       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6784    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6785    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 6786            Kettle Honey Soy Chicken 175g        2     10.80       175
## 6787            Pringles Original Crisps 134g        2      7.40       134
## 6788 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 6789      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6790             Dorito Corn Chp Supreme 380g        2     13.00       380
## 6791             Smiths Crinkle Original 330g        2     11.40       330
## 6792 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 6793    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6794            Grain Waves Sweet Chilli 210g        1      3.60       210
## 6795       Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 6796       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6797   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6798                     Twisties Chicken270g        2      9.20       270
## 6799              Doritos Cheese Supreme 330g        2     11.40       330
## 6800     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6801         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6802       Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 6803            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 6804            Kettle Honey Soy Chicken 175g        1      5.40       175
## 6805             Tostitos Splash Of Lime 175g        1      4.40       175
## 6806         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6807  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 6808 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6809            Pringles Original Crisps 134g        2      7.40       134
## 6810       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6811  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 6812                   Pringles Barbeque 134g        1      3.70       134
## 6813              Twisties Cheese Burger 250g        1      4.30       250
## 6814                       Kettle Chilli 175g        2     10.80       175
## 6815            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6816      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6817  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 6818  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 6819       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6820            Thins Chips Light& Tangy 175g        2      6.60       175
## 6821                     Kettle Original 175g        2     10.80       175
## 6822       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6823   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 6824   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6825     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6826       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6827      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6828   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6829         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6830      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6831                    Doritos Mexicana 170g        2      8.80       170
## 6832       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 6833  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 6834                     Twisties Chicken270g        2      9.20       270
## 6835              Twisties Cheese Burger 250g        1      4.30       250
## 6836         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6837      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6838             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6839            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 6840    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6841          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 6842    Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 6843 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 6844            Pringles SourCream Onion 134g        2      7.40       134
## 6845             Dorito Corn Chp Supreme 380g        2     13.00       380
## 6846            Thins Chips Light& Tangy 175g        1      3.30       175
## 6847      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6848             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6849            Pringles SourCream Onion 134g        1      3.70       134
## 6850 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 6851  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 6852  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6853            Pringles SourCream Onion 134g        2      7.40       134
## 6854             Tostitos Splash Of Lime 175g        2      8.80       175
## 6855            Tostitos Smoked Chipotle 175g        2      8.80       175
## 6856            Pringles SourCream Onion 134g        2      7.40       134
## 6857  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6858  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6859            Kettle Honey Soy Chicken 175g        2     10.80       175
## 6860                    Doritos Mexicana 170g        2      8.80       170
## 6861            Kettle Honey Soy Chicken 175g        2     10.80       175
## 6862         Pringles Chicken Salt Crips 134g        2      7.40       134
## 6863     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 6864         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 6865  Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 6866      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6867                     Kettle Original 175g        2     10.80       175
## 6868         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6869            Pringles Original Crisps 134g        2      7.40       134
## 6870    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6871         Thins Chips Seasonedchicken 175g        2      6.60       175
## 6872             Tostitos Splash Of Lime 175g        2      8.80       175
## 6873             Tostitos Splash Of Lime 175g        2      8.80       175
## 6874             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6875             Tostitos Splash Of Lime 175g        2      8.80       175
## 6876                       Kettle Chilli 175g        1      5.40       175
## 6877            Pringles Original Crisps 134g        1      3.70       134
## 6878  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 6879       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6880 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 6881                 Pringles Slt Vingar 134g        2      7.40       134
## 6882     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6883            Kettle Honey Soy Chicken 175g        2     10.80       175
## 6884            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6885            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6886     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6887              Twisties Cheese Burger 250g        2      8.60       250
## 6888             Smiths Crinkle Original 330g        2     11.40       330
## 6889            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 6890            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 6891             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6892             Dorito Corn Chp Supreme 380g        2     13.00       380
## 6893             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6894 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6895  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 6896                     Kettle Original 175g        1      5.40       175
## 6897            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6898      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6899    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6900      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6901             Smiths Crinkle Original 330g        2     11.40       330
## 6902                     Kettle Original 175g        2     10.80       175
## 6903            Pringles Mystery Flavour 134g        2      7.40       134
## 6904            Thins Chips Light& Tangy 175g        2      6.60       175
## 6905             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 6906                 Pringles Slt Vingar 134g        2      7.40       134
## 6907         Pringles Chicken Salt Crips 134g        2      7.40       134
## 6908            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 6909            Thins Chips Light& Tangy 175g        2      6.60       175
## 6910      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6911            Pringles Original Crisps 134g        2      7.40       134
## 6912 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 6913         Doritos Corn Chips Original 170g        2      8.80       170
## 6914  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 6915 Infuzions Thai SweetChili PotatoMix 110g        1      3.80       110
## 6916   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 6917            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6918            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6919      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6920     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 6921   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 6922   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6923            Pringles SourCream Onion 134g        2      7.40       134
## 6924    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6925   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6926                     Twisties Chicken270g        2      9.20       270
## 6927    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 6928                   Pringles Barbeque 134g        2      7.40       134
## 6929                   Pringles Barbeque 134g        2      7.40       134
## 6930 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 6931    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6932                     Twisties Chicken270g        2      9.20       270
## 6933                   Pringles Barbeque 134g        2      7.40       134
## 6934            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 6935                    Doritos Mexicana 170g        2      8.80       170
## 6936     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 6937         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 6938              Doritos Cheese Supreme 330g        2     11.40       330
## 6939                     Twisties Cheese 270g        2      9.20       270
## 6940    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 6941                     Cheezels Cheese 330g        2     11.40       330
## 6942                     Kettle Original 175g        2     10.80       175
## 6943            Thins Chips Light& Tangy 175g        2      6.60       175
## 6944              Doritos Cheese Supreme 330g        2     11.40       330
## 6945   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6946 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 6947   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 6948       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 6949              Twisties Cheese Burger 250g        2      8.60       250
## 6950    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6951  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 6952 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 6953         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6954             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 6955                   Pringles Barbeque 134g        2      7.40       134
## 6956  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 6957             Tostitos Splash Of Lime 175g        2      8.80       175
## 6958         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 6959  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 6960            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 6961                     Cheezels Cheese 330g        2     11.40       330
## 6962             Tostitos Splash Of Lime 175g        2      8.80       175
## 6963             Tostitos Lightly Salted 175g        2      8.80       175
## 6964     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6965 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 6966                 Pringles Slt Vingar 134g        2      7.40       134
## 6967 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 6968            Grain Waves Sweet Chilli 210g        2      7.20       210
## 6969    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 6970                    Doritos Mexicana 170g        2      8.80       170
## 6971                     Twisties Chicken270g        2      9.20       270
## 6972                     Twisties Chicken270g        2      9.20       270
## 6973         Kettle Sea Salt And Vinegar 175g        1      5.40       175
## 6974                     Twisties Cheese 270g        2      9.20       270
## 6975            Pringles SourCream Onion 134g        2      7.40       134
## 6976      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 6977  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 6978       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 6979   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 6980                     Twisties Chicken270g        2      9.20       270
## 6981 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 6982                     Cheezels Cheese 330g        2     11.40       330
## 6983             Tostitos Splash Of Lime 175g        2      8.80       175
## 6984      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6985      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 6986    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 6987      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 6988                    Doritos Mexicana 170g        2      8.80       170
## 6989                    Doritos Mexicana 170g        2      8.80       170
## 6990             Tostitos Splash Of Lime 175g        2      8.80       175
## 6991    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 6992            Kettle Honey Soy Chicken 175g        2     10.80       175
## 6993         Pringles Sthrn FriedChicken 134g        1      3.70       134
## 6994            Kettle Honey Soy Chicken 175g        2     10.80       175
## 6995         Pringles Chicken Salt Crips 134g        2      7.40       134
## 6996  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 6997                       Kettle Chilli 175g        2     10.80       175
## 6998     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 6999       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 7000      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 7001                     Twisties Chicken270g        2      9.20       270
## 7002   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7003                 Pringles Slt Vingar 134g        2      7.40       134
## 7004       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 7005            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 7006         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 7007                     Kettle Original 175g        2     10.80       175
## 7008     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 7009       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 7010         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 7011         Doritos Corn Chips Original 170g        2      8.80       170
## 7012  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 7013                   Pringles Barbeque 134g        1      3.70       134
## 7014  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7015            Kettle Honey Soy Chicken 175g        2     10.80       175
## 7016                 Pringles Slt Vingar 134g        2      7.40       134
## 7017                    Doritos Mexicana 170g        2      8.80       170
## 7018              Twisties Cheese Burger 250g        2      8.60       250
## 7019         Doritos Corn Chips Original 170g        2      8.80       170
## 7020    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 7021 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 7022  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7023         Doritos Corn Chips Original 170g        2      8.80       170
## 7024    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 7025             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 7026                     Twisties Chicken270g        2      9.20       270
## 7027         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 7028         Thins Chips Seasonedchicken 175g        2      6.60       175
## 7029  Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 7030                     Twisties Chicken270g        2      9.20       270
## 7031              Doritos Cheese Supreme 330g        2     11.40       330
## 7032       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 7033             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 7034 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 7035                     Kettle Original 175g        2     10.80       175
## 7036          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 7037             Tostitos Lightly Salted 175g        2      8.80       175
## 7038      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 7039         Pringles Chicken Salt Crips 134g        2      7.40       134
## 7040  Kettle Sweet Chilli And Sour Cream 175g        1      5.40       175
## 7041              Twisties Cheese Burger 250g        2      8.60       250
## 7042             Dorito Corn Chp Supreme 380g        2     13.00       380
## 7043                     Kettle Original 175g        1      5.40       175
## 7044   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7045       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 7046            Pringles Original Crisps 134g        2      7.40       134
## 7047  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 7048       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 7049             Dorito Corn Chp Supreme 380g        2     13.00       380
## 7050 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7051             Tostitos Lightly Salted 175g        2      8.80       175
## 7052                     Twisties Chicken270g        1      4.60       270
## 7053         Thins Chips Seasonedchicken 175g        2      6.60       175
## 7054      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 7055 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7056 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 7057                    Doritos Mexicana 170g        2      8.80       170
## 7058   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7059            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7060  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 7061                     Kettle Original 175g        2     10.80       175
## 7062          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 7063            Kettle Honey Soy Chicken 175g        2     10.80       175
## 7064         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 7065            Tostitos Smoked Chipotle 175g        2      8.80       175
## 7066      Thins Potato Chips Hot & Spicy 175g        1      3.30       175
## 7067                       Kettle Chilli 175g        2     10.80       175
## 7068 Kettle Tortilla ChpsHny&Jlpno Chili 150g        1      4.60       150
## 7069      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 7070             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 7071            Kettle Honey Soy Chicken 175g        2     10.80       175
## 7072     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 7073         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 7074 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7075             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 7076      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7077             Smiths Crinkle Original 330g        2     11.40       330
## 7078    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7079         Thins Chips Seasonedchicken 175g        2      6.60       175
## 7080   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7081            Pringles SourCream Onion 134g        2      7.40       134
## 7082             Smiths Crinkle Original 330g        2     11.40       330
## 7083             Tostitos Lightly Salted 175g        2      8.80       175
## 7084    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 7085                    Doritos Mexicana 170g        2      8.80       170
## 7086       Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 7087            Pringles Original Crisps 134g        2      7.40       134
## 7088         Thins Chips Seasonedchicken 175g        2      6.60       175
## 7089 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 7090             Smiths Crinkle Original 330g        2     11.40       330
## 7091     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 7092              Doritos Cheese Supreme 330g        1      5.70       330
## 7093    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 7094     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 7095                     Kettle Original 175g        2     10.80       175
## 7096         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 7097            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7098                 Pringles Slt Vingar 134g        2      7.40       134
## 7099   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 7100       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 7101 Kettle Tortilla ChpsHny&Jlpno Chili 150g        1      4.60       150
## 7102  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7103  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 7104 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7105          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 7106     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 7107             Tostitos Lightly Salted 175g        2      8.80       175
## 7108              Doritos Cheese Supreme 330g        2     11.40       330
## 7109      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7110             Smiths Crinkle Original 330g        2     11.40       330
## 7111                 Pringles Slt Vingar 134g        2      7.40       134
## 7112   Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 7113              Doritos Cheese Supreme 330g        2     11.40       330
## 7114              Twisties Cheese Burger 250g        2      8.60       250
## 7115                     Twisties Cheese 270g        2      9.20       270
## 7116   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 7117 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 7118      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7119     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 7120                     Twisties Chicken270g        2      9.20       270
## 7121    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7122         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 7123            Kettle Honey Soy Chicken 175g        2     10.80       175
## 7124   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 7125             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 7126 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 7127                     Kettle Original 175g        2     10.80       175
## 7128 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 7129             Tostitos Splash Of Lime 175g        2      8.80       175
## 7130    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 7131  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 7132         Pringles Chicken Salt Crips 134g        2      7.40       134
## 7133                     Twisties Chicken270g        2      9.20       270
## 7134       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 7135             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 7136 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7137  Doritos Corn Chip Southern Chicken 150g        1      3.90       150
## 7138                     Twisties Chicken270g        2      9.20       270
## 7139                     Kettle Original 175g        2     10.80       175
## 7140 Smiths Crinkle Chips Salt & Vinegar 330g        1      5.70       330
## 7141      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 7142                     Kettle Original 175g        2     10.80       175
## 7143   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 7144      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7145                     Twisties Cheese 270g        1      4.60       270
## 7146    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7147              Doritos Cheese Supreme 330g        2     11.40       330
## 7148            Pringles Original Crisps 134g        1      3.70       134
## 7149    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7150            Tostitos Smoked Chipotle 175g        2      8.80       175
## 7151                     Twisties Cheese 270g        2      9.20       270
## 7152 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7153         Kettle Sea Salt And Vinegar 175g        1      5.40       175
## 7154  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 7155                     Twisties Cheese 270g        2      9.20       270
## 7156             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 7157                       Kettle Chilli 175g        2     10.80       175
## 7158              Doritos Cheese Supreme 330g        1      5.70       330
## 7159   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7160         Doritos Corn Chips Original 170g        2      8.80       170
## 7161             Dorito Corn Chp Supreme 380g        2     13.00       380
## 7162                    Doritos Mexicana 170g        2      8.80       170
## 7163            Pringles Mystery Flavour 134g        2      7.40       134
## 7164                   Pringles Barbeque 134g        2      7.40       134
## 7165     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 7166   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 7167 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 7168 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 7169                   Pringles Barbeque 134g        3     11.10       134
## 7170             Smiths Crinkle Original 330g        2     11.40       330
## 7171       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 7172                     Twisties Chicken270g        1      4.60       270
## 7173             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 7174              Twisties Cheese Burger 250g        2      8.60       250
## 7175             Dorito Corn Chp Supreme 380g        2     13.00       380
## 7176                   Pringles Barbeque 134g        2      7.40       134
## 7177                 Pringles Slt Vingar 134g        2      7.40       134
## 7178                       Kettle Chilli 175g        2     10.80       175
## 7179 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7180                    Doritos Mexicana 170g        2      8.80       170
## 7181                     Twisties Chicken270g        2      9.20       270
## 7182                       Kettle Chilli 175g        2     10.80       175
## 7183             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 7184             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 7185             Tostitos Lightly Salted 175g        2      8.80       175
## 7186                     Cheezels Cheese 330g        2     11.40       330
## 7187                   Pringles Barbeque 134g        2      7.40       134
## 7188         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 7189     Kettle Tortilla ChpsFeta&Garlic 150g        1      4.60       150
## 7190         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 7191         Thins Chips Seasonedchicken 175g        2      6.60       175
## 7192         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 7193            Thins Chips Light& Tangy 175g        2      6.60       175
## 7194                 Pringles Slt Vingar 134g        2      7.40       134
## 7195             Dorito Corn Chp Supreme 380g        2     13.00       380
## 7196    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 7197                     Kettle Original 175g        2     10.80       175
## 7198            Pringles Original Crisps 134g        2      7.40       134
## 7199      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7200              Doritos Cheese Supreme 330g        2     11.40       330
## 7201             Tostitos Splash Of Lime 175g        2      8.80       175
## 7202     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 7203             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 7204   Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 7205         Doritos Corn Chips Original 170g        2      8.80       170
## 7206         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 7207  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 7208      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 7209                     Twisties Cheese 270g        2      9.20       270
## 7210                       Kettle Chilli 175g        2     10.80       175
## 7211         Thins Chips Seasonedchicken 175g        2      6.60       175
## 7212             Smiths Crinkle Original 330g        2     11.40       330
## 7213            Kettle Honey Soy Chicken 175g        2     10.80       175
## 7214    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7215       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 7216            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7217      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7218     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 7219              Doritos Cheese Supreme 330g        2     11.40       330
## 7220  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 7221            Pringles Original Crisps 134g        1      3.70       134
## 7222                       Kettle Chilli 175g        2     10.80       175
## 7223         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 7224             Dorito Corn Chp Supreme 380g        2     13.00       380
## 7225   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 7226                     Kettle Original 175g        2     10.80       175
## 7227         Doritos Corn Chips Original 170g        2      8.80       170
## 7228         Thins Chips Seasonedchicken 175g        2      6.60       175
## 7229 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7230                     Twisties Chicken270g        1      4.60       270
## 7231   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7232      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 7233   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7234              Doritos Cheese Supreme 330g        2     11.40       330
## 7235                       Kettle Chilli 175g        2     10.80       175
## 7236             Tostitos Lightly Salted 175g        2      8.80       175
## 7237       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 7238       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 7239 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 7240                 Pringles Slt Vingar 134g        2      7.40       134
## 7241                 Pringles Slt Vingar 134g        2      7.40       134
## 7242    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 7243   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7244  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 7245 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 7246         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 7247 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 7248                     Kettle Original 175g        2     10.80       175
## 7249         Pringles Chicken Salt Crips 134g        2      7.40       134
## 7250            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 7251     Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 7252  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 7253         Doritos Corn Chips Original 170g        2      8.80       170
## 7254      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 7255             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 7256            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7257 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7258  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7259            Pringles Mystery Flavour 134g        2      7.40       134
## 7260            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7261         Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 7262            Kettle Honey Soy Chicken 175g        2     10.80       175
## 7263            Thins Chips Light& Tangy 175g        2      6.60       175
## 7264      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 7265   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 7266      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 7267             Dorito Corn Chp Supreme 380g        2     13.00       380
## 7268   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 7269  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7270      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 7271          Thins Chips Salt & Vinegar 175g        1      3.30       175
## 7272                   Pringles Barbeque 134g        2      7.40       134
## 7273             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 7274      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 7275            Pringles SourCream Onion 134g        2      7.40       134
## 7276  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7277            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7278              Doritos Cheese Supreme 330g        1      5.70       330
## 7279     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 7280         Pringles Sthrn FriedChicken 134g        1      3.70       134
## 7281             Tostitos Lightly Salted 175g        2      8.80       175
## 7282      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7283     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 7284                     Twisties Cheese 270g        2      9.20       270
## 7285    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 7286            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 7287 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7288 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7289              Twisties Cheese Burger 250g        2      8.60       250
## 7290                     Twisties Chicken270g        2      9.20       270
## 7291         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 7292   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 7293    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 7294         Thins Chips Seasonedchicken 175g        2      6.60       175
## 7295            Pringles Mystery Flavour 134g        2      7.40       134
## 7296              Doritos Cheese Supreme 330g        2     11.40       330
## 7297             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 7298                     Twisties Cheese 270g        2      9.20       270
## 7299            Pringles Mystery Flavour 134g        2      7.40       134
## 7300            Pringles SourCream Onion 134g        2      7.40       134
## 7301                     Twisties Chicken270g        2      9.20       270
## 7302                 Pringles Slt Vingar 134g        2      7.40       134
## 7303         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 7304              Doritos Cheese Supreme 330g        2     11.40       330
## 7305    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7306            Pringles SourCream Onion 134g        2      7.40       134
## 7307            Pringles Mystery Flavour 134g        2      7.40       134
## 7308      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 7309  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7310          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 7311     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 7312 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7313            Pringles SourCream Onion 134g        2      7.40       134
## 7314    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 7315 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7316         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 7317                     Cheezels Cheese 330g        2     11.40       330
## 7318         Kettle Sea Salt And Vinegar 175g        1      5.40       175
## 7319      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7320    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7321            Pringles SourCream Onion 134g        2      7.40       134
## 7322     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 7323     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 7324                   Pringles Barbeque 134g        2      7.40       134
## 7325 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7326         Thins Chips Seasonedchicken 175g        2      6.60       175
## 7327     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 7328            Pringles Mystery Flavour 134g        2      7.40       134
## 7329 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7330                     Twisties Chicken270g        2      9.20       270
## 7331          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 7332             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 7333              Twisties Cheese Burger 250g        2      8.60       250
## 7334            Pringles Mystery Flavour 134g        2      7.40       134
## 7335            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7336             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 7337    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7338         Doritos Corn Chips Original 170g        2      8.80       170
## 7339 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 7340            Pringles Original Crisps 134g        2      7.40       134
## 7341         Pringles Chicken Salt Crips 134g        2      7.40       134
## 7342             Tostitos Splash Of Lime 175g        2      8.80       175
## 7343                 Pringles Slt Vingar 134g        2      7.40       134
## 7344         Thins Chips Seasonedchicken 175g        2      6.60       175
## 7345  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 7346            Thins Chips Light& Tangy 175g        2      6.60       175
## 7347   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7348 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7349             Dorito Corn Chp Supreme 380g        2     13.00       380
## 7350            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 7351            Thins Chips Light& Tangy 175g        2      6.60       175
## 7352            Tostitos Smoked Chipotle 175g        2      8.80       175
## 7353                     Kettle Original 175g        2     10.80       175
## 7354  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 7355             Tostitos Lightly Salted 175g        2      8.80       175
## 7356                 Pringles Slt Vingar 134g        2      7.40       134
## 7357            Kettle Honey Soy Chicken 175g        2     10.80       175
## 7358                     Kettle Original 175g        2     10.80       175
## 7359  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7360    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 7361            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7362                   Pringles Barbeque 134g        2      7.40       134
## 7363 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 7364       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 7365      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7366 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7367            Kettle Honey Soy Chicken 175g        2     10.80       175
## 7368 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7369             Tostitos Lightly Salted 175g        4     17.60       175
## 7370  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 7371                 Pringles Slt Vingar 134g        2      7.40       134
## 7372  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 7373     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 7374 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 7375 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7376     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 7377                       Kettle Chilli 175g        2     10.80       175
## 7378         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 7379              Doritos Cheese Supreme 330g        2     11.40       330
## 7380                   Pringles Barbeque 134g        2      7.40       134
## 7381            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7382 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 7383   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 7384   Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 7385         Doritos Corn Chips Original 170g        2      8.80       170
## 7386             Tostitos Splash Of Lime 175g        2      8.80       175
## 7387   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 7388             Tostitos Splash Of Lime 175g        2      8.80       175
## 7389                       Kettle Chilli 175g        2     10.80       175
## 7390          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 7391                   Pringles Barbeque 134g        2      7.40       134
## 7392   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 7393             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 7394             Pringles Sweet&Spcy BBQ 134g        1      3.70       134
## 7395         Pringles Chicken Salt Crips 134g        2      7.40       134
## 7396                 Pringles Slt Vingar 134g        2      7.40       134
## 7397            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7398         Pringles Chicken Salt Crips 134g        2      7.40       134
## 7399  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 7400                     Kettle Original 175g        2     10.80       175
## 7401            Thins Chips Light& Tangy 175g        2      6.60       175
## 7402                     Twisties Chicken270g        2      9.20       270
## 7403    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7404 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 7405            Tostitos Smoked Chipotle 175g        2      8.80       175
## 7406            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 7407            Kettle Honey Soy Chicken 175g        2     10.80       175
## 7408 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7409             Tostitos Splash Of Lime 175g        1      4.40       175
## 7410             Dorito Corn Chp Supreme 380g        2     13.00       380
## 7411              Twisties Cheese Burger 250g        2      8.60       250
## 7412             Smiths Crinkle Original 330g        2     11.40       330
## 7413 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 7414         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 7415             Tostitos Lightly Salted 175g        2      8.80       175
## 7416                   Pringles Barbeque 134g        2      7.40       134
## 7417     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 7418    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 7419 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7420         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 7421 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7422   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 7423   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7424            Pringles Mystery Flavour 134g        2      7.40       134
## 7425            Pringles Original Crisps 134g        2      7.40       134
## 7426   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7427       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 7428                     Kettle Original 175g        2     10.80       175
## 7429            Thins Chips Light& Tangy 175g        2      6.60       175
## 7430             Tostitos Lightly Salted 175g        2      8.80       175
## 7431    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 7432         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 7433    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 7434 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7435         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 7436             Dorito Corn Chp Supreme 380g        2     13.00       380
## 7437            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 7438      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 7439                   Pringles Barbeque 134g        2      7.40       134
## 7440         Pringles Chicken Salt Crips 134g        2      7.40       134
## 7441            Pringles Mystery Flavour 134g        2      7.40       134
## 7442      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 7443            Pringles Mystery Flavour 134g        2      7.40       134
## 7444              Twisties Cheese Burger 250g        2      8.60       250
## 7445         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 7446                     Twisties Chicken270g        2      9.20       270
## 7447     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 7448             Smiths Crinkle Original 330g        2     11.40       330
## 7449         Pringles Chicken Salt Crips 134g        2      7.40       134
## 7450                       Kettle Chilli 175g        2     10.80       175
## 7451     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 7452      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7453 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7454                 Pringles Slt Vingar 134g        2      7.40       134
## 7455    Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 7456   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 7457 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7458      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 7459                   Pringles Barbeque 134g        2      7.40       134
## 7460                       Kettle Chilli 175g        2     10.80       175
## 7461  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 7462  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7463    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7464         Kettle Sea Salt And Vinegar 175g        1      5.40       175
## 7465 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 7466                    Doritos Mexicana 170g        2      8.80       170
## 7467              Twisties Cheese Burger 250g        2      8.60       250
## 7468            Kettle Honey Soy Chicken 175g        2     10.80       175
## 7469         Doritos Corn Chips Original 170g        2      8.80       170
## 7470   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 7471            Pringles SourCream Onion 134g        2      7.40       134
## 7472             Dorito Corn Chp Supreme 380g        2     13.00       380
## 7473       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 7474       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 7475                     Kettle Original 175g        2     10.80       175
## 7476     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 7477            Pringles Mystery Flavour 134g        2      7.40       134
## 7478                     Twisties Cheese 270g        2      9.20       270
## 7479  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 7480             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 7481      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7482                 Pringles Slt Vingar 134g        2      7.40       134
## 7483                     Kettle Original 175g        2     10.80       175
## 7484            Pringles Mystery Flavour 134g        2      7.40       134
## 7485                 Pringles Slt Vingar 134g        2      7.40       134
## 7486            Pringles Original Crisps 134g        2      7.40       134
## 7487      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7488         Doritos Corn Chips Original 170g        2      8.80       170
## 7489       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 7490    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 7491       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 7492      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7493          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 7494     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 7495         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 7496         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 7497  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7498                 Pringles Slt Vingar 134g        2      7.40       134
## 7499                       Kettle Chilli 175g        2     10.80       175
## 7500            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 7501       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 7502     Kettle Tortilla ChpsFeta&Garlic 150g        1      4.60       150
## 7503         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 7504  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 7505 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7506            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7507      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 7508                     Cheezels Cheese 330g        2     11.40       330
## 7509    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7510     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 7511            Pringles Mystery Flavour 134g        2      7.40       134
## 7512    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7513                 Pringles Slt Vingar 134g        2      7.40       134
## 7514                     Twisties Chicken270g        2      9.20       270
## 7515     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 7516                     Twisties Cheese 270g        1      4.60       270
## 7517            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 7518            Pringles Mystery Flavour 134g        2      7.40       134
## 7519    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 7520            Pringles Original Crisps 134g        2      7.40       134
## 7521    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7522            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7523                     Twisties Cheese 270g        2      9.20       270
## 7524             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 7525 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7526         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 7527            Tostitos Smoked Chipotle 175g        2      8.80       175
## 7528         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 7529            Kettle Honey Soy Chicken 175g        2     10.80       175
## 7530         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 7531              Twisties Cheese Burger 250g        2      8.60       250
## 7532             Tostitos Lightly Salted 175g        2      8.80       175
## 7533                     Twisties Cheese 270g        2      9.20       270
## 7534         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 7535                    Doritos Mexicana 170g        2      8.80       170
## 7536            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7537 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7538            Pringles SourCream Onion 134g        2      7.40       134
## 7539 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7540             Smiths Crinkle Original 330g        2     11.40       330
## 7541         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 7542    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7543   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 7544              Twisties Cheese Burger 250g        2      8.60       250
## 7545      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 7546 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7547            Pringles Original Crisps 134g        2      7.40       134
## 7548       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 7549   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 7550  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 7551            Tostitos Smoked Chipotle 175g        2      8.80       175
## 7552                 Pringles Slt Vingar 134g        2      7.40       134
## 7553   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 7554      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7555                    Doritos Mexicana 170g        2      8.80       170
## 7556      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 7557             Tostitos Lightly Salted 175g        2      8.80       175
## 7558      Kettle Sensations Siracha Lime 150g        5     23.00       150
## 7559 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 7560          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 7561 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 7562  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7563         Thins Chips Seasonedchicken 175g        2      6.60       175
## 7564     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 7565             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 7566                     Cheezels Cheese 330g        2     11.40       330
## 7567      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 7568     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 7569 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7570   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7571         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 7572             Tostitos Lightly Salted 175g        2      8.80       175
## 7573             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 7574  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 7575 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7576  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 7577                     Twisties Cheese 270g        2      9.20       270
## 7578              Twisties Cheese Burger 250g        2      8.60       250
## 7579     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 7580   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 7581                     Twisties Chicken270g        2      9.20       270
## 7582            Pringles SourCream Onion 134g        2      7.40       134
## 7583    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7584             Dorito Corn Chp Supreme 380g        2     13.00       380
## 7585  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 7586       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 7587                     Kettle Original 175g        2     10.80       175
## 7588             Tostitos Splash Of Lime 175g        2      8.80       175
## 7589    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7590 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 7591            Tostitos Smoked Chipotle 175g        2      8.80       175
## 7592             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 7593      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 7594 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 7595             Tostitos Splash Of Lime 175g        2      8.80       175
## 7596            Pringles Original Crisps 134g        2      7.40       134
## 7597              Doritos Cheese Supreme 330g        2     11.40       330
## 7598            Pringles Original Crisps 134g        2      7.40       134
## 7599 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 7600  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7601 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 7602  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 7603 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 7604            Pringles SourCream Onion 134g        2      7.40       134
## 7605            Pringles Original Crisps 134g        2      7.40       134
## 7606 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 7607                     Kettle Original 175g        2     10.80       175
## 7608 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 7609                   Pringles Barbeque 134g        2      7.40       134
## 7610   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7611 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7612 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7613             Smiths Crinkle Original 330g        2     11.40       330
## 7614   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 7615              Doritos Cheese Supreme 330g        2     11.40       330
## 7616            Pringles Original Crisps 134g        2      7.40       134
## 7617             Kettle 135g Swt Pot Sea Salt        1      4.20       135
## 7618              Doritos Cheese Supreme 330g        2     11.40       330
## 7619            Tostitos Smoked Chipotle 175g        2      8.80       175
## 7620             Smiths Crinkle Original 330g        1      5.70       330
## 7621         Doritos Corn Chips Original 170g        2      8.80       170
## 7622     Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 7623             Tostitos Splash Of Lime 175g        2      8.80       175
## 7624     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 7625     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 7626  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7627                       Kettle Chilli 175g        1      5.40       175
## 7628  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7629 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 7630    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 7631  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 7632   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 7633         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 7634    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 7635  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 7636         Pringles Chicken Salt Crips 134g        2      7.40       134
## 7637   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7638   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7639 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7640         Thins Chips Seasonedchicken 175g        2      6.60       175
## 7641   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7642            Tostitos Smoked Chipotle 175g        2      8.80       175
## 7643   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 7644                       Kettle Chilli 175g        2     10.80       175
## 7645         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 7646            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7647   Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 7648             Smiths Crinkle Original 330g        2     11.40       330
## 7649                   Pringles Barbeque 134g        2      7.40       134
## 7650             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 7651                     Kettle Original 175g        2     10.80       175
## 7652 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 7653         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 7654             Dorito Corn Chp Supreme 380g        2     13.00       380
## 7655                       Kettle Chilli 175g        2     10.80       175
## 7656 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 7657   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 7658          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 7659             Tostitos Lightly Salted 175g        2      8.80       175
## 7660                       Kettle Chilli 175g        2     10.80       175
## 7661 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7662              Doritos Cheese Supreme 330g        2     11.40       330
## 7663    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 7664      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7665         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 7666            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 7667                     Cheezels Cheese 330g        2     11.40       330
## 7668          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 7669         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 7670            Tostitos Smoked Chipotle 175g        2      8.80       175
## 7671            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7672                     Kettle Original 175g        2     10.80       175
## 7673         Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 7674    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 7675   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 7676  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7677                     Twisties Chicken270g        2      9.20       270
## 7678      Smith Crinkle Cut Mac N Cheese 150g        1      2.60       150
## 7679   Smiths Crinkle Cut Salt & Vinegar 170g        1      2.90       170
## 7680       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 7681      Natural Chip Co Tmato Hrb&Spce 175g        1      3.00       175
## 7682         Smith Crinkle Cut Bolognese 150g        1      2.60       150
## 7683          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 7684           WW Original Stacked Chips 160g        2      3.80       160
## 7685      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 7686   Smiths Crinkle Cut Chips Barbecue 170g        2      5.80       170
## 7687                 Cheezels Cheese Box 125g        2      4.20       125
## 7688   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 7689 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 7690      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 7691            Pringles Mystery Flavour 134g        1      3.70       134
## 7692   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 7693         Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 7694             Woolworths Cheese Rings 190g        2      3.60       190
## 7695      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7696             RRD Steak & Chimuchurri 150g        1      2.70       150
## 7697       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 7698             Smiths Crinkle Original 330g        2     11.40       330
## 7699                        CCs Original 175g        1      2.10       175
## 7700               RRD Honey Soy Chicken 165g        2      6.00       165
## 7701            Pringles Original Crisps 134g        2      7.40       134
## 7702           WW Original Stacked Chips 160g        2      3.80       160
## 7703         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 7704     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 7705          RRD SR Slow Rst Pork Belly 150g        1      2.70       150
## 7706   Smiths Crinkle Cut Chips Chs&Onion170g        1      2.90       170
## 7707                     Twisties Chicken270g        2      9.20       270
## 7708              Twisties Cheese Burger 250g        2      8.60       250
## 7709                 Cheezels Cheese Box 125g        1      2.10       125
## 7710     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 7711            Pringles SourCream Onion 134g        2      7.40       134
## 7712     Smiths Chip Thinly Cut Original 175g        1      3.00       175
## 7713            Kettle Honey Soy Chicken 175g        2     10.80       175
## 7714              WW Original Corn Chips 200g        2      3.80       200
## 7715         Pringles Chicken Salt Crips 134g        2      7.40       134
## 7716    Smiths Chip Thinly S/Cream&Onion 175g        1      3.00       175
## 7717                       Kettle Chilli 175g        1      5.40       175
## 7718            Kettle Honey Soy Chicken 175g        2     10.80       175
## 7719                       Kettle Chilli 175g        2     10.80       175
## 7720      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 7721             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 7722     Smiths Thinly Cut Roast Chicken 175g        1      3.00       175
## 7723     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 7724              WW Crinkle Cut Chicken 175g        1      1.70       175
## 7725       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 7726                 Pringles Slt Vingar 134g        3     11.10       134
## 7727 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7728                        CCs Original 175g        2      4.20       175
## 7729  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 7730            Pringles SourCream Onion 134g        2      7.40       134
## 7731     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 7732   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 7733            Kettle Honey Soy Chicken 175g        2     10.80       175
## 7734    Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 7735             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 7736     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 7737                    CCs Nacho Cheese 175g        2      4.20       175
## 7738           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 7739                     RRD Pc Sea Salt 165g        2      6.00       165
## 7740             Tostitos Splash Of Lime 175g        2      8.80       175
## 7741              Doritos Cheese Supreme 330g        2     11.40       330
## 7742                     Cheezels Cheese 330g        2     11.40       330
## 7743                     Twisties Chicken270g        2      9.20       270
## 7744                    CCs Nacho Cheese 175g        2      4.20       175
## 7745   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 7746     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        1      1.70        90
## 7747  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7748             RRD Steak & Chimuchurri 150g        2      5.40       150
## 7749              WW Original Corn Chips 200g        2      3.80       200
## 7750    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 7751    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 7752              WW Original Corn Chips 200g        1      1.90       200
## 7753             Tostitos Splash Of Lime 175g        2      8.80       175
## 7754             Tostitos Lightly Salted 175g        2      8.80       175
## 7755    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 7756         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 7757         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 7758                       Kettle Chilli 175g        2     10.80       175
## 7759         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 7760           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 7761       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 7762                 Pringles Slt Vingar 134g        1      3.70       134
## 7763            Pringles Original Crisps 134g        2      7.40       134
## 7764 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7765        Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 7766       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 7767            Grain Waves Sweet Chilli 210g        1      3.60       210
## 7768            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7769           Thins Chips Originl saltd 175g        1      3.30       175
## 7770      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7771     Red Rock Deli Sp Salt & Truffle 150G        1      2.70       150
## 7772                     RRD Pc Sea Salt 165g        2      6.00       165
## 7773                 Cheezels Cheese Box 125g        2      4.20       125
## 7774            Pringles SourCream Onion 134g        2      7.40       134
## 7775          Natural Chip Compny SeaSalt175g        2      6.00       175
## 7776            Thins Chips Light& Tangy 175g        1      3.30       175
## 7777                     RRD Pc Sea Salt 165g        2      6.00       165
## 7778     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 7779    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 7780             WW Crinkle Cut Original 175g        2      3.40       175
## 7781      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 7782         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 7783      Smith Crinkle Cut Mac N Cheese 150g        2      5.20       150
## 7784                 RRD Chilli& Coconut 150g        2      5.40       150
## 7785              Doritos Cheese Supreme 330g        2     11.40       330
## 7786    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 7787                    CCs Tasty Cheese 175g        2      4.20       175
## 7788         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 7789     Smiths Chip Thinly Cut Original 175g        1      3.00       175
## 7790 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 7791   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 7792   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 7793    Cobs Popd Sour Crm &Chives Chips 110g        1      3.80       110
## 7794   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 7795        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 7796            Pringles Original Crisps 134g        1      3.70       134
## 7797             WW Crinkle Cut Original 175g        2      3.40       175
## 7798            Pringles SourCream Onion 134g        2      7.40       134
## 7799   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7800      Smith Crinkle Cut Mac N Cheese 150g        2      5.20       150
## 7801        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 7802        WW Supreme Cheese Corn Chips 200g        1      1.90       200
## 7803                        Burger Rings 220g        2      4.60       220
## 7804  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 7805          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 7806              WW Crinkle Cut Chicken 175g        2      3.40       175
## 7807        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 7808           WW Original Stacked Chips 160g        2      3.80       160
## 7809    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 7810             Tostitos Lightly Salted 175g        2      8.80       175
## 7811             Woolworths Cheese Rings 190g        2      3.60       190
## 7812       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 7813      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 7814        WW Supreme Cheese Corn Chips 200g        1      1.90       200
## 7815       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 7816      Smith Crinkle Cut Mac N Cheese 150g        2      5.20       150
## 7817 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7818                    CCs Nacho Cheese 175g        2      4.20       175
## 7819      Smith Crinkle Cut Mac N Cheese 150g        2      5.20       150
## 7820            Thins Chips Light& Tangy 175g        2      6.60       175
## 7821  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 7822                     Twisties Chicken270g        2      9.20       270
## 7823    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 7824                    CCs Tasty Cheese 175g        2      4.20       175
## 7825    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 7826      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 7827         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 7828           Thins Chips Originl saltd 175g        2      6.60       175
## 7829             Dorito Corn Chp Supreme 380g        2     13.00       380
## 7830                 Pringles Slt Vingar 134g        2      7.40       134
## 7831   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7832            Thins Chips Light& Tangy 175g        2      6.60       175
## 7833     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 7834                     Twisties Chicken270g        2      9.20       270
## 7835  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 7836       Smiths Crinkle Cut Snag&Sauce 150g        1      2.60       150
## 7837       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 7838    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 7839   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 7840   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 7841    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 7842 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 7843                     RRD Pc Sea Salt 165g        2      6.00       165
## 7844    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 7845                        CCs Original 175g        1      2.10       175
## 7846    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 7847   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 7848              WW Original Corn Chips 200g        2      3.80       200
## 7849      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7850    GrnWves Plus Btroot & Chilli Jam 180g        1      3.10       180
## 7851          Natural Chip Compny SeaSalt175g        2      6.00       175
## 7852        Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 7853      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 7854  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 7855             Tostitos Lightly Salted 175g        2      8.80       175
## 7856       Smiths Crinkle Cut Snag&Sauce 150g        2      5.20       150
## 7857     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 7858        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 7859                  RRD Salt & Vinegar 165g        2      6.00       165
## 7860   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 7861   Infzns Crn Crnchers Tangy Gcamole 110g        1      3.80       110
## 7862  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7863      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 7864      Thins Potato Chips Hot & Spicy 175g        1      3.30       175
## 7865           Thins Chips Originl saltd 175g        2      6.60       175
## 7866 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 7867             Tostitos Splash Of Lime 175g        2      8.80       175
## 7868   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 7869           Thins Chips Originl saltd 175g        1      3.30       175
## 7870      Tyrrells Crisps Lightly Salted 165g        1      4.20       165
## 7871            Tostitos Smoked Chipotle 175g        2      8.80       175
## 7872    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 7873    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 7874              WW Crinkle Cut Chicken 175g        2      3.40       175
## 7875 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7876    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 7877         Pringles Chicken Salt Crips 134g        1      3.70       134
## 7878       RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 7879                    CCs Tasty Cheese 175g        2      4.20       175
## 7880 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 7881    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 7882              Doritos Cheese Supreme 330g        2     11.40       330
## 7883            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 7884    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 7885   Kettle Sensations Camembert & Fig 150g        1      4.60       150
## 7886    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 7887            Pringles SourCream Onion 134g        2      7.40       134
## 7888            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 7889                     RRD Pc Sea Salt 165g        2      6.00       165
## 7890              Twisties Cheese Burger 250g        2      8.60       250
## 7891              Doritos Cheese Supreme 330g        2     11.40       330
## 7892            Tostitos Smoked Chipotle 175g        2      8.80       175
## 7893     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 7894                   RRD Lime & Pepper 165g        1      3.00       165
## 7895        Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 7896           French Fries Potato Chips 175g        1      3.00       175
## 7897            Pringles Mystery Flavour 134g        1      3.70       134
## 7898    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 7899 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7900               RRD Honey Soy Chicken 165g        2      6.00       165
## 7901              Doritos Cheese Supreme 330g        1      5.70       330
## 7902            Tostitos Smoked Chipotle 175g        2      8.80       175
## 7903           French Fries Potato Chips 175g        2      6.00       175
## 7904  Doritos Corn Chip Mexican Jalapeno 150g        1      3.90       150
## 7905                    CCs Nacho Cheese 175g        2      4.20       175
## 7906   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 7907  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 7908              WW Crinkle Cut Chicken 175g        1      1.70       175
## 7909     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 7910        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 7911           WW Original Stacked Chips 160g        2      3.80       160
## 7912   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 7913    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 7914      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 7915                     RRD Pc Sea Salt 165g        1      3.00       165
## 7916 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7917    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 7918            WW D/Style Chip Sea Salt 200g        1      1.90       200
## 7919                  RRD Salt & Vinegar 165g        2      6.00       165
## 7920             Tostitos Splash Of Lime 175g        2      8.80       175
## 7921           WW Original Stacked Chips 160g        2      3.80       160
## 7922            Kettle Honey Soy Chicken 175g        2     10.80       175
## 7923      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 7924             Tostitos Lightly Salted 175g        2      8.80       175
## 7925            Thins Chips Light& Tangy 175g        1      3.30       175
## 7926 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 7927                     Twisties Cheese 270g        2      9.20       270
## 7928            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7929   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 7930             Woolworths Cheese Rings 190g        1      1.80       190
## 7931 Infuzions SourCream&Herbs Veg Strws 110g        1      3.80       110
## 7932    GrnWves Plus Btroot & Chilli Jam 180g        1      3.10       180
## 7933         Doritos Corn Chips Original 170g        2      8.80       170
## 7934    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 7935                     Twisties Cheese 270g        1      4.60       270
## 7936    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 7937           WW Original Stacked Chips 160g        2      3.80       160
## 7938           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 7939      Smith Crinkle Cut Mac N Cheese 150g        2      5.20       150
## 7940          Natural Chip Compny SeaSalt175g        2      6.00       175
## 7941           Cheetos Chs & Bacon Balls 190g        1      3.30       190
## 7942            Pringles SourCream Onion 134g        2      7.40       134
## 7943             RRD Steak & Chimuchurri 150g        2      5.40       150
## 7944     Red Rock Deli Sp Salt & Truffle 150G        1      2.70       150
## 7945   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 7946       Smiths Crinkle Cut Snag&Sauce 150g        2      5.20       150
## 7947      Red Rock Deli Thai Chilli&Lime 150g        1      2.70       150
## 7948     Kettle Tortilla ChpsFeta&Garlic 150g        1      4.60       150
## 7949      Thins Potato Chips Hot & Spicy 175g        1      3.30       175
## 7950   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 7951              Doritos Cheese Supreme 330g        1      5.70       330
## 7952             Smiths Crinkle Original 330g        2     11.40       330
## 7953         Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 7954                     RRD Pc Sea Salt 165g        1      3.00       165
## 7955    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 7956            Grain Waves Sweet Chilli 210g        2      7.20       210
## 7957  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 7958       Smiths Thinly Swt Chli&S/Cream175G        1      3.00       175
## 7959   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 7960      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 7961       Smiths Thinly Swt Chli&S/Cream175G        2      6.00       175
## 7962             Woolworths Cheese Rings 190g        2      3.60       190
## 7963              WW Original Corn Chips 200g        2      3.80       200
## 7964                   Pringles Barbeque 134g        2      7.40       134
## 7965     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 7966         Pringles Chicken Salt Crips 134g        2      7.40       134
## 7967         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 7968            Tostitos Smoked Chipotle 175g        1      4.40       175
## 7969       Smiths Thinly Swt Chli&S/Cream175G        1      3.00       175
## 7970      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 7971    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 7972 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 7973  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 7974 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 7975            Kettle Honey Soy Chicken 175g        1      5.40       175
## 7976      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 7977    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 7978    Smiths Crinkle Cut Chips Chicken 170g        2      5.80       170
## 7979             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 7980                     Cheezels Cheese 330g        2     11.40       330
## 7981                       Kettle Chilli 175g        1      5.40       175
## 7982             Tostitos Splash Of Lime 175g        2      8.80       175
## 7983            Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 7984              Doritos Cheese Supreme 330g        1      5.70       330
## 7985                     Kettle Original 175g        2     10.80       175
## 7986         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 7987             RRD Steak & Chimuchurri 150g        2      5.40       150
## 7988          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 7989         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 7990              Twisties Cheese Burger 250g        2      8.60       250
## 7991   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 7992                 RRD Chilli& Coconut 150g        2      5.40       150
## 7993 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 7994                       Kettle Chilli 175g        1      5.40       175
## 7995  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 7996                 Pringles Slt Vingar 134g        2      7.40       134
## 7997                    CCs Nacho Cheese 175g        2      4.20       175
## 7998         Kettle Sea Salt And Vinegar 175g        1      5.40       175
## 7999                 Cheezels Cheese Box 125g        1      2.10       125
## 8000 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 8001              Doritos Cheese Supreme 330g        2     11.40       330
## 8002    Natural ChipCo Sea Salt & Vinegr 175g        1      3.00       175
## 8003     Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 8004                     Cheezels Cheese 330g        2     11.40       330
## 8005  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 8006             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 8007            Pringles Original Crisps 134g        2      7.40       134
## 8008         Doritos Corn Chips Original 170g        2      8.80       170
## 8009            Grain Waves Sweet Chilli 210g        2      7.20       210
## 8010    Infuzions BBQ Rib Prawn Crackers 110g        1      3.80       110
## 8011            Kettle Honey Soy Chicken 175g        1      5.40       175
## 8012                    Doritos Mexicana 170g        2      8.80       170
## 8013                        Burger Rings 220g        2      4.60       220
## 8014              Doritos Cheese Supreme 330g        2     11.40       330
## 8015 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 8016               RRD Honey Soy Chicken 165g        2      6.00       165
## 8017       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 8018         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 8019     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 8020   WW Sour Cream &OnionStacked Chips 160g        4      7.60       160
## 8021     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 8022        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 8023      NCC Sour Cream & Garden Chives 175g        1      3.00       175
## 8024           Thins Chips Originl saltd 175g        2      6.60       175
## 8025    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 8026                   RRD Lime & Pepper 165g        1      3.00       165
## 8027            WW D/Style Chip Sea Salt 200g        1      1.90       200
## 8028             WW Crinkle Cut Original 175g        2      3.40       175
## 8029  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 8030           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 8031                     Cheezels Cheese 330g        2     11.40       330
## 8032                     Kettle Original 175g        2     10.80       175
## 8033                        CCs Original 175g        2      4.20       175
## 8034              WW Original Corn Chips 200g        2      3.80       200
## 8035             Smiths Crinkle Original 330g        2     11.40       330
## 8036   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 8037    Red Rock Deli Chikn&Garlic Aioli 150g        1      2.70       150
## 8038   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 8039     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 8040 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 8041    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 8042     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 8043       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 8044         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 8045                     Cheezels Cheese 330g        2     11.40       330
## 8046                     Twisties Chicken270g        1      4.60       270
## 8047           WW Original Stacked Chips 160g        2      3.80       160
## 8048     Snbts Whlgrn Crisps Cheddr&Mstrd 90g        2      3.40        90
## 8049      Red Rock Deli Thai Chilli&Lime 150g        1      2.70       150
## 8050           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 8051     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 8052  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 8053              WW Crinkle Cut Chicken 175g        2      3.40       175
## 8054         Pringles Sthrn FriedChicken 134g        1      3.70       134
## 8055    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 8056             RRD Steak & Chimuchurri 150g        1      2.70       150
## 8057    Red Rock Deli Chikn&Garlic Aioli 150g        1      2.70       150
## 8058   Smiths Crinkle Cut Chips Barbecue 170g        2      5.80       170
## 8059       Tyrrells Crisps Ched & Chives 165g        2      8.40       165
## 8060           French Fries Potato Chips 175g        1      3.00       175
## 8061       Smiths Crinkle Cut Snag&Sauce 150g        2      5.20       150
## 8062                   RRD Lime & Pepper 165g        2      6.00       165
## 8063    GrnWves Plus Btroot & Chilli Jam 180g        1      3.10       180
## 8064    Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 8065      Kettle Sensations Siracha Lime 150g        1      4.60       150
## 8066                    Doritos Mexicana 170g        2      8.80       170
## 8067      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 8068                        Burger Rings 220g        2      4.60       220
## 8069   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 8070           Thins Chips Originl saltd 175g        2      6.60       175
## 8071          Thins Chips Salt & Vinegar 175g        1      3.30       175
## 8072    Smiths Chip Thinly CutSalt/Vinegr175g        1      3.00       175
## 8073     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 8074             RRD Steak & Chimuchurri 150g        1      2.70       150
## 8075      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 8076           French Fries Potato Chips 175g        2      6.00       175
## 8077            Kettle Honey Soy Chicken 175g        2     10.80       175
## 8078                    CCs Tasty Cheese 175g        2      4.20       175
## 8079    Smiths Crnkle Chip Orgnl Big Bag 380g        1      5.90       380
## 8080    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 8081     Smiths Thinly Cut Roast Chicken 175g        2      6.00       175
## 8082                     Twisties Chicken270g        2      9.20       270
## 8083         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 8084    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 8085      Kettle Sensations Siracha Lime 150g        2      9.20       150
## 8086   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 8087 Kettle Tortilla ChpsHny&Jlpno Chili 150g        2      9.20       150
## 8088  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 8089                        Burger Rings 220g        2      4.60       220
## 8090                   RRD Lime & Pepper 165g        1      3.00       165
## 8091            Pringles Original Crisps 134g        2      7.40       134
## 8092    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 8093          Natural Chip Compny SeaSalt175g        2      6.00       175
## 8094            Pringles SourCream Onion 134g        2      7.40       134
## 8095      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 8096              Twisties Cheese Burger 250g        2      8.60       250
## 8097     Kettle Mozzarella Basil & Pesto 175g        1      5.40       175
## 8098 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 8099     Kettle Mozzarella Basil & Pesto 175g        2     10.80       175
## 8100      Thins Potato Chips Hot & Spicy 175g        2      6.60       175
## 8101     Doritos Corn Chips Nacho Cheese 170g        1      4.40       170
## 8102               RRD Honey Soy Chicken 165g        2      6.00       165
## 8103       Grain Waves Sour Cream&Chives 210G        1      3.60       210
## 8104                       Cheetos Puffs 165g        2      5.60       165
## 8105              WW Original Corn Chips 200g        1      1.90       200
## 8106 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        1      3.80       110
## 8107 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 8108             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 8109   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 8110                    Doritos Mexicana 170g        2      8.80       170
## 8111         Kettle Sensations BBQ&Maple 150g        2      9.20       150
## 8112    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 8113          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 8114       Smiths Thinly Swt Chli&S/Cream175G        2      6.00       175
## 8115  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 8116                       Cheetos Puffs 165g        2      5.60       165
## 8117             WW Crinkle Cut Original 175g        2      3.40       175
## 8118     Smiths Chip Thinly Cut Original 175g        2      6.00       175
## 8119    Smiths Chip Thinly S/Cream&Onion 175g        1      3.00       175
## 8120    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 8121            Thins Chips Light& Tangy 175g        2      6.60       175
## 8122      Thins Potato Chips Hot & Spicy 175g        1      3.30       175
## 8123            Pringles Mystery Flavour 134g        2      7.40       134
## 8124             Tostitos Splash Of Lime 175g        2      8.80       175
## 8125            WW D/Style Chip Sea Salt 200g        2      3.80       200
## 8126   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 8127  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 8128       RRD Sweet Chilli & Sour Cream 165g        1      3.00       165
## 8129 Cobs Popd Swt/Chlli &Sr/Cream Chips 110g        2      7.60       110
## 8130          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 8131   Kettle Sensations Camembert & Fig 150g        2      9.20       150
## 8132   Smiths Crinkle Cut Chips Barbecue 170g        2      5.80       170
## 8133                        Burger Rings 220g        1      2.30       220
## 8134          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 8135           Cheetos Chs & Bacon Balls 190g        1      3.30       190
## 8136    Smiths Chip Thinly S/Cream&Onion 175g        2      6.00       175
## 8137         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 8138             Woolworths Cheese Rings 190g        2      3.60       190
## 8139  Doritos Corn Chip Mexican Jalapeno 150g        1      3.90       150
## 8140           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 8141            Pringles SourCream Onion 134g        2      7.40       134
## 8142            Tostitos Smoked Chipotle 175g        2      8.80       175
## 8143     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 8144     Red Rock Deli Sp Salt & Truffle 150G        1      2.70       150
## 8145        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 8146   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 8147          Thins Chips Salt & Vinegar 175g        2      6.60       175
## 8148       Tyrrells Crisps Ched & Chives 165g        1      4.20       165
## 8149   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 8150               RRD Honey Soy Chicken 165g        2      6.00       165
## 8151   Smiths Crinkle Cut Chips Barbecue 170g        2      5.80       170
## 8152                        Burger Rings 220g        2      4.60       220
## 8153      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 8154     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 8155                     Twisties Chicken270g        1      4.60       270
## 8156         Kettle Sea Salt And Vinegar 175g        2     10.80       175
## 8157                   Pringles Barbeque 134g        2      7.40       134
## 8158      Smith Crinkle Cut Mac N Cheese 150g        2      5.20       150
## 8159           French Fries Potato Chips 175g        2      6.00       175
## 8160  Kettle Sweet Chilli And Sour Cream 175g        2     10.80       175
## 8161          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 8162            Pringles SourCream Onion 134g        2      7.40       134
## 8163             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 8164    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 8165                     Twisties Cheese 270g        1      4.60       270
## 8166            Pringles SourCream Onion 134g        2      7.40       134
## 8167              WW Original Corn Chips 200g        2      3.80       200
## 8168    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 8169  Kettle Tortilla ChpsBtroot&Ricotta 150g        2      9.20       150
## 8170         Pringles Chicken Salt Crips 134g        2      7.40       134
## 8171     Smiths Thinly Cut Roast Chicken 175g        1      3.00       175
## 8172       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 8173   Doritos Corn Chips Cheese Supreme 170g        1      4.40       170
## 8174    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 8175                   Pringles Barbeque 134g        1      3.70       134
## 8176            Pringles SourCream Onion 134g        2      7.40       134
## 8177      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 8178         Pringles Chicken Salt Crips 134g        1      3.70       134
## 8179   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 8180         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 8181                    CCs Nacho Cheese 175g        2      4.20       175
## 8182    Cobs Popd Sour Crm &Chives Chips 110g        2      7.60       110
## 8183               RRD Honey Soy Chicken 165g        2      6.00       165
## 8184     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 8185    Red Rock Deli Chikn&Garlic Aioli 150g        1      2.70       150
## 8186  Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 8187             Smiths Crinkle Original 330g        2     11.40       330
## 8188           Thins Chips Originl saltd 175g        2      6.60       175
## 8189      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 8190  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 8191  Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 8192       Smiths Crinkle Cut Snag&Sauce 150g        2      5.20       150
## 8193         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 8194   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 8195                     Twisties Cheese 270g        1      4.60       270
## 8196            Grain Waves Sweet Chilli 210g        1      3.60       210
## 8197                       Kettle Chilli 175g        2     10.80       175
## 8198                     Kettle Original 175g        1      5.40       175
## 8199              Doritos Cheese Supreme 330g        1      5.70       330
## 8200   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 8201    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 8202         Kettle Sensations BBQ&Maple 150g        1      4.60       150
## 8203      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 8204            Pringles SourCream Onion 134g        2      7.40       134
## 8205           Thins Chips Originl saltd 175g        2      6.60       175
## 8206         Pringles Sthrn FriedChicken 134g        1      3.70       134
## 8207   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 8208   WW Sour Cream &OnionStacked Chips 160g        1      1.90       160
## 8209                     Twisties Chicken270g        2      9.20       270
## 8210    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 8211      Infuzions Mango Chutny Papadums 70g        2      4.80        70
## 8212   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 8213      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 8214                   RRD Lime & Pepper 165g        2      6.00       165
## 8215              WW Original Corn Chips 200g        2      3.80       200
## 8216              Doritos Cheese Supreme 330g        1      5.70       330
## 8217         Doritos Corn Chips Original 170g        2      8.80       170
## 8218             Tostitos Lightly Salted 175g        2      8.80       175
## 8219             Tostitos Splash Of Lime 175g        2      8.80       175
## 8220            Kettle Honey Soy Chicken 175g        1      5.40       175
## 8221   WW Sour Cream &OnionStacked Chips 160g        2      3.80       160
## 8222              Twisties Cheese Burger 250g        1      4.30       250
## 8223                  RRD Salt & Vinegar 165g        2      6.00       165
## 8224  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 8225  Doritos Corn Chip Mexican Jalapeno 150g        5     19.50       150
## 8226           Thins Chips Originl saltd 175g        2      6.60       175
## 8227                       Kettle Chilli 175g        2     10.80       175
## 8228   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 8229         Doritos Corn Chips Original 170g        2      8.80       170
## 8230      NCC Sour Cream & Garden Chives 175g        2      6.00       175
## 8231             WW Crinkle Cut Original 175g        2      3.40       175
## 8232        Natural ChipCo Hony Soy Chckn175g        1      3.00       175
## 8233          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 8234      NCC Sour Cream & Garden Chives 175g        1      3.00       175
## 8235             Dorito Corn Chp Supreme 380g        1      6.50       380
## 8236       Smiths Thinly Swt Chli&S/Cream175G        2      6.00       175
## 8237                     Cheezels Cheese 330g        2     11.40       330
## 8238    Natural ChipCo Sea Salt & Vinegr 175g        2      6.00       175
## 8239  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 8240             Pringles Sweet&Spcy BBQ 134g        2      7.40       134
## 8241    Natural ChipCo Sea Salt & Vinegr 175g        1      3.00       175
## 8242               RRD Honey Soy Chicken 165g        1      3.00       165
## 8243    Smiths Crnkle Chip Orgnl Big Bag 380g        2     11.80       380
## 8244          Natural Chip Compny SeaSalt175g        2      6.00       175
## 8245    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 8246              Doritos Cheese Supreme 330g        2     11.40       330
## 8247 Smiths Crinkle Chips Salt & Vinegar 330g        2     11.40       330
## 8248                   RRD Lime & Pepper 165g        2      6.00       165
## 8249                   Pringles Barbeque 134g        2      7.40       134
## 8250        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 8251     Kettle Tortilla ChpsFeta&Garlic 150g        2      9.20       150
## 8252            Kettle Honey Soy Chicken 175g        2     10.80       175
## 8253    GrnWves Plus Btroot & Chilli Jam 180g        2      6.20       180
## 8254       Smiths Crinkle Cut Snag&Sauce 150g        1      2.60       150
## 8255 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 8256             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 8257        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 8258   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 8259            Cobs Popd Sea Salt Chips 110g        1      3.80       110
## 8260          Natural Chip Compny SeaSalt175g        1      3.00       175
## 8261    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 8262      Red Rock Deli Thai Chilli&Lime 150g        2      5.40       150
## 8263    Smiths Chip Thinly S/Cream&Onion 175g        1      3.00       175
## 8264           French Fries Potato Chips 175g        1      3.00       175
## 8265            Grain Waves Sweet Chilli 210g        2      7.20       210
## 8266     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 8267                        Burger Rings 220g        2      4.60       220
## 8268    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 8269  Doritos Corn Chip Mexican Jalapeno 150g        2      7.80       150
## 8270        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 8271  Kettle Tortilla ChpsBtroot&Ricotta 150g        1      4.60       150
## 8272    Sunbites Whlegrn Crisps Frch/Onin 90g        2      3.40        90
## 8273           WW Original Stacked Chips 160g        2      3.80       160
## 8274      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 8275   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 8276    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 8277        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 8278 Infuzions Thai SweetChili PotatoMix 110g        2      7.60       110
## 8279              Doritos Cheese Supreme 330g        2     11.40       330
## 8280        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 8281  Doritos Corn Chip Southern Chicken 150g        2      7.80       150
## 8282           Cheetos Chs & Bacon Balls 190g        2      6.60       190
## 8283 Infuzions SourCream&Herbs Veg Strws 110g        2      7.60       110
## 8284    Infuzions BBQ Rib Prawn Crackers 110g        2      7.60       110
## 8285         Pringles Chicken Salt Crips 134g        2      7.40       134
## 8286    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 8287   Smiths Crinkle Cut Chips Chs&Onion170g        2      5.80       170
## 8288   Smiths Crinkle Cut Salt & Vinegar 170g        2      5.80       170
## 8289             Tostitos Splash Of Lime 175g        2      8.80       175
## 8290               RRD Honey Soy Chicken 165g        2      6.00       165
## 8291           French Fries Potato Chips 175g        2      6.00       175
## 8292             Tostitos Splash Of Lime 175g        1      4.40       175
## 8293    Smiths Chip Thinly CutSalt/Vinegr175g        2      6.00       175
## 8294         Thins Chips Seasonedchicken 175g        2      6.60       175
## 8295    Red Rock Deli Chikn&Garlic Aioli 150g        2      5.40       150
## 8296   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 8297       RRD Sweet Chilli & Sour Cream 165g        2      6.00       165
## 8298            Cobs Popd Sea Salt Chips 110g        2      7.60       110
## 8299      Tyrrells Crisps Lightly Salted 165g        2      8.40       165
## 8300      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 8301           WW Original Stacked Chips 160g        2      3.80       160
## 8302     Red Rock Deli Sp Salt & Truffle 150G        2      5.40       150
## 8303            Pringles Original Crisps 134g        2      7.40       134
## 8304         Smith Crinkle Cut Bolognese 150g        2      5.20       150
## 8305         Pringles Sthrn FriedChicken 134g        2      7.40       134
## 8306          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 8307        WW Supreme Cheese Corn Chips 200g        2      3.80       200
## 8308          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 8309             Smiths Crinkle Original 330g        2     11.40       330
## 8310          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 8311      Natural Chip Co Tmato Hrb&Spce 175g        2      6.00       175
## 8312                       Kettle Chilli 175g        2     10.80       175
## 8313                    Doritos Mexicana 170g        2      8.80       170
## 8314             Dorito Corn Chp Supreme 380g        2     13.00       380
## 8315             Smiths Crinkle Original 330g        2     11.40       330
## 8316        Natural ChipCo Hony Soy Chckn175g        2      6.00       175
## 8317         Doritos Corn Chips Original 170g        2      8.80       170
## 8318                 Cheezels Cheese Box 125g        2      4.20       125
## 8319          RRD SR Slow Rst Pork Belly 150g        2      5.40       150
## 8320       Grain Waves Sour Cream&Chives 210G        2      7.20       210
## 8321  Smiths Crinkle Cut French OnionDip 150g        2      5.20       150
## 8322             Kettle 135g Swt Pot Sea Salt        2      8.40       135
## 8323              WW Original Corn Chips 200g        2      3.80       200
## 8324                  RRD Salt & Vinegar 165g        2      6.00       165
## 8325   Infzns Crn Crnchers Tangy Gcamole 110g        2      7.60       110
## 8326            Kettle Honey Soy Chicken 175g        2     10.80       175
## 8327                    CCs Tasty Cheese 175g        2      4.20       175
## 8328                     Kettle Original 175g        2     10.80       175
## 8329   Doritos Corn Chips Cheese Supreme 170g        2      8.80       170
## 8330           Thins Chips Originl saltd 175g        2      6.60       175
## 8331             Tostitos Lightly Salted 175g        2      8.80       175
## 8332     Doritos Corn Chips Nacho Cheese 170g        2      8.80       170
## 8333       Grain Waves Sour Cream&Chives 210G        2      7.20       210
##           BRAND              LIFESTAGE PREMIUM_CUSTOMER
## 1       NATURAL  YOUNG SINGLES/COUPLES          Premium
## 2           RED  YOUNG SINGLES/COUPLES       Mainstream
## 3       NATURAL         YOUNG FAMILIES           Budget
## 4         GRAIN         YOUNG FAMILIES           Budget
## 5            WW  OLDER SINGLES/COUPLES       Mainstream
## 6       CHEETOS MIDAGE SINGLES/COUPLES       Mainstream
## 7     INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 8           RRD  YOUNG SINGLES/COUPLES           Budget
## 9       DORITOS           NEW FAMILIES          Premium
## 10      DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 11    INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 12       SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 13      GRNWVES  OLDER SINGLES/COUPLES       Mainstream
## 14       KETTLE         OLDER FAMILIES       Mainstream
## 15      DORITOS         OLDER FAMILIES       Mainstream
## 16          CCS               RETIREES           Budget
## 17      DORITOS               RETIREES           Budget
## 18     TOSTITOS         OLDER FAMILIES       Mainstream
## 19       KETTLE         OLDER FAMILIES       Mainstream
## 20          RRD  YOUNG SINGLES/COUPLES       Mainstream
## 21       KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 22    INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 23      GRNWVES  OLDER SINGLES/COUPLES          Premium
## 24       SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 25       SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 26      GRNWVES  YOUNG SINGLES/COUPLES       Mainstream
## 27       KETTLE         OLDER FAMILIES           Budget
## 28          RRD MIDAGE SINGLES/COUPLES          Premium
## 29      NATURAL  YOUNG SINGLES/COUPLES          Premium
## 30       SMITHS         YOUNG FAMILIES           Budget
## 31          CCS MIDAGE SINGLES/COUPLES          Premium
## 32    INFUZIONS         OLDER FAMILIES          Premium
## 33       SMITHS         OLDER FAMILIES          Premium
## 34          RRD               RETIREES       Mainstream
## 35      NATURAL               RETIREES          Premium
## 36         COBS               RETIREES          Premium
## 37          RRD         OLDER FAMILIES       Mainstream
## 38      NATURAL         YOUNG FAMILIES       Mainstream
## 39       BURGER  YOUNG SINGLES/COUPLES          Premium
## 40   WOOLWORTHS  YOUNG SINGLES/COUPLES          Premium
## 41       KETTLE  YOUNG SINGLES/COUPLES          Premium
## 42       SMITHS  YOUNG SINGLES/COUPLES          Premium
## 43        THINS         YOUNG FAMILIES           Budget
## 44       SMITHS         YOUNG FAMILIES       Mainstream
## 45     TYRRELLS  YOUNG SINGLES/COUPLES           Budget
## 46       SMITHS         OLDER FAMILIES       Mainstream
## 47    INFUZIONS         OLDER FAMILIES       Mainstream
## 48      DORITOS         OLDER FAMILIES       Mainstream
## 49       SMITHS         YOUNG FAMILIES           Budget
## 50       SMITHS  YOUNG SINGLES/COUPLES           Budget
## 51        THINS MIDAGE SINGLES/COUPLES           Budget
## 52      DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 53       KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 54       KETTLE           NEW FAMILIES       Mainstream
## 55       SMITHS           NEW FAMILIES       Mainstream
## 56        SMITH               RETIREES       Mainstream
## 57      DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 58       KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 59     CHEEZELS MIDAGE SINGLES/COUPLES       Mainstream
## 60     TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 61     TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 62      DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 63        THINS  OLDER SINGLES/COUPLES           Budget
## 64          RRD         YOUNG FAMILIES          Premium
## 65           WW         YOUNG FAMILIES          Premium
## 66    INFUZIONS         YOUNG FAMILIES           Budget
## 67       SMITHS         YOUNG FAMILIES           Budget
## 68    INFUZIONS MIDAGE SINGLES/COUPLES          Premium
## 69      GRNWVES MIDAGE SINGLES/COUPLES          Premium
## 70     SUNBITES  OLDER SINGLES/COUPLES       Mainstream
## 71       SMITHS  YOUNG SINGLES/COUPLES          Premium
## 72     SUNBITES  YOUNG SINGLES/COUPLES          Premium
## 73       KETTLE         YOUNG FAMILIES       Mainstream
## 74       SMITHS           NEW FAMILIES          Premium
## 75     SUNBITES           NEW FAMILIES          Premium
## 76       SMITHS               RETIREES           Budget
## 77       SMITHS  YOUNG SINGLES/COUPLES           Budget
## 78       KETTLE  OLDER SINGLES/COUPLES          Premium
## 79           WW               RETIREES           Budget
## 80       SMITHS               RETIREES           Budget
## 81       SMITHS               RETIREES           Budget
## 82       SMITHS MIDAGE SINGLES/COUPLES           Budget
## 83           WW MIDAGE SINGLES/COUPLES           Budget
## 84       KETTLE MIDAGE SINGLES/COUPLES           Budget
## 85         COBS  YOUNG SINGLES/COUPLES           Budget
## 86     TOSTITOS               RETIREES          Premium
## 87      NATURAL               RETIREES          Premium
## 88    INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 89          RRD               RETIREES       Mainstream
## 90          RRD         OLDER FAMILIES           Budget
## 91          CCS           NEW FAMILIES           Budget
## 92        SNBTS               RETIREES          Premium
## 93       KETTLE           NEW FAMILIES           Budget
## 94          RRD           NEW FAMILIES           Budget
## 95     PRINGLES           NEW FAMILIES           Budget
## 96       SMITHS               RETIREES       Mainstream
## 97     PRINGLES  OLDER SINGLES/COUPLES          Premium
## 98       FRENCH               RETIREES           Budget
## 99       KETTLE               RETIREES           Budget
## 100       SNBTS               RETIREES           Budget
## 101     DORITOS  OLDER SINGLES/COUPLES          Premium
## 102  WOOLWORTHS  OLDER SINGLES/COUPLES          Premium
## 103         RRD               RETIREES       Mainstream
## 104         CCS         OLDER FAMILIES           Budget
## 105      SMITHS         OLDER FAMILIES           Budget
## 106    TOSTITOS               RETIREES       Mainstream
## 107      SMITHS               RETIREES       Mainstream
## 108   INFUZIONS               RETIREES       Mainstream
## 109    TYRRELLS               RETIREES       Mainstream
## 110         CCS               RETIREES          Premium
## 111      SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 112       SMITH               RETIREES       Mainstream
## 113      SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 114         CCS               RETIREES          Premium
## 115     DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 116    TWISTIES         OLDER FAMILIES          Premium
## 117         RED         OLDER FAMILIES          Premium
## 118     NATURAL               RETIREES          Premium
## 119         RRD  OLDER SINGLES/COUPLES          Premium
## 120      SMITHS  OLDER SINGLES/COUPLES          Premium
## 121    PRINGLES  OLDER SINGLES/COUPLES          Premium
## 122         RRD               RETIREES       Mainstream
## 123         RED               RETIREES       Mainstream
## 124  WOOLWORTHS               RETIREES       Mainstream
## 125     DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 126          WW  OLDER SINGLES/COUPLES          Premium
## 127      SMITHS  OLDER SINGLES/COUPLES          Premium
## 128    PRINGLES  OLDER SINGLES/COUPLES           Budget
## 129          WW MIDAGE SINGLES/COUPLES       Mainstream
## 130     NATURAL               RETIREES       Mainstream
## 131      SMITHS  OLDER SINGLES/COUPLES          Premium
## 132    CHEEZELS               RETIREES       Mainstream
## 133         RED         YOUNG FAMILIES           Budget
## 134      SMITHS               RETIREES       Mainstream
## 135      SMITHS               RETIREES       Mainstream
## 136    TOSTITOS               RETIREES       Mainstream
## 137         CCS         OLDER FAMILIES           Budget
## 138          WW  OLDER SINGLES/COUPLES          Premium
## 139    TYRRELLS  OLDER SINGLES/COUPLES          Premium
## 140     DORITOS               RETIREES       Mainstream
## 141      INFZNS  YOUNG SINGLES/COUPLES       Mainstream
## 142        COBS  YOUNG SINGLES/COUPLES       Mainstream
## 143    TOSTITOS         OLDER FAMILIES          Premium
## 144         CCS         OLDER FAMILIES          Premium
## 145         CCS  YOUNG SINGLES/COUPLES          Premium
## 146          WW  YOUNG SINGLES/COUPLES          Premium
## 147        COBS  YOUNG SINGLES/COUPLES          Premium
## 148      KETTLE           NEW FAMILIES          Premium
## 149      SMITHS         YOUNG FAMILIES       Mainstream
## 150      SMITHS  YOUNG SINGLES/COUPLES           Budget
## 151     NATURAL  YOUNG SINGLES/COUPLES           Budget
## 152    CHEEZELS  YOUNG SINGLES/COUPLES           Budget
## 153         RRD  OLDER SINGLES/COUPLES           Budget
## 154    PRINGLES               RETIREES          Premium
## 155         CCS  OLDER SINGLES/COUPLES       Mainstream
## 156    PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 157       GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 158     DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 159      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 160    PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 161     NATURAL  YOUNG SINGLES/COUPLES       Mainstream
## 162      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 163         RRD  YOUNG SINGLES/COUPLES       Mainstream
## 164   INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 165     NATURAL  YOUNG SINGLES/COUPLES           Budget
## 166    TOSTITOS  YOUNG SINGLES/COUPLES          Premium
## 167     CHEETOS           NEW FAMILIES           Budget
## 168         RRD           NEW FAMILIES           Budget
## 169     NATURAL         OLDER FAMILIES       Mainstream
## 170         CCS               RETIREES       Mainstream
## 171     NATURAL               RETIREES       Mainstream
## 172     NATURAL               RETIREES       Mainstream
## 173   INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 174     CHEETOS  OLDER SINGLES/COUPLES           Budget
## 175    PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 176    TYRRELLS               RETIREES       Mainstream
## 177      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 178      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 179     DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 180          WW  YOUNG SINGLES/COUPLES          Premium
## 181    PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 182      SMITHS  YOUNG SINGLES/COUPLES           Budget
## 183         RRD  YOUNG SINGLES/COUPLES           Budget
## 184   INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 185        COBS MIDAGE SINGLES/COUPLES           Budget
## 186          WW           NEW FAMILIES           Budget
## 187       SNBTS           NEW FAMILIES           Budget
## 188         RED         YOUNG FAMILIES           Budget
## 189          WW               RETIREES       Mainstream
## 190      KETTLE               RETIREES       Mainstream
## 191         RED               RETIREES           Budget
## 192         RRD               RETIREES           Budget
## 193      KETTLE         OLDER FAMILIES           Budget
## 194    CHEEZELS  YOUNG SINGLES/COUPLES       Mainstream
## 195         RRD  YOUNG SINGLES/COUPLES           Budget
## 196         RRD  YOUNG SINGLES/COUPLES           Budget
## 197    TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 198      KETTLE         YOUNG FAMILIES          Premium
## 199    CHEEZELS               RETIREES          Premium
## 200  WOOLWORTHS               RETIREES       Mainstream
## 201      SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 202    CHEEZELS         YOUNG FAMILIES          Premium
## 203      KETTLE         YOUNG FAMILIES          Premium
## 204    CHEEZELS         OLDER FAMILIES       Mainstream
## 205       THINS               RETIREES          Premium
## 206   INFUZIONS               RETIREES          Premium
## 207      KETTLE           NEW FAMILIES       Mainstream
## 208    CHEEZELS           NEW FAMILIES       Mainstream
## 209         RED           NEW FAMILIES       Mainstream
## 210         RED MIDAGE SINGLES/COUPLES          Premium
## 211         RED  YOUNG SINGLES/COUPLES       Mainstream
## 212     DORITOS  OLDER SINGLES/COUPLES          Premium
## 213          WW           NEW FAMILIES       Mainstream
## 214         CCS         OLDER FAMILIES       Mainstream
## 215        COBS  OLDER SINGLES/COUPLES           Budget
## 216      DORITO  OLDER SINGLES/COUPLES          Premium
## 217    CHEEZELS  OLDER SINGLES/COUPLES       Mainstream
## 218         RRD  OLDER SINGLES/COUPLES       Mainstream
## 219      SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 220        COBS MIDAGE SINGLES/COUPLES       Mainstream
## 221      SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 222          WW  YOUNG SINGLES/COUPLES           Budget
## 223      KETTLE         OLDER FAMILIES           Budget
## 224      SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 225    TWISTIES MIDAGE SINGLES/COUPLES       Mainstream
## 226      SMITHS  YOUNG SINGLES/COUPLES          Premium
## 227    PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 228      SMITHS  YOUNG SINGLES/COUPLES          Premium
## 229      SMITHS               RETIREES       Mainstream
## 230      SMITHS               RETIREES       Mainstream
## 231          WW         YOUNG FAMILIES       Mainstream
## 232     DORITOS         YOUNG FAMILIES       Mainstream
## 233      KETTLE         YOUNG FAMILIES       Mainstream
## 234      FRENCH         OLDER FAMILIES           Budget
## 235     DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 236    PRINGLES  OLDER SINGLES/COUPLES          Premium
## 237    PRINGLES         OLDER FAMILIES       Mainstream
## 238      INFZNS  OLDER SINGLES/COUPLES          Premium
## 239    CHEEZELS  OLDER SINGLES/COUPLES          Premium
## 240       SMITH  OLDER SINGLES/COUPLES          Premium
## 241       THINS               RETIREES       Mainstream
## 242          WW               RETIREES       Mainstream
## 243       SNBTS  OLDER SINGLES/COUPLES           Budget
## 244          WW  OLDER SINGLES/COUPLES           Budget
## 245      KETTLE         YOUNG FAMILIES           Budget
## 246        COBS               RETIREES           Budget
## 247   INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 248         RRD               RETIREES          Premium
## 249    TOSTITOS               RETIREES          Premium
## 250      SMITHS               RETIREES           Budget
## 251      SMITHS         OLDER FAMILIES           Budget
## 252      KETTLE               RETIREES           Budget
## 253  WOOLWORTHS               RETIREES           Budget
## 254    TOSTITOS         YOUNG FAMILIES       Mainstream
## 255          WW         YOUNG FAMILIES       Mainstream
## 256      KETTLE         YOUNG FAMILIES       Mainstream
## 257     DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 258      KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 259      DORITO         YOUNG FAMILIES          Premium
## 260    TYRRELLS               RETIREES          Premium
## 261    TWISTIES               RETIREES          Premium
## 262     NATURAL               RETIREES          Premium
## 263      SMITHS  YOUNG SINGLES/COUPLES           Budget
## 264    PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 265     DORITOS  YOUNG SINGLES/COUPLES           Budget
## 266   INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 267    PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 268      KETTLE               RETIREES           Budget
## 269     CHEETOS               RETIREES           Budget
## 270      SMITHS  OLDER SINGLES/COUPLES          Premium
## 271    PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 272   INFUZIONS               RETIREES       Mainstream
## 273    TWISTIES               RETIREES       Mainstream
## 274         RRD MIDAGE SINGLES/COUPLES       Mainstream
## 275       THINS  OLDER SINGLES/COUPLES          Premium
## 276      BURGER  OLDER SINGLES/COUPLES          Premium
## 277      KETTLE           NEW FAMILIES       Mainstream
## 278    TWISTIES           NEW FAMILIES       Mainstream
## 279        COBS           NEW FAMILIES       Mainstream
## 280      KETTLE  OLDER SINGLES/COUPLES           Budget
## 281      SMITHS  OLDER SINGLES/COUPLES           Budget
## 282         RED         OLDER FAMILIES           Budget
## 283         RRD  YOUNG SINGLES/COUPLES           Budget
## 284          WW         OLDER FAMILIES           Budget
## 285     NATURAL         YOUNG FAMILIES       Mainstream
## 286      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 287         RRD  YOUNG SINGLES/COUPLES       Mainstream
## 288      BURGER  YOUNG SINGLES/COUPLES       Mainstream
## 289    TWISTIES               RETIREES       Mainstream
## 290    TYRRELLS         OLDER FAMILIES           Budget
## 291    PRINGLES         OLDER FAMILIES           Budget
## 292         CCS         OLDER FAMILIES           Budget
## 293          WW  YOUNG SINGLES/COUPLES          Premium
## 294    PRINGLES               RETIREES           Budget
## 295      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 296    SUNBITES  YOUNG SINGLES/COUPLES       Mainstream
## 297          WW  YOUNG SINGLES/COUPLES       Mainstream
## 298          WW  YOUNG SINGLES/COUPLES       Mainstream
## 299         CCS               RETIREES          Premium
## 300      KETTLE  OLDER SINGLES/COUPLES           Budget
## 301      SMITHS               RETIREES           Budget
## 302     DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 303      SMITHS         YOUNG FAMILIES       Mainstream
## 304          WW         YOUNG FAMILIES       Mainstream
## 305       THINS  YOUNG SINGLES/COUPLES       Mainstream
## 306     DORITOS  YOUNG SINGLES/COUPLES           Budget
## 307      SMITHS  YOUNG SINGLES/COUPLES           Budget
## 308    TOSTITOS               RETIREES           Budget
## 309         CCS MIDAGE SINGLES/COUPLES           Budget
## 310          WW MIDAGE SINGLES/COUPLES           Budget
## 311         CCS MIDAGE SINGLES/COUPLES           Budget
## 312      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 313       SMITH  OLDER SINGLES/COUPLES           Budget
## 314      SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 315       THINS  YOUNG SINGLES/COUPLES           Budget
## 316     CHEETOS  YOUNG SINGLES/COUPLES           Budget
## 317         RRD  YOUNG SINGLES/COUPLES           Budget
## 318    TOSTITOS  YOUNG SINGLES/COUPLES           Budget
## 319     NATURAL  YOUNG SINGLES/COUPLES           Budget
## 320          WW  YOUNG SINGLES/COUPLES           Budget
## 321     DORITOS         OLDER FAMILIES          Premium
## 322      KETTLE           NEW FAMILIES       Mainstream
## 323         NCC           NEW FAMILIES       Mainstream
## 324       GRAIN           NEW FAMILIES       Mainstream
## 325      KETTLE  YOUNG SINGLES/COUPLES          Premium
## 326    PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 327          WW  YOUNG SINGLES/COUPLES           Budget
## 328     DORITOS               RETIREES       Mainstream
## 329       THINS               RETIREES       Mainstream
## 330      KETTLE               RETIREES       Mainstream
## 331     DORITOS               RETIREES          Premium
## 332    PRINGLES               RETIREES          Premium
## 333          WW               RETIREES          Premium
## 334    TOSTITOS           NEW FAMILIES           Budget
## 335    PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 336      BURGER  YOUNG SINGLES/COUPLES           Budget
## 337      SMITHS               RETIREES           Budget
## 338         RRD               RETIREES           Budget
## 339       SMITH               RETIREES       Mainstream
## 340         RRD  YOUNG SINGLES/COUPLES       Mainstream
## 341         RED         OLDER FAMILIES          Premium
## 342          WW         YOUNG FAMILIES       Mainstream
## 343     DORITOS               RETIREES       Mainstream
## 344      SMITHS MIDAGE SINGLES/COUPLES           Budget
## 345    PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 346     NATURAL  OLDER SINGLES/COUPLES       Mainstream
## 347      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 348     DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 349     NATURAL  YOUNG SINGLES/COUPLES       Mainstream
## 350      SMITHS               RETIREES       Mainstream
## 351       THINS MIDAGE SINGLES/COUPLES           Budget
## 352         RED MIDAGE SINGLES/COUPLES           Budget
## 353      SMITHS  OLDER SINGLES/COUPLES           Budget
## 354     CHEETOS  OLDER SINGLES/COUPLES           Budget
## 355        COBS         OLDER FAMILIES           Budget
## 356         CCS         OLDER FAMILIES           Budget
## 357      KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 358   INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 359      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 360          WW  OLDER SINGLES/COUPLES           Budget
## 361         RED         OLDER FAMILIES          Premium
## 362    TWISTIES  OLDER SINGLES/COUPLES           Budget
## 363    PRINGLES  OLDER SINGLES/COUPLES           Budget
## 364      BURGER  OLDER SINGLES/COUPLES           Budget
## 365       THINS         OLDER FAMILIES       Mainstream
## 366         RRD  YOUNG SINGLES/COUPLES       Mainstream
## 367      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 368      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 369      INFZNS  YOUNG SINGLES/COUPLES       Mainstream
## 370    PRINGLES               RETIREES           Budget
## 371      KETTLE         OLDER FAMILIES       Mainstream
## 372        COBS         YOUNG FAMILIES           Budget
## 373       THINS               RETIREES          Premium
## 374       THINS               RETIREES          Premium
## 375         RRD               RETIREES       Mainstream
## 376    TWISTIES               RETIREES       Mainstream
## 377          WW MIDAGE SINGLES/COUPLES          Premium
## 378      SMITHS         OLDER FAMILIES           Budget
## 379       SMITH         OLDER FAMILIES           Budget
## 380     DORITOS         OLDER FAMILIES           Budget
## 381     NATURAL           NEW FAMILIES          Premium
## 382         RRD           NEW FAMILIES          Premium
## 383      INFZNS           NEW FAMILIES          Premium
## 384     GRNWVES         OLDER FAMILIES           Budget
## 385          WW MIDAGE SINGLES/COUPLES          Premium
## 386      KETTLE MIDAGE SINGLES/COUPLES          Premium
## 387         NCC  OLDER SINGLES/COUPLES          Premium
## 388         CCS               RETIREES       Mainstream
## 389         CCS               RETIREES       Mainstream
## 390    PRINGLES               RETIREES       Mainstream
## 391  WOOLWORTHS  OLDER SINGLES/COUPLES          Premium
## 392     GRNWVES  OLDER SINGLES/COUPLES          Premium
## 393    TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 394    TOSTITOS  YOUNG SINGLES/COUPLES          Premium
## 395    TWISTIES  YOUNG SINGLES/COUPLES          Premium
## 396         RRD  YOUNG SINGLES/COUPLES          Premium
## 397      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 398    PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 399     NATURAL  YOUNG SINGLES/COUPLES           Budget
## 400       THINS  YOUNG SINGLES/COUPLES           Budget
## 401       THINS  YOUNG SINGLES/COUPLES           Budget
## 402         CCS  OLDER SINGLES/COUPLES       Mainstream
## 403      BURGER         YOUNG FAMILIES          Premium
## 404      SMITHS         YOUNG FAMILIES           Budget
## 405      SMITHS         YOUNG FAMILIES           Budget
## 406    TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 407      SMITHS MIDAGE SINGLES/COUPLES           Budget
## 408         RRD MIDAGE SINGLES/COUPLES          Premium
## 409    SUNBITES  YOUNG SINGLES/COUPLES       Mainstream
## 410          WW MIDAGE SINGLES/COUPLES          Premium
## 411       GRAIN               RETIREES          Premium
## 412    PRINGLES               RETIREES          Premium
## 413          WW           NEW FAMILIES          Premium
## 414          WW           NEW FAMILIES          Premium
## 415     DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 416      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 417         RED  YOUNG SINGLES/COUPLES       Mainstream
## 418         RRD         YOUNG FAMILIES           Budget
## 419       GRAIN         YOUNG FAMILIES           Budget
## 420          WW  OLDER SINGLES/COUPLES       Mainstream
## 421    PRINGLES  OLDER SINGLES/COUPLES          Premium
## 422          WW  OLDER SINGLES/COUPLES          Premium
## 423      KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 424          WW               RETIREES       Mainstream
## 425    TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 426     GRNWVES  YOUNG SINGLES/COUPLES       Mainstream
## 427      SMITHS               RETIREES           Budget
## 428     NATURAL MIDAGE SINGLES/COUPLES           Budget
## 429      KETTLE MIDAGE SINGLES/COUPLES           Budget
## 430          WW MIDAGE SINGLES/COUPLES           Budget
## 431     DORITOS MIDAGE SINGLES/COUPLES           Budget
## 432         RED         OLDER FAMILIES       Mainstream
## 433         RED         OLDER FAMILIES           Budget
## 434         RRD         OLDER FAMILIES           Budget
## 435     DORITOS               RETIREES       Mainstream
## 436    SUNBITES               RETIREES       Mainstream
## 437      SMITHS               RETIREES       Mainstream
## 438       THINS  YOUNG SINGLES/COUPLES       Mainstream
## 439         RRD  YOUNG SINGLES/COUPLES       Mainstream
## 440    TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 441      KETTLE MIDAGE SINGLES/COUPLES          Premium
## 442       GRAIN         YOUNG FAMILIES           Budget
## 443      KETTLE         YOUNG FAMILIES           Budget
## 444    CHEEZELS         YOUNG FAMILIES           Budget
## 445       THINS         OLDER FAMILIES       Mainstream
## 446      SMITHS  YOUNG SINGLES/COUPLES          Premium
## 447         RED  YOUNG SINGLES/COUPLES       Mainstream
## 448        COBS  YOUNG SINGLES/COUPLES       Mainstream
## 449      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 450       SNBTS               RETIREES           Budget
## 451      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 452     DORITOS  YOUNG SINGLES/COUPLES           Budget
## 453     DORITOS         YOUNG FAMILIES          Premium
## 454      KETTLE               RETIREES           Budget
## 455         RRD           NEW FAMILIES           Budget
## 456          WW  YOUNG SINGLES/COUPLES       Mainstream
## 457     DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 458   INFUZIONS         YOUNG FAMILIES          Premium
## 459          WW           NEW FAMILIES          Premium
## 460       GRAIN           NEW FAMILIES       Mainstream
## 461    TOSTITOS         YOUNG FAMILIES          Premium
## 462      SMITHS               RETIREES       Mainstream
## 463       SMITH         YOUNG FAMILIES           Budget
## 464      SMITHS         YOUNG FAMILIES           Budget
## 465      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 466          WW  YOUNG SINGLES/COUPLES       Mainstream
## 467      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 468    PRINGLES         OLDER FAMILIES          Premium
## 469      KETTLE         OLDER FAMILIES          Premium
## 470     DORITOS         OLDER FAMILIES           Budget
## 471       GRAIN         OLDER FAMILIES           Budget
## 472    PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 473      SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 474     DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 475    PRINGLES         OLDER FAMILIES           Budget
## 476      SMITHS         OLDER FAMILIES           Budget
## 477     NATURAL  YOUNG SINGLES/COUPLES          Premium
## 478    TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 479      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 480    TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 481    PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 482      KETTLE         OLDER FAMILIES           Budget
## 483    TOSTITOS         OLDER FAMILIES           Budget
## 484     DORITOS         OLDER FAMILIES           Budget
## 485         RED  YOUNG SINGLES/COUPLES           Budget
## 486     NATURAL  YOUNG SINGLES/COUPLES           Budget
## 487     DORITOS         OLDER FAMILIES           Budget
## 488    TOSTITOS         OLDER FAMILIES           Budget
## 489      KETTLE         OLDER FAMILIES           Budget
## 490      SMITHS  YOUNG SINGLES/COUPLES          Premium
## 491     NATURAL  YOUNG SINGLES/COUPLES          Premium
## 492          WW               RETIREES       Mainstream
## 493          WW  YOUNG SINGLES/COUPLES          Premium
## 494    TOSTITOS         OLDER FAMILIES           Budget
## 495      KETTLE         OLDER FAMILIES           Budget
## 496         RRD  YOUNG SINGLES/COUPLES       Mainstream
## 497       SMITH  OLDER SINGLES/COUPLES       Mainstream
## 498    PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 499    CHEEZELS         OLDER FAMILIES       Mainstream
## 500      KETTLE         OLDER FAMILIES       Mainstream
## 501      SMITHS         OLDER FAMILIES       Mainstream
## 502     DORITOS         YOUNG FAMILIES       Mainstream
## 503      SMITHS               RETIREES       Mainstream
## 504    TYRRELLS               RETIREES       Mainstream
## 505          WW         OLDER FAMILIES           Budget
## 506    CHEEZELS MIDAGE SINGLES/COUPLES           Budget
## 507      KETTLE         OLDER FAMILIES          Premium
## 508    TWISTIES         OLDER FAMILIES          Premium
## 509      DORITO  YOUNG SINGLES/COUPLES           Budget
## 510      KETTLE  OLDER SINGLES/COUPLES          Premium
## 511    CHEEZELS  OLDER SINGLES/COUPLES          Premium
## 512        COBS  YOUNG SINGLES/COUPLES       Mainstream
## 513      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 514    PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 515       GRAIN  YOUNG SINGLES/COUPLES           Budget
## 516     NATURAL MIDAGE SINGLES/COUPLES          Premium
## 517    PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 518      BURGER  YOUNG SINGLES/COUPLES           Budget
## 519      KETTLE  OLDER SINGLES/COUPLES           Budget
## 520      BURGER               RETIREES           Budget
## 521         CCS               RETIREES           Budget
## 522      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 523     DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 524    TWISTIES MIDAGE SINGLES/COUPLES           Budget
## 525       SNBTS  YOUNG SINGLES/COUPLES           Budget
## 526      SMITHS MIDAGE SINGLES/COUPLES           Budget
## 527    TOSTITOS               RETIREES       Mainstream
## 528       SMITH               RETIREES       Mainstream
## 529      SMITHS               RETIREES       Mainstream
## 530      KETTLE               RETIREES       Mainstream
## 531     NATURAL               RETIREES       Mainstream
## 532         RED         YOUNG FAMILIES       Mainstream
## 533    PRINGLES         YOUNG FAMILIES       Mainstream
## 534         RRD         OLDER FAMILIES           Budget
## 535          WW         OLDER FAMILIES           Budget
## 536      SMITHS           NEW FAMILIES       Mainstream
## 537    PRINGLES           NEW FAMILIES       Mainstream
## 538     DORITOS           NEW FAMILIES       Mainstream
## 539    PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 540     NATURAL               RETIREES       Mainstream
## 541        COBS           NEW FAMILIES          Premium
## 542    TYRRELLS         YOUNG FAMILIES           Budget
## 543         RRD         YOUNG FAMILIES           Budget
## 544      KETTLE         OLDER FAMILIES       Mainstream
## 545      KETTLE         OLDER FAMILIES       Mainstream
## 546      FRENCH  YOUNG SINGLES/COUPLES           Budget
## 547       THINS  YOUNG SINGLES/COUPLES           Budget
## 548        COBS           NEW FAMILIES          Premium
## 549       THINS MIDAGE SINGLES/COUPLES       Mainstream
## 550       SMITH               RETIREES       Mainstream
## 551       THINS         YOUNG FAMILIES          Premium
## 552       SMITH         OLDER FAMILIES           Budget
## 553  WOOLWORTHS         OLDER FAMILIES           Budget
## 554      SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 555      SMITHS  YOUNG SINGLES/COUPLES           Budget
## 556    PRINGLES               RETIREES          Premium
## 557     DORITOS MIDAGE SINGLES/COUPLES          Premium
## 558          WW MIDAGE SINGLES/COUPLES          Premium
## 559      KETTLE               RETIREES       Mainstream
## 560      KETTLE  YOUNG SINGLES/COUPLES           Budget
## 561    TYRRELLS               RETIREES          Premium
## 562        COBS               RETIREES          Premium
## 563    PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 564    TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 565    PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 566     DORITOS               RETIREES           Budget
## 567    TYRRELLS               RETIREES           Budget
## 568     GRNWVES               RETIREES          Premium
## 569    CHEEZELS               RETIREES          Premium
## 570      DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 571   INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 572    SUNBITES  YOUNG SINGLES/COUPLES           Budget
## 573    PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 574        COBS MIDAGE SINGLES/COUPLES       Mainstream
## 575     CHEETOS           NEW FAMILIES          Premium
## 576         RED  YOUNG SINGLES/COUPLES       Mainstream
## 577      KETTLE               RETIREES       Mainstream
## 578          WW  OLDER SINGLES/COUPLES          Premium
## 579      KETTLE  YOUNG SINGLES/COUPLES          Premium
## 580  WOOLWORTHS  YOUNG SINGLES/COUPLES          Premium
## 581       GRAIN  YOUNG SINGLES/COUPLES          Premium
## 582    PRINGLES         OLDER FAMILIES           Budget
## 583       THINS               RETIREES          Premium
## 584         RRD  YOUNG SINGLES/COUPLES           Budget
## 585      SMITHS  YOUNG SINGLES/COUPLES           Budget
## 586         RRD  YOUNG SINGLES/COUPLES           Budget
## 587          WW           NEW FAMILIES       Mainstream
## 588      KETTLE           NEW FAMILIES       Mainstream
## 589         NCC  YOUNG SINGLES/COUPLES          Premium
## 590         RRD         YOUNG FAMILIES       Mainstream
## 591      KETTLE         YOUNG FAMILIES       Mainstream
## 592    TYRRELLS         YOUNG FAMILIES       Mainstream
## 593     DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 594   INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 595      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 596      SMITHS           NEW FAMILIES       Mainstream
## 597    TYRRELLS         YOUNG FAMILIES           Budget
## 598    PRINGLES               RETIREES           Budget
## 599        COBS MIDAGE SINGLES/COUPLES       Mainstream
## 600    PRINGLES         YOUNG FAMILIES           Budget
## 601      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 602      DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 603          WW  YOUNG SINGLES/COUPLES       Mainstream
## 604    CHEEZELS  YOUNG SINGLES/COUPLES           Budget
## 605      SMITHS  YOUNG SINGLES/COUPLES           Budget
## 606          WW               RETIREES       Mainstream
## 607      KETTLE  YOUNG SINGLES/COUPLES           Budget
## 608      KETTLE  YOUNG SINGLES/COUPLES           Budget
## 609    PRINGLES               RETIREES       Mainstream
## 610      SMITHS         OLDER FAMILIES       Mainstream
## 611    TWISTIES               RETIREES       Mainstream
## 612       GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 613      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 614          WW  YOUNG SINGLES/COUPLES       Mainstream
## 615      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 616       THINS               RETIREES           Budget
## 617      SMITHS               RETIREES           Budget
## 618         RRD  YOUNG SINGLES/COUPLES           Budget
## 619       GRAIN  OLDER SINGLES/COUPLES           Budget
## 620   INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 621     DORITOS  OLDER SINGLES/COUPLES           Budget
## 622      SMITHS  OLDER SINGLES/COUPLES           Budget
## 623      KETTLE  YOUNG SINGLES/COUPLES          Premium
## 624         RRD  YOUNG SINGLES/COUPLES          Premium
## 625          WW  OLDER SINGLES/COUPLES       Mainstream
## 626    PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 627      KETTLE  OLDER SINGLES/COUPLES          Premium
## 628      KETTLE               RETIREES           Budget
## 629      KETTLE               RETIREES           Budget
## 630    TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 631         RRD               RETIREES       Mainstream
## 632         RED               RETIREES       Mainstream
## 633     DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 634         NCC  OLDER SINGLES/COUPLES       Mainstream
## 635     DORITOS         OLDER FAMILIES       Mainstream
## 636    TWISTIES         OLDER FAMILIES       Mainstream
## 637     DORITOS  YOUNG SINGLES/COUPLES          Premium
## 638      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 639         CCS  YOUNG SINGLES/COUPLES          Premium
## 640       GRAIN  YOUNG SINGLES/COUPLES          Premium
## 641     DORITOS  YOUNG SINGLES/COUPLES          Premium
## 642         RRD  YOUNG SINGLES/COUPLES          Premium
## 643         CCS  YOUNG SINGLES/COUPLES          Premium
## 644  WOOLWORTHS         YOUNG FAMILIES       Mainstream
## 645      KETTLE         YOUNG FAMILIES       Mainstream
## 646    TWISTIES         YOUNG FAMILIES       Mainstream
## 647      BURGER         YOUNG FAMILIES           Budget
## 648    TOSTITOS         YOUNG FAMILIES           Budget
## 649      SMITHS  YOUNG SINGLES/COUPLES           Budget
## 650      SMITHS         OLDER FAMILIES       Mainstream
## 651          WW  YOUNG SINGLES/COUPLES           Budget
## 652       GRAIN  YOUNG SINGLES/COUPLES           Budget
## 653    PRINGLES  OLDER SINGLES/COUPLES          Premium
## 654        COBS  YOUNG SINGLES/COUPLES       Mainstream
## 655      INFZNS  YOUNG SINGLES/COUPLES          Premium
## 656    PRINGLES  OLDER SINGLES/COUPLES           Budget
## 657     DORITOS               RETIREES       Mainstream
## 658  WOOLWORTHS               RETIREES       Mainstream
## 659    TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 660     NATURAL         OLDER FAMILIES           Budget
## 661      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 662      SMITHS         OLDER FAMILIES           Budget
## 663         RRD         OLDER FAMILIES           Budget
## 664      KETTLE               RETIREES       Mainstream
## 665         CCS  OLDER SINGLES/COUPLES          Premium
## 666      SMITHS MIDAGE SINGLES/COUPLES          Premium
## 667      SMITHS MIDAGE SINGLES/COUPLES          Premium
## 668     DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 669          WW  OLDER SINGLES/COUPLES           Budget
## 670    TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 671      SMITHS  OLDER SINGLES/COUPLES           Budget
## 672       THINS         OLDER FAMILIES          Premium
## 673        COBS  OLDER SINGLES/COUPLES          Premium
## 674         RRD               RETIREES           Budget
## 675       THINS               RETIREES           Budget
## 676    TWISTIES               RETIREES           Budget
## 677     CHEETOS  YOUNG SINGLES/COUPLES           Budget
## 678        COBS  YOUNG SINGLES/COUPLES           Budget
## 679    TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 680      BURGER  OLDER SINGLES/COUPLES       Mainstream
## 681      SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 682      KETTLE  YOUNG SINGLES/COUPLES           Budget
## 683    PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 684      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 685     CHEETOS         OLDER FAMILIES          Premium
## 686      FRENCH         OLDER FAMILIES          Premium
## 687      FRENCH         OLDER FAMILIES          Premium
## 688      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 689      FRENCH  OLDER SINGLES/COUPLES          Premium
## 690     DORITOS  OLDER SINGLES/COUPLES          Premium
## 691       SMITH  OLDER SINGLES/COUPLES       Mainstream
## 692          WW  OLDER SINGLES/COUPLES       Mainstream
## 693     DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 694   INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 695      SMITHS  YOUNG SINGLES/COUPLES          Premium
## 696      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 697          WW         OLDER FAMILIES          Premium
## 698       GRAIN         OLDER FAMILIES           Budget
## 699         RRD         OLDER FAMILIES           Budget
## 700    TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 701         RRD  YOUNG SINGLES/COUPLES       Mainstream
## 702      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 703         RED  OLDER SINGLES/COUPLES       Mainstream
## 704      SMITHS         YOUNG FAMILIES           Budget
## 705     DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 706      INFZNS  YOUNG SINGLES/COUPLES       Mainstream
## 707       SMITH  YOUNG SINGLES/COUPLES       Mainstream
## 708      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 709         CCS  OLDER SINGLES/COUPLES          Premium
## 710      SMITHS         OLDER FAMILIES       Mainstream
## 711          WW  YOUNG SINGLES/COUPLES       Mainstream
## 712      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 713    TWISTIES         YOUNG FAMILIES           Budget
## 714       THINS         OLDER FAMILIES       Mainstream
## 715     DORITOS         OLDER FAMILIES       Mainstream
## 716      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 717    TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 718     DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 719      KETTLE         OLDER FAMILIES           Budget
## 720          WW MIDAGE SINGLES/COUPLES          Premium
## 721    SUNBITES         YOUNG FAMILIES           Budget
## 722    PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 723         CCS MIDAGE SINGLES/COUPLES       Mainstream
## 724         NCC  OLDER SINGLES/COUPLES       Mainstream
## 725    SUNBITES  OLDER SINGLES/COUPLES       Mainstream
## 726     NATURAL               RETIREES           Budget
## 727    PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 728   INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 729       SMITH  YOUNG SINGLES/COUPLES           Budget
## 730          WW  YOUNG SINGLES/COUPLES           Budget
## 731         RRD  YOUNG SINGLES/COUPLES           Budget
## 732       THINS MIDAGE SINGLES/COUPLES           Budget
## 733     CHEETOS               RETIREES       Mainstream
## 734          WW               RETIREES       Mainstream
## 735         RED  YOUNG SINGLES/COUPLES       Mainstream
## 736      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 737      SMITHS  OLDER SINGLES/COUPLES           Budget
## 738    PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 739      KETTLE  OLDER SINGLES/COUPLES          Premium
## 740       SMITH  OLDER SINGLES/COUPLES          Premium
## 741     GRNWVES               RETIREES       Mainstream
## 742      SMITHS               RETIREES       Mainstream
## 743     NATURAL  YOUNG SINGLES/COUPLES           Budget
## 744    PRINGLES  OLDER SINGLES/COUPLES           Budget
## 745         RED         OLDER FAMILIES           Budget
## 746     DORITOS         OLDER FAMILIES           Budget
## 747   INFUZIONS MIDAGE SINGLES/COUPLES       Mainstream
## 748      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 749       SMITH MIDAGE SINGLES/COUPLES       Mainstream
## 750      BURGER MIDAGE SINGLES/COUPLES       Mainstream
## 751      KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 752      BURGER         OLDER FAMILIES           Budget
## 753         NCC         OLDER FAMILIES           Budget
## 754    CHEEZELS               RETIREES       Mainstream
## 755      KETTLE               RETIREES          Premium
## 756      SMITHS               RETIREES          Premium
## 757     CHEETOS               RETIREES          Premium
## 758      KETTLE MIDAGE SINGLES/COUPLES          Premium
## 759      KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 760    TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 761      BURGER  OLDER SINGLES/COUPLES           Budget
## 762      SMITHS  OLDER SINGLES/COUPLES           Budget
## 763     NATURAL  OLDER SINGLES/COUPLES           Budget
## 764    TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 765      BURGER  YOUNG SINGLES/COUPLES       Mainstream
## 766   INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 767      SMITHS               RETIREES       Mainstream
## 768     DORITOS               RETIREES       Mainstream
## 769      SMITHS               RETIREES       Mainstream
## 770       THINS  OLDER SINGLES/COUPLES           Budget
## 771      SMITHS  OLDER SINGLES/COUPLES           Budget
## 772          WW  OLDER SINGLES/COUPLES           Budget
## 773         RRD  OLDER SINGLES/COUPLES           Budget
## 774      KETTLE  YOUNG SINGLES/COUPLES           Budget
## 775       GRAIN  YOUNG SINGLES/COUPLES           Budget
## 776    TOSTITOS  YOUNG SINGLES/COUPLES           Budget
## 777          WW         OLDER FAMILIES           Budget
## 778         RED MIDAGE SINGLES/COUPLES          Premium
## 779      KETTLE  YOUNG SINGLES/COUPLES          Premium
## 780    PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 781      INFZNS               RETIREES       Mainstream
## 782          WW  YOUNG SINGLES/COUPLES       Mainstream
## 783     NATURAL  YOUNG SINGLES/COUPLES       Mainstream
## 784          WW  YOUNG SINGLES/COUPLES       Mainstream
## 785      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 786      SMITHS               RETIREES           Budget
## 787      DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 788      KETTLE  OLDER SINGLES/COUPLES           Budget
## 789       SNBTS MIDAGE SINGLES/COUPLES           Budget
## 790       GRAIN MIDAGE SINGLES/COUPLES           Budget
## 791      SMITHS  OLDER SINGLES/COUPLES          Premium
## 792      KETTLE  OLDER SINGLES/COUPLES          Premium
## 793        COBS  OLDER SINGLES/COUPLES          Premium
## 794    TOSTITOS         OLDER FAMILIES           Budget
## 795     NATURAL         YOUNG FAMILIES          Premium
## 796          WW         YOUNG FAMILIES       Mainstream
## 797    SUNBITES         YOUNG FAMILIES       Mainstream
## 798      KETTLE         YOUNG FAMILIES       Mainstream
## 799      KETTLE  YOUNG SINGLES/COUPLES          Premium
## 800         CCS               RETIREES           Budget
## 801         CCS  YOUNG SINGLES/COUPLES           Budget
## 802         CCS  YOUNG SINGLES/COUPLES           Budget
## 803         CCS  YOUNG SINGLES/COUPLES           Budget
## 804     GRNWVES  YOUNG SINGLES/COUPLES           Budget
## 805      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 806       GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 807    PRINGLES         YOUNG FAMILIES       Mainstream
## 808      SMITHS         YOUNG FAMILIES       Mainstream
## 809    CHEEZELS         YOUNG FAMILIES       Mainstream
## 810      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 811    TOSTITOS               RETIREES          Premium
## 812      SMITHS  OLDER SINGLES/COUPLES          Premium
## 813         RED  OLDER SINGLES/COUPLES          Premium
## 814     CHEETOS  OLDER SINGLES/COUPLES          Premium
## 815      SMITHS  OLDER SINGLES/COUPLES          Premium
## 816    SUNBITES               RETIREES       Mainstream
## 817      KETTLE               RETIREES           Budget
## 818      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 819       THINS  YOUNG SINGLES/COUPLES          Premium
## 820      KETTLE               RETIREES       Mainstream
## 821    PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 822      KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 823    TOSTITOS         YOUNG FAMILIES           Budget
## 824     DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 825      FRENCH  YOUNG SINGLES/COUPLES          Premium
## 826     DORITOS               RETIREES       Mainstream
## 827     NATURAL               RETIREES       Mainstream
## 828          WW               RETIREES       Mainstream
## 829      KETTLE               RETIREES          Premium
## 830       SMITH  OLDER SINGLES/COUPLES           Budget
## 831          WW  OLDER SINGLES/COUPLES           Budget
## 832       SMITH         OLDER FAMILIES           Budget
## 833        COBS           NEW FAMILIES       Mainstream
## 834      FRENCH           NEW FAMILIES       Mainstream
## 835   INFUZIONS           NEW FAMILIES       Mainstream
## 836          WW           NEW FAMILIES       Mainstream
## 837     NATURAL           NEW FAMILIES       Mainstream
## 838      KETTLE MIDAGE SINGLES/COUPLES          Premium
## 839       THINS  YOUNG SINGLES/COUPLES       Mainstream
## 840    PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 841      FRENCH MIDAGE SINGLES/COUPLES          Premium
## 842      KETTLE  YOUNG SINGLES/COUPLES          Premium
## 843       THINS  YOUNG SINGLES/COUPLES          Premium
## 844          WW         YOUNG FAMILIES           Budget
## 845    TWISTIES  YOUNG SINGLES/COUPLES          Premium
## 846       SNBTS  YOUNG SINGLES/COUPLES          Premium
## 847      KETTLE               RETIREES           Budget
## 848    TOSTITOS               RETIREES           Budget
## 849      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 850    TYRRELLS         YOUNG FAMILIES           Budget
## 851     DORITOS  YOUNG SINGLES/COUPLES          Premium
## 852      SMITHS  YOUNG SINGLES/COUPLES           Budget
## 853    TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 854     DORITOS               RETIREES           Budget
## 855     CHEETOS  OLDER SINGLES/COUPLES          Premium
## 856     DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 857          WW  OLDER SINGLES/COUPLES       Mainstream
## 858     DORITOS  OLDER SINGLES/COUPLES          Premium
## 859     DORITOS         OLDER FAMILIES          Premium
## 860     NATURAL         OLDER FAMILIES          Premium
## 861     NATURAL         OLDER FAMILIES          Premium
## 862     DORITOS         OLDER FAMILIES          Premium
## 863         RRD  YOUNG SINGLES/COUPLES           Budget
## 864       THINS  OLDER SINGLES/COUPLES           Budget
## 865       SMITH  YOUNG SINGLES/COUPLES       Mainstream
## 866      KETTLE               RETIREES       Mainstream
## 867        COBS               RETIREES       Mainstream
## 868      KETTLE               RETIREES           Budget
## 869    TWISTIES               RETIREES           Budget
## 870    PRINGLES               RETIREES          Premium
## 871          WW               RETIREES          Premium
## 872          WW         YOUNG FAMILIES       Mainstream
## 873      KETTLE         OLDER FAMILIES       Mainstream
## 874          WW         OLDER FAMILIES       Mainstream
## 875      KETTLE  OLDER SINGLES/COUPLES          Premium
## 876         CCS         YOUNG FAMILIES           Budget
## 877      SMITHS         OLDER FAMILIES       Mainstream
## 878      SMITHS         OLDER FAMILIES       Mainstream
## 879         CCS               RETIREES       Mainstream
## 880    TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 881       SMITH MIDAGE SINGLES/COUPLES       Mainstream
## 882      SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 883    TOSTITOS         YOUNG FAMILIES           Budget
## 884      KETTLE           NEW FAMILIES           Budget
## 885      SMITHS MIDAGE SINGLES/COUPLES           Budget
## 886       THINS               RETIREES       Mainstream
## 887       SNBTS               RETIREES       Mainstream
## 888       THINS  OLDER SINGLES/COUPLES           Budget
## 889       THINS  OLDER SINGLES/COUPLES           Budget
## 890         CCS  OLDER SINGLES/COUPLES           Budget
## 891      SMITHS  YOUNG SINGLES/COUPLES           Budget
## 892   INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 893      KETTLE         OLDER FAMILIES       Mainstream
## 894   INFUZIONS         OLDER FAMILIES       Mainstream
## 895       THINS         OLDER FAMILIES       Mainstream
## 896         RED  OLDER SINGLES/COUPLES           Budget
## 897    PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 898      SMITHS         YOUNG FAMILIES           Budget
## 899   INFUZIONS MIDAGE SINGLES/COUPLES       Mainstream
## 900    TWISTIES MIDAGE SINGLES/COUPLES       Mainstream
## 901         RRD         YOUNG FAMILIES          Premium
## 902       THINS         YOUNG FAMILIES          Premium
## 903      SMITHS         YOUNG FAMILIES          Premium
## 904    PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 905    CHEEZELS MIDAGE SINGLES/COUPLES           Budget
## 906    TYRRELLS           NEW FAMILIES       Mainstream
## 907     CHEETOS MIDAGE SINGLES/COUPLES           Budget
## 908      SMITHS               RETIREES       Mainstream
## 909      SMITHS         YOUNG FAMILIES          Premium
## 910      KETTLE               RETIREES           Budget
## 911      KETTLE               RETIREES       Mainstream
## 912      KETTLE               RETIREES       Mainstream
## 913    PRINGLES         YOUNG FAMILIES           Budget
## 914      DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 915    PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 916       THINS  OLDER SINGLES/COUPLES       Mainstream
## 917    PRINGLES         YOUNG FAMILIES           Budget
## 918          WW         YOUNG FAMILIES           Budget
## 919          WW         YOUNG FAMILIES           Budget
## 920   INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 921          WW  OLDER SINGLES/COUPLES          Premium
## 922    PRINGLES  OLDER SINGLES/COUPLES          Premium
## 923   INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 924         RRD  OLDER SINGLES/COUPLES           Budget
## 925    PRINGLES               RETIREES       Mainstream
## 926     NATURAL               RETIREES       Mainstream
## 927    TWISTIES               RETIREES       Mainstream
## 928         RRD           NEW FAMILIES           Budget
## 929       THINS               RETIREES           Budget
## 930      SMITHS               RETIREES           Budget
## 931        COBS  OLDER SINGLES/COUPLES       Mainstream
## 932       SMITH         YOUNG FAMILIES           Budget
## 933     DORITOS         YOUNG FAMILIES           Budget
## 934      KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 935      SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 936         RRD  OLDER SINGLES/COUPLES       Mainstream
## 937      KETTLE  YOUNG SINGLES/COUPLES          Premium
## 938       SNBTS  YOUNG SINGLES/COUPLES          Premium
## 939    PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 940    TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 941         RED  YOUNG SINGLES/COUPLES       Mainstream
## 942      KETTLE MIDAGE SINGLES/COUPLES           Budget
## 943      KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 944          WW  OLDER SINGLES/COUPLES       Mainstream
## 945    CHEEZELS         YOUNG FAMILIES           Budget
## 946        COBS         YOUNG FAMILIES           Budget
## 947     DORITOS         OLDER FAMILIES       Mainstream
## 948       THINS         OLDER FAMILIES       Mainstream
## 949         CCS         OLDER FAMILIES       Mainstream
## 950      KETTLE         OLDER FAMILIES       Mainstream
## 951       THINS  YOUNG SINGLES/COUPLES           Budget
## 952     DORITOS               RETIREES          Premium
## 953         RED  OLDER SINGLES/COUPLES           Budget
## 954    TWISTIES               RETIREES       Mainstream
## 955      KETTLE               RETIREES       Mainstream
## 956       SMITH               RETIREES       Mainstream
## 957          WW MIDAGE SINGLES/COUPLES           Budget
## 958      SMITHS MIDAGE SINGLES/COUPLES           Budget
## 959         NCC               RETIREES          Premium
## 960          WW MIDAGE SINGLES/COUPLES       Mainstream
## 961    PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 962    PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 963     NATURAL  YOUNG SINGLES/COUPLES       Mainstream
## 964    PRINGLES         YOUNG FAMILIES          Premium
## 965      KETTLE  OLDER SINGLES/COUPLES           Budget
## 966         RED  OLDER SINGLES/COUPLES           Budget
## 967         RRD  OLDER SINGLES/COUPLES           Budget
## 968          WW  OLDER SINGLES/COUPLES           Budget
## 969    CHEEZELS           NEW FAMILIES           Budget
## 970      SMITHS           NEW FAMILIES           Budget
## 971    TOSTITOS           NEW FAMILIES           Budget
## 972    PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 973    TYRRELLS  YOUNG SINGLES/COUPLES           Budget
## 974     DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 975      SMITHS  YOUNG SINGLES/COUPLES          Premium
## 976     DORITOS  OLDER SINGLES/COUPLES          Premium
## 977      KETTLE  YOUNG SINGLES/COUPLES           Budget
## 978       SMITH  OLDER SINGLES/COUPLES          Premium
## 979       GRAIN  OLDER SINGLES/COUPLES           Budget
## 980    TYRRELLS         OLDER FAMILIES       Mainstream
## 981    PRINGLES         YOUNG FAMILIES           Budget
## 982         RRD         YOUNG FAMILIES          Premium
## 983     DORITOS         YOUNG FAMILIES          Premium
## 984      KETTLE  YOUNG SINGLES/COUPLES          Premium
## 985     DORITOS  YOUNG SINGLES/COUPLES          Premium
## 986      KETTLE  OLDER SINGLES/COUPLES          Premium
## 987     DORITOS  OLDER SINGLES/COUPLES          Premium
## 988         RRD               RETIREES          Premium
## 989          WW               RETIREES          Premium
## 990     NATURAL MIDAGE SINGLES/COUPLES           Budget
## 991     CHEETOS               RETIREES           Budget
## 992   INFUZIONS               RETIREES           Budget
## 993    TYRRELLS               RETIREES       Mainstream
## 994      KETTLE         YOUNG FAMILIES       Mainstream
## 995      KETTLE         YOUNG FAMILIES       Mainstream
## 996      KETTLE MIDAGE SINGLES/COUPLES          Premium
## 997         RRD MIDAGE SINGLES/COUPLES          Premium
## 998         RRD  OLDER SINGLES/COUPLES       Mainstream
## 999       SNBTS  OLDER SINGLES/COUPLES       Mainstream
## 1000        RED  YOUNG SINGLES/COUPLES       Mainstream
## 1001     SMITHS  OLDER SINGLES/COUPLES           Budget
## 1002    DORITOS  OLDER SINGLES/COUPLES           Budget
## 1003    DORITOS         YOUNG FAMILIES           Budget
## 1004  INFUZIONS         YOUNG FAMILIES           Budget
## 1005     KETTLE         YOUNG FAMILIES           Budget
## 1006     KETTLE         YOUNG FAMILIES           Budget
## 1007   TWISTIES         YOUNG FAMILIES           Budget
## 1008   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 1009       COBS  OLDER SINGLES/COUPLES          Premium
## 1010   TYRRELLS  OLDER SINGLES/COUPLES          Premium
## 1011    DORITOS  OLDER SINGLES/COUPLES          Premium
## 1012   TWISTIES               RETIREES           Budget
## 1013   PRINGLES               RETIREES           Budget
## 1014   PRINGLES               RETIREES           Budget
## 1015       COBS               RETIREES           Budget
## 1016   PRINGLES               RETIREES           Budget
## 1017     SMITHS               RETIREES          Premium
## 1018   PRINGLES               RETIREES          Premium
## 1019    DORITOS               RETIREES          Premium
## 1020   PRINGLES               RETIREES          Premium
## 1021     DORITO               RETIREES          Premium
## 1022   TWISTIES               RETIREES       Mainstream
## 1023   TYRRELLS               RETIREES       Mainstream
## 1024   PRINGLES               RETIREES       Mainstream
## 1025   PRINGLES               RETIREES       Mainstream
## 1026    DORITOS               RETIREES       Mainstream
## 1027      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 1028   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 1029   CHEEZELS MIDAGE SINGLES/COUPLES       Mainstream
## 1030   CHEEZELS MIDAGE SINGLES/COUPLES       Mainstream
## 1031       COBS MIDAGE SINGLES/COUPLES       Mainstream
## 1032     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 1033      GRAIN MIDAGE SINGLES/COUPLES       Mainstream
## 1034   TWISTIES               RETIREES           Budget
## 1035     KETTLE               RETIREES           Budget
## 1036       COBS               RETIREES           Budget
## 1037    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 1038  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 1039     SMITHS               RETIREES       Mainstream
## 1040   PRINGLES               RETIREES          Premium
## 1041      THINS               RETIREES          Premium
## 1042     KETTLE               RETIREES          Premium
## 1043     SMITHS               RETIREES          Premium
## 1044   CHEEZELS         OLDER FAMILIES           Budget
## 1045   TYRRELLS         OLDER FAMILIES           Budget
## 1046   PRINGLES         OLDER FAMILIES           Budget
## 1047   PRINGLES         OLDER FAMILIES           Budget
## 1048   TWISTIES         OLDER FAMILIES          Premium
## 1049     INFZNS         OLDER FAMILIES          Premium
## 1050   CHEEZELS  YOUNG SINGLES/COUPLES       Mainstream
## 1051    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1052   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 1053   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 1054   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 1055     DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 1056     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1057      THINS         YOUNG FAMILIES           Budget
## 1058     DORITO         YOUNG FAMILIES           Budget
## 1059      GRAIN         YOUNG FAMILIES           Budget
## 1060   TYRRELLS         YOUNG FAMILIES           Budget
## 1061     KETTLE         YOUNG FAMILIES           Budget
## 1062     KETTLE         YOUNG FAMILIES           Budget
## 1063   TWISTIES         YOUNG FAMILIES           Budget
## 1064   PRINGLES         YOUNG FAMILIES           Budget
## 1065   TOSTITOS         YOUNG FAMILIES           Budget
## 1066   TOSTITOS               RETIREES       Mainstream
## 1067    DORITOS               RETIREES       Mainstream
## 1068     SMITHS  OLDER SINGLES/COUPLES           Budget
## 1069      THINS  OLDER SINGLES/COUPLES           Budget
## 1070     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1071     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 1072   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 1073     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1074      THINS MIDAGE SINGLES/COUPLES          Premium
## 1075   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 1076   TOSTITOS MIDAGE SINGLES/COUPLES          Premium
## 1077   TOSTITOS MIDAGE SINGLES/COUPLES          Premium
## 1078     SMITHS         YOUNG FAMILIES           Budget
## 1079     KETTLE         YOUNG FAMILIES           Budget
## 1080     KETTLE         YOUNG FAMILIES           Budget
## 1081   TOSTITOS         YOUNG FAMILIES           Budget
## 1082      THINS         YOUNG FAMILIES           Budget
## 1083      THINS         YOUNG FAMILIES           Budget
## 1084     KETTLE         YOUNG FAMILIES           Budget
## 1085     KETTLE         YOUNG FAMILIES           Budget
## 1086     KETTLE         YOUNG FAMILIES           Budget
## 1087   TWISTIES MIDAGE SINGLES/COUPLES          Premium
## 1088      THINS MIDAGE SINGLES/COUPLES          Premium
## 1089     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 1090   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 1091     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1092   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 1093     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1094   PRINGLES         YOUNG FAMILIES          Premium
## 1095     KETTLE         YOUNG FAMILIES          Premium
## 1096     KETTLE         YOUNG FAMILIES          Premium
## 1097   TWISTIES         YOUNG FAMILIES          Premium
## 1098      GRAIN         YOUNG FAMILIES          Premium
## 1099    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1100   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 1101   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 1102    DORITOS  OLDER SINGLES/COUPLES          Premium
## 1103   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 1104   TWISTIES         YOUNG FAMILIES       Mainstream
## 1105   TOSTITOS         YOUNG FAMILIES       Mainstream
## 1106      THINS         YOUNG FAMILIES       Mainstream
## 1107      GRAIN         YOUNG FAMILIES       Mainstream
## 1108   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 1109      THINS  OLDER SINGLES/COUPLES          Premium
## 1110       COBS  OLDER SINGLES/COUPLES          Premium
## 1111     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 1112      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 1113     DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 1114     DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 1115      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 1116     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1117    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1118     DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 1119  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 1120   PRINGLES               RETIREES           Budget
## 1121      THINS               RETIREES           Budget
## 1122     KETTLE               RETIREES           Budget
## 1123     KETTLE               RETIREES           Budget
## 1124      THINS               RETIREES           Budget
## 1125   TYRRELLS               RETIREES       Mainstream
## 1126     DORITO               RETIREES       Mainstream
## 1127   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 1128     KETTLE  OLDER SINGLES/COUPLES           Budget
## 1129     KETTLE  OLDER SINGLES/COUPLES           Budget
## 1130     DORITO  OLDER SINGLES/COUPLES           Budget
## 1131     KETTLE           NEW FAMILIES       Mainstream
## 1132   TWISTIES           NEW FAMILIES       Mainstream
## 1133   TWISTIES           NEW FAMILIES       Mainstream
## 1134  INFUZIONS           NEW FAMILIES       Mainstream
## 1135   TWISTIES           NEW FAMILIES       Mainstream
## 1136   TYRRELLS           NEW FAMILIES       Mainstream
## 1137   TWISTIES           NEW FAMILIES       Mainstream
## 1138  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 1139      THINS               RETIREES           Budget
## 1140     KETTLE               RETIREES           Budget
## 1141      THINS               RETIREES           Budget
## 1142     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 1143     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 1144   TWISTIES               RETIREES           Budget
## 1145   TWISTIES               RETIREES           Budget
## 1146     KETTLE               RETIREES           Budget
## 1147   PRINGLES               RETIREES           Budget
## 1148     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 1149     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 1150   TWISTIES  YOUNG SINGLES/COUPLES           Budget
## 1151     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 1152     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 1153     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 1154     KETTLE               RETIREES          Premium
## 1155   TWISTIES               RETIREES          Premium
## 1156     KETTLE               RETIREES          Premium
## 1157   PRINGLES               RETIREES          Premium
## 1158      GRAIN               RETIREES          Premium
## 1159     KETTLE               RETIREES          Premium
## 1160     SMITHS               RETIREES          Premium
## 1161    DORITOS               RETIREES          Premium
## 1162     INFZNS               RETIREES          Premium
## 1163    DORITOS               RETIREES          Premium
## 1164       COBS               RETIREES          Premium
## 1165     SMITHS               RETIREES       Mainstream
## 1166     KETTLE               RETIREES       Mainstream
## 1167     DORITO               RETIREES       Mainstream
## 1168  INFUZIONS               RETIREES       Mainstream
## 1169    DORITOS               RETIREES       Mainstream
## 1170     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1171   CHEEZELS  OLDER SINGLES/COUPLES          Premium
## 1172     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1173   PRINGLES         OLDER FAMILIES       Mainstream
## 1174   TWISTIES         OLDER FAMILIES       Mainstream
## 1175    DORITOS         OLDER FAMILIES       Mainstream
## 1176     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1177     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1178    DORITOS  OLDER SINGLES/COUPLES          Premium
## 1179   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 1180     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1181   PRINGLES         OLDER FAMILIES       Mainstream
## 1182   PRINGLES         OLDER FAMILIES       Mainstream
## 1183      THINS         OLDER FAMILIES       Mainstream
## 1184    DORITOS         OLDER FAMILIES       Mainstream
## 1185   TWISTIES         YOUNG FAMILIES          Premium
## 1186     KETTLE         YOUNG FAMILIES          Premium
## 1187    DORITOS         YOUNG FAMILIES          Premium
## 1188   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 1189  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 1190     KETTLE  OLDER SINGLES/COUPLES           Budget
## 1191     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 1192     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 1193   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 1194     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 1195   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 1196  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 1197    DORITOS         YOUNG FAMILIES           Budget
## 1198    DORITOS         YOUNG FAMILIES           Budget
## 1199     KETTLE         YOUNG FAMILIES           Budget
## 1200     KETTLE         YOUNG FAMILIES           Budget
## 1201   TWISTIES         YOUNG FAMILIES           Budget
## 1202    DORITOS         YOUNG FAMILIES           Budget
## 1203   PRINGLES         YOUNG FAMILIES           Budget
## 1204     DORITO         OLDER FAMILIES       Mainstream
## 1205   TWISTIES         OLDER FAMILIES       Mainstream
## 1206       COBS         OLDER FAMILIES       Mainstream
## 1207       COBS         OLDER FAMILIES       Mainstream
## 1208     SMITHS         OLDER FAMILIES       Mainstream
## 1209   PRINGLES         OLDER FAMILIES       Mainstream
## 1210     KETTLE         OLDER FAMILIES       Mainstream
## 1211     KETTLE         OLDER FAMILIES       Mainstream
## 1212     KETTLE         OLDER FAMILIES           Budget
## 1213    DORITOS         OLDER FAMILIES           Budget
## 1214   TOSTITOS         OLDER FAMILIES           Budget
## 1215     KETTLE         OLDER FAMILIES           Budget
## 1216       COBS         OLDER FAMILIES           Budget
## 1217     KETTLE         OLDER FAMILIES           Budget
## 1218   TOSTITOS         OLDER FAMILIES           Budget
## 1219     INFZNS  OLDER SINGLES/COUPLES       Mainstream
## 1220   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 1221    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 1222   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 1223     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1224    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 1225   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 1226     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1227     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1228      GRAIN               RETIREES       Mainstream
## 1229   TOSTITOS               RETIREES       Mainstream
## 1230   PRINGLES               RETIREES       Mainstream
## 1231     KETTLE               RETIREES       Mainstream
## 1232     SMITHS               RETIREES       Mainstream
## 1233       COBS               RETIREES       Mainstream
## 1234     SMITHS               RETIREES       Mainstream
## 1235   TOSTITOS               RETIREES       Mainstream
## 1236     KETTLE         YOUNG FAMILIES       Mainstream
## 1237      GRAIN         YOUNG FAMILIES       Mainstream
## 1238   TWISTIES         YOUNG FAMILIES       Mainstream
## 1239  INFUZIONS         YOUNG FAMILIES       Mainstream
## 1240     KETTLE         YOUNG FAMILIES       Mainstream
## 1241     KETTLE         YOUNG FAMILIES       Mainstream
## 1242   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 1243     INFZNS  OLDER SINGLES/COUPLES           Budget
## 1244     KETTLE  OLDER SINGLES/COUPLES           Budget
## 1245    DORITOS  OLDER SINGLES/COUPLES           Budget
## 1246     KETTLE               RETIREES          Premium
## 1247     KETTLE               RETIREES          Premium
## 1248   TOSTITOS               RETIREES          Premium
## 1249    DORITOS               RETIREES       Mainstream
## 1250     SMITHS               RETIREES       Mainstream
## 1251   PRINGLES               RETIREES       Mainstream
## 1252    DORITOS               RETIREES       Mainstream
## 1253    DORITOS               RETIREES       Mainstream
## 1254     KETTLE               RETIREES       Mainstream
## 1255   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1256   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 1257     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1258   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1259     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1260   PRINGLES               RETIREES          Premium
## 1261     KETTLE               RETIREES          Premium
## 1262  INFUZIONS               RETIREES          Premium
## 1263    DORITOS         OLDER FAMILIES       Mainstream
## 1264    DORITOS         OLDER FAMILIES       Mainstream
## 1265   PRINGLES         OLDER FAMILIES       Mainstream
## 1266      GRAIN         OLDER FAMILIES       Mainstream
## 1267      GRAIN         OLDER FAMILIES       Mainstream
## 1268    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 1269     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1270   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 1271     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1272   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 1273     KETTLE         OLDER FAMILIES           Budget
## 1274      GRAIN         OLDER FAMILIES           Budget
## 1275   TWISTIES         OLDER FAMILIES           Budget
## 1276      THINS         OLDER FAMILIES           Budget
## 1277   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 1278    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 1279     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 1280   TYRRELLS               RETIREES           Budget
## 1281    DORITOS               RETIREES           Budget
## 1282     KETTLE               RETIREES           Budget
## 1283  INFUZIONS               RETIREES           Budget
## 1284     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1285   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 1286  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 1287    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1288      GRAIN               RETIREES       Mainstream
## 1289     KETTLE               RETIREES       Mainstream
## 1290   CHEEZELS  YOUNG SINGLES/COUPLES       Mainstream
## 1291   TOSTITOS               RETIREES       Mainstream
## 1292       COBS               RETIREES       Mainstream
## 1293   PRINGLES               RETIREES          Premium
## 1294   TWISTIES               RETIREES          Premium
## 1295   TOSTITOS               RETIREES          Premium
## 1296     KETTLE               RETIREES          Premium
## 1297  INFUZIONS               RETIREES          Premium
## 1298      THINS         OLDER FAMILIES          Premium
## 1299   TOSTITOS         OLDER FAMILIES          Premium
## 1300     SMITHS         OLDER FAMILIES          Premium
## 1301      THINS         OLDER FAMILIES          Premium
## 1302     KETTLE         OLDER FAMILIES          Premium
## 1303     INFZNS         OLDER FAMILIES          Premium
## 1304      THINS         OLDER FAMILIES          Premium
## 1305   PRINGLES         OLDER FAMILIES          Premium
## 1306     INFZNS  OLDER SINGLES/COUPLES           Budget
## 1307   TYRRELLS  OLDER SINGLES/COUPLES           Budget
## 1308    DORITOS  OLDER SINGLES/COUPLES           Budget
## 1309   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 1310     KETTLE  OLDER SINGLES/COUPLES           Budget
## 1311       COBS  OLDER SINGLES/COUPLES           Budget
## 1312     DORITO               RETIREES           Budget
## 1313   TYRRELLS               RETIREES           Budget
## 1314      THINS               RETIREES           Budget
## 1315  INFUZIONS               RETIREES           Budget
## 1316     DORITO               RETIREES           Budget
## 1317     KETTLE               RETIREES           Budget
## 1318  INFUZIONS               RETIREES           Budget
## 1319      GRAIN               RETIREES           Budget
## 1320     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 1321     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 1322     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 1323      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 1324   PRINGLES         OLDER FAMILIES          Premium
## 1325      THINS               RETIREES          Premium
## 1326       COBS               RETIREES          Premium
## 1327     KETTLE               RETIREES          Premium
## 1328       COBS               RETIREES          Premium
## 1329     KETTLE               RETIREES          Premium
## 1330   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 1331   CHEEZELS  OLDER SINGLES/COUPLES           Budget
## 1332  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 1333      GRAIN  OLDER SINGLES/COUPLES           Budget
## 1334   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 1335      THINS               RETIREES           Budget
## 1336   PRINGLES               RETIREES           Budget
## 1337     KETTLE         OLDER FAMILIES           Budget
## 1338     KETTLE         OLDER FAMILIES           Budget
## 1339   TYRRELLS         OLDER FAMILIES           Budget
## 1340       COBS         OLDER FAMILIES           Budget
## 1341   TOSTITOS         OLDER FAMILIES           Budget
## 1342   TWISTIES         OLDER FAMILIES           Budget
## 1343     KETTLE         OLDER FAMILIES           Budget
## 1344   TWISTIES         OLDER FAMILIES           Budget
## 1345   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 1346   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 1347     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1348   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 1349     KETTLE         YOUNG FAMILIES           Budget
## 1350   TWISTIES         YOUNG FAMILIES           Budget
## 1351   PRINGLES         YOUNG FAMILIES           Budget
## 1352      GRAIN  OLDER SINGLES/COUPLES       Mainstream
## 1353    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 1354     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1355   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 1356   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 1357      GRAIN               RETIREES       Mainstream
## 1358    DORITOS               RETIREES       Mainstream
## 1359    DORITOS               RETIREES       Mainstream
## 1360   PRINGLES               RETIREES       Mainstream
## 1361   TYRRELLS               RETIREES       Mainstream
## 1362     INFZNS  YOUNG SINGLES/COUPLES       Mainstream
## 1363      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 1364       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 1365     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1366  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 1367      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 1368     INFZNS MIDAGE SINGLES/COUPLES       Mainstream
## 1369   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 1370     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1371     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1372     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1373   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 1374   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 1375   PRINGLES               RETIREES       Mainstream
## 1376    DORITOS               RETIREES       Mainstream
## 1377      GRAIN               RETIREES       Mainstream
## 1378  INFUZIONS               RETIREES           Budget
## 1379       COBS               RETIREES           Budget
## 1380  INFUZIONS               RETIREES           Budget
## 1381      GRAIN               RETIREES           Budget
## 1382     KETTLE               RETIREES           Budget
## 1383   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 1384    DORITOS               RETIREES       Mainstream
## 1385     KETTLE         OLDER FAMILIES       Mainstream
## 1386   PRINGLES         OLDER FAMILIES       Mainstream
## 1387     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 1388   TYRRELLS  YOUNG SINGLES/COUPLES          Premium
## 1389     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 1390      THINS  YOUNG SINGLES/COUPLES          Premium
## 1391     SMITHS  YOUNG SINGLES/COUPLES          Premium
## 1392      GRAIN  YOUNG SINGLES/COUPLES          Premium
## 1393     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 1394   TWISTIES  YOUNG SINGLES/COUPLES          Premium
## 1395     SMITHS  YOUNG SINGLES/COUPLES          Premium
## 1396     KETTLE         YOUNG FAMILIES          Premium
## 1397      GRAIN         YOUNG FAMILIES          Premium
## 1398   TYRRELLS               RETIREES          Premium
## 1399     KETTLE               RETIREES          Premium
## 1400     SMITHS               RETIREES          Premium
## 1401   TWISTIES               RETIREES          Premium
## 1402   TWISTIES  YOUNG SINGLES/COUPLES           Budget
## 1403    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 1404   TOSTITOS  YOUNG SINGLES/COUPLES           Budget
## 1405     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 1406   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 1407    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 1408     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 1409  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 1410      GRAIN  YOUNG SINGLES/COUPLES           Budget
## 1411   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 1412      THINS  YOUNG SINGLES/COUPLES           Budget
## 1413    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 1414      THINS  OLDER SINGLES/COUPLES          Premium
## 1415   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 1416     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 1417     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 1418   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 1419   CHEEZELS  YOUNG SINGLES/COUPLES           Budget
## 1420   CHEEZELS  YOUNG SINGLES/COUPLES           Budget
## 1421    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1422     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1423     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1424   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 1425   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 1426     KETTLE               RETIREES          Premium
## 1427     SMITHS           NEW FAMILIES          Premium
## 1428    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1429    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1430     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 1431     INFZNS MIDAGE SINGLES/COUPLES       Mainstream
## 1432   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 1433     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 1434    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 1435    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 1436     DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 1437    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1438    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1439   CHEEZELS MIDAGE SINGLES/COUPLES          Premium
## 1440      THINS MIDAGE SINGLES/COUPLES          Premium
## 1441     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 1442     DORITO MIDAGE SINGLES/COUPLES          Premium
## 1443   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 1444  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 1445   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 1446   TOSTITOS               RETIREES          Premium
## 1447     KETTLE               RETIREES          Premium
## 1448     KETTLE               RETIREES          Premium
## 1449      THINS               RETIREES          Premium
## 1450   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 1451       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 1452     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1453     INFZNS  YOUNG SINGLES/COUPLES       Mainstream
## 1454     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1455     KETTLE         OLDER FAMILIES           Budget
## 1456     KETTLE         OLDER FAMILIES           Budget
## 1457    DORITOS         OLDER FAMILIES           Budget
## 1458      THINS         OLDER FAMILIES           Budget
## 1459    DORITOS  OLDER SINGLES/COUPLES           Budget
## 1460  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 1461   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 1462  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 1463   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 1464  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 1465   TOSTITOS               RETIREES           Budget
## 1466     SMITHS               RETIREES           Budget
## 1467     KETTLE  OLDER SINGLES/COUPLES           Budget
## 1468      THINS  OLDER SINGLES/COUPLES           Budget
## 1469   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 1470     KETTLE  OLDER SINGLES/COUPLES           Budget
## 1471       COBS  OLDER SINGLES/COUPLES           Budget
## 1472    DORITOS               RETIREES          Premium
## 1473     KETTLE               RETIREES          Premium
## 1474     KETTLE               RETIREES          Premium
## 1475    DORITOS               RETIREES          Premium
## 1476    DORITOS         OLDER FAMILIES       Mainstream
## 1477     KETTLE         OLDER FAMILIES       Mainstream
## 1478     SMITHS         OLDER FAMILIES       Mainstream
## 1479    DORITOS         OLDER FAMILIES       Mainstream
## 1480   TOSTITOS         OLDER FAMILIES       Mainstream
## 1481       COBS         OLDER FAMILIES       Mainstream
## 1482   TWISTIES         OLDER FAMILIES       Mainstream
## 1483       COBS         OLDER FAMILIES       Mainstream
## 1484   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 1485      GRAIN  OLDER SINGLES/COUPLES          Premium
## 1486     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1487   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 1488      THINS  OLDER SINGLES/COUPLES          Premium
## 1489     KETTLE         OLDER FAMILIES           Budget
## 1490  INFUZIONS         OLDER FAMILIES           Budget
## 1491   CHEEZELS         OLDER FAMILIES           Budget
## 1492     SMITHS         OLDER FAMILIES           Budget
## 1493   PRINGLES         OLDER FAMILIES           Budget
## 1494    DORITOS         OLDER FAMILIES           Budget
## 1495   TWISTIES         OLDER FAMILIES           Budget
## 1496     SMITHS         YOUNG FAMILIES       Mainstream
## 1497   PRINGLES         YOUNG FAMILIES       Mainstream
## 1498   TWISTIES         YOUNG FAMILIES       Mainstream
## 1499    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1500   CHEEZELS  YOUNG SINGLES/COUPLES       Mainstream
## 1501     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1502     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1503      THINS  OLDER SINGLES/COUPLES          Premium
## 1504    DORITOS           NEW FAMILIES          Premium
## 1505   TOSTITOS           NEW FAMILIES          Premium
## 1506  INFUZIONS           NEW FAMILIES          Premium
## 1507    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 1508     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 1509    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 1510      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 1511       COBS         YOUNG FAMILIES          Premium
## 1512   PRINGLES         YOUNG FAMILIES          Premium
## 1513   PRINGLES         YOUNG FAMILIES          Premium
## 1514   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 1515  INFUZIONS MIDAGE SINGLES/COUPLES       Mainstream
## 1516   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 1517     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 1518   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 1519      THINS               RETIREES          Premium
## 1520       COBS               RETIREES          Premium
## 1521   TYRRELLS               RETIREES          Premium
## 1522   PRINGLES               RETIREES          Premium
## 1523   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 1524  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 1525   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 1526     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1527  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 1528   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 1529   PRINGLES         YOUNG FAMILIES           Budget
## 1530     SMITHS         YOUNG FAMILIES           Budget
## 1531   PRINGLES         YOUNG FAMILIES           Budget
## 1532   PRINGLES         YOUNG FAMILIES           Budget
## 1533    DORITOS         YOUNG FAMILIES           Budget
## 1534   CHEEZELS         YOUNG FAMILIES           Budget
## 1535    DORITOS         YOUNG FAMILIES           Budget
## 1536      THINS         YOUNG FAMILIES           Budget
## 1537    DORITOS  YOUNG SINGLES/COUPLES          Premium
## 1538     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 1539    DORITOS  YOUNG SINGLES/COUPLES          Premium
## 1540       COBS  OLDER SINGLES/COUPLES          Premium
## 1541     SMITHS  OLDER SINGLES/COUPLES          Premium
## 1542     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1543     KETTLE               RETIREES          Premium
## 1544      GRAIN               RETIREES          Premium
## 1545     KETTLE               RETIREES          Premium
## 1546  INFUZIONS               RETIREES          Premium
## 1547       COBS               RETIREES          Premium
## 1548   TOSTITOS               RETIREES          Premium
## 1549      THINS               RETIREES          Premium
## 1550   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 1551   TWISTIES  YOUNG SINGLES/COUPLES           Budget
## 1552   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 1553     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1554     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1555   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1556     KETTLE         OLDER FAMILIES           Budget
## 1557   PRINGLES         OLDER FAMILIES           Budget
## 1558   TWISTIES         OLDER FAMILIES           Budget
## 1559     KETTLE         OLDER FAMILIES           Budget
## 1560     SMITHS         OLDER FAMILIES           Budget
## 1561     DORITO         OLDER FAMILIES           Budget
## 1562  INFUZIONS               RETIREES       Mainstream
## 1563       COBS               RETIREES       Mainstream
## 1564       COBS               RETIREES       Mainstream
## 1565   PRINGLES               RETIREES       Mainstream
## 1566   PRINGLES               RETIREES       Mainstream
## 1567  INFUZIONS               RETIREES       Mainstream
## 1568    DORITOS               RETIREES       Mainstream
## 1569      THINS               RETIREES       Mainstream
## 1570   PRINGLES         YOUNG FAMILIES       Mainstream
## 1571   PRINGLES               RETIREES       Mainstream
## 1572      THINS               RETIREES       Mainstream
## 1573   PRINGLES               RETIREES       Mainstream
## 1574   TWISTIES               RETIREES       Mainstream
## 1575     KETTLE               RETIREES       Mainstream
## 1576     KETTLE               RETIREES       Mainstream
## 1577     INFZNS               RETIREES       Mainstream
## 1578       COBS MIDAGE SINGLES/COUPLES          Premium
## 1579     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 1580   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 1581     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 1582     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 1583     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 1584  INFUZIONS MIDAGE SINGLES/COUPLES          Premium
## 1585      THINS MIDAGE SINGLES/COUPLES          Premium
## 1586    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 1587     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 1588      THINS MIDAGE SINGLES/COUPLES          Premium
## 1589     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 1590     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 1591       COBS               RETIREES       Mainstream
## 1592  INFUZIONS               RETIREES       Mainstream
## 1593     KETTLE               RETIREES       Mainstream
## 1594  INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 1595    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 1596   PRINGLES               RETIREES       Mainstream
## 1597    DORITOS               RETIREES       Mainstream
## 1598  INFUZIONS               RETIREES       Mainstream
## 1599    DORITOS               RETIREES       Mainstream
## 1600   TOSTITOS               RETIREES       Mainstream
## 1601   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 1602    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 1603      THINS  OLDER SINGLES/COUPLES       Mainstream
## 1604   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 1605      THINS  OLDER SINGLES/COUPLES       Mainstream
## 1606     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1607  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 1608    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 1609   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 1610    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 1611     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 1612   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 1613       COBS  OLDER SINGLES/COUPLES          Premium
## 1614   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 1615    DORITOS  OLDER SINGLES/COUPLES          Premium
## 1616   PRINGLES               RETIREES          Premium
## 1617   PRINGLES               RETIREES          Premium
## 1618   PRINGLES               RETIREES          Premium
## 1619  INFUZIONS               RETIREES          Premium
## 1620     SMITHS  OLDER SINGLES/COUPLES           Budget
## 1621   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 1622  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 1623      THINS  OLDER SINGLES/COUPLES           Budget
## 1624     DORITO  OLDER SINGLES/COUPLES           Budget
## 1625   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 1626    DORITOS         YOUNG FAMILIES       Mainstream
## 1627   TWISTIES         YOUNG FAMILIES       Mainstream
## 1628  INFUZIONS         YOUNG FAMILIES       Mainstream
## 1629     INFZNS MIDAGE SINGLES/COUPLES           Budget
## 1630     DORITO MIDAGE SINGLES/COUPLES           Budget
## 1631     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 1632     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 1633   CHEEZELS MIDAGE SINGLES/COUPLES           Budget
## 1634   CHEEZELS  OLDER SINGLES/COUPLES          Premium
## 1635     SMITHS  OLDER SINGLES/COUPLES          Premium
## 1636     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1637    DORITOS  OLDER SINGLES/COUPLES          Premium
## 1638     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1639   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 1640     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1641  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 1642   CHEEZELS MIDAGE SINGLES/COUPLES           Budget
## 1643      THINS MIDAGE SINGLES/COUPLES           Budget
## 1644      GRAIN MIDAGE SINGLES/COUPLES           Budget
## 1645     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 1646   PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 1647       COBS MIDAGE SINGLES/COUPLES           Budget
## 1648  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 1649     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1650   TOSTITOS           NEW FAMILIES       Mainstream
## 1651   PRINGLES           NEW FAMILIES       Mainstream
## 1652     KETTLE           NEW FAMILIES       Mainstream
## 1653   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1654     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1655     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1656     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1657   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1658       COBS  OLDER SINGLES/COUPLES           Budget
## 1659  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 1660    DORITOS  OLDER SINGLES/COUPLES           Budget
## 1661     INFZNS  OLDER SINGLES/COUPLES           Budget
## 1662     KETTLE               RETIREES           Budget
## 1663  INFUZIONS               RETIREES           Budget
## 1664      GRAIN               RETIREES           Budget
## 1665     SMITHS               RETIREES           Budget
## 1666   PRINGLES               RETIREES           Budget
## 1667  INFUZIONS               RETIREES           Budget
## 1668   TYRRELLS               RETIREES           Budget
## 1669    DORITOS               RETIREES           Budget
## 1670     KETTLE               RETIREES           Budget
## 1671       COBS  OLDER SINGLES/COUPLES       Mainstream
## 1672   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 1673   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 1674      THINS  OLDER SINGLES/COUPLES       Mainstream
## 1675      THINS  OLDER SINGLES/COUPLES       Mainstream
## 1676     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1677     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1678    DORITOS         YOUNG FAMILIES           Budget
## 1679   TYRRELLS         YOUNG FAMILIES           Budget
## 1680  INFUZIONS         YOUNG FAMILIES           Budget
## 1681      GRAIN         YOUNG FAMILIES           Budget
## 1682    DORITOS         YOUNG FAMILIES           Budget
## 1683   TWISTIES         YOUNG FAMILIES           Budget
## 1684   TWISTIES         YOUNG FAMILIES           Budget
## 1685    DORITOS         YOUNG FAMILIES           Budget
## 1686  INFUZIONS         OLDER FAMILIES       Mainstream
## 1687    DORITOS         OLDER FAMILIES       Mainstream
## 1688  INFUZIONS         OLDER FAMILIES       Mainstream
## 1689    DORITOS           NEW FAMILIES          Premium
## 1690      THINS           NEW FAMILIES          Premium
## 1691    DORITOS           NEW FAMILIES          Premium
## 1692   TYRRELLS  OLDER SINGLES/COUPLES           Budget
## 1693     SMITHS         YOUNG FAMILIES       Mainstream
## 1694     KETTLE         YOUNG FAMILIES       Mainstream
## 1695   TWISTIES         YOUNG FAMILIES       Mainstream
## 1696      GRAIN         YOUNG FAMILIES       Mainstream
## 1697  INFUZIONS               RETIREES           Budget
## 1698  INFUZIONS               RETIREES           Budget
## 1699   PRINGLES               RETIREES           Budget
## 1700     SMITHS               RETIREES           Budget
## 1701   TYRRELLS               RETIREES           Budget
## 1702     SMITHS  OLDER SINGLES/COUPLES          Premium
## 1703   TYRRELLS  OLDER SINGLES/COUPLES          Premium
## 1704   CHEEZELS  OLDER SINGLES/COUPLES          Premium
## 1705    DORITOS  OLDER SINGLES/COUPLES          Premium
## 1706      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 1707     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1708     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1709    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1710     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 1711     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1712   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 1713   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 1714     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1715    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 1716       COBS  OLDER SINGLES/COUPLES       Mainstream
## 1717   TOSTITOS           NEW FAMILIES           Budget
## 1718      THINS           NEW FAMILIES           Budget
## 1719     KETTLE           NEW FAMILIES           Budget
## 1720   PRINGLES           NEW FAMILIES           Budget
## 1721   TOSTITOS           NEW FAMILIES           Budget
## 1722      GRAIN  OLDER SINGLES/COUPLES          Premium
## 1723      THINS  OLDER SINGLES/COUPLES          Premium
## 1724   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 1725     SMITHS  OLDER SINGLES/COUPLES          Premium
## 1726     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1727       COBS  OLDER SINGLES/COUPLES          Premium
## 1728     KETTLE               RETIREES           Budget
## 1729      THINS               RETIREES           Budget
## 1730     SMITHS               RETIREES           Budget
## 1731      THINS               RETIREES           Budget
## 1732   PRINGLES               RETIREES           Budget
## 1733       COBS               RETIREES           Budget
## 1734     KETTLE           NEW FAMILIES           Budget
## 1735   PRINGLES           NEW FAMILIES           Budget
## 1736    DORITOS           NEW FAMILIES           Budget
## 1737     KETTLE           NEW FAMILIES           Budget
## 1738     KETTLE           NEW FAMILIES           Budget
## 1739       COBS           NEW FAMILIES           Budget
## 1740   PRINGLES           NEW FAMILIES           Budget
## 1741       COBS               RETIREES           Budget
## 1742  INFUZIONS               RETIREES           Budget
## 1743      GRAIN               RETIREES           Budget
## 1744      THINS  OLDER SINGLES/COUPLES       Mainstream
## 1745   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 1746  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 1747   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 1748   PRINGLES               RETIREES           Budget
## 1749      THINS               RETIREES           Budget
## 1750   TWISTIES               RETIREES           Budget
## 1751       COBS               RETIREES           Budget
## 1752     KETTLE               RETIREES           Budget
## 1753   PRINGLES               RETIREES           Budget
## 1754      GRAIN               RETIREES           Budget
## 1755      GRAIN               RETIREES           Budget
## 1756  INFUZIONS         YOUNG FAMILIES       Mainstream
## 1757     KETTLE         YOUNG FAMILIES          Premium
## 1758     KETTLE         YOUNG FAMILIES          Premium
## 1759     KETTLE         YOUNG FAMILIES          Premium
## 1760       COBS         OLDER FAMILIES           Budget
## 1761     SMITHS         OLDER FAMILIES           Budget
## 1762    DORITOS         OLDER FAMILIES           Budget
## 1763    DORITOS         OLDER FAMILIES           Budget
## 1764     KETTLE         OLDER FAMILIES           Budget
## 1765     KETTLE         OLDER FAMILIES           Budget
## 1766   PRINGLES         OLDER FAMILIES           Budget
## 1767    DORITOS               RETIREES       Mainstream
## 1768     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 1769     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 1770  INFUZIONS MIDAGE SINGLES/COUPLES          Premium
## 1771    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 1772      GRAIN MIDAGE SINGLES/COUPLES          Premium
## 1773    DORITOS               RETIREES       Mainstream
## 1774  INFUZIONS               RETIREES       Mainstream
## 1775   PRINGLES               RETIREES       Mainstream
## 1776   PRINGLES               RETIREES       Mainstream
## 1777   TOSTITOS               RETIREES       Mainstream
## 1778   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 1779   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 1780   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 1781   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 1782      GRAIN  OLDER SINGLES/COUPLES          Premium
## 1783     INFZNS  OLDER SINGLES/COUPLES          Premium
## 1784  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 1785     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1786    DORITOS  OLDER SINGLES/COUPLES           Budget
## 1787   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 1788  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 1789    DORITOS  OLDER SINGLES/COUPLES           Budget
## 1790   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 1791       COBS  OLDER SINGLES/COUPLES           Budget
## 1792   TYRRELLS  OLDER SINGLES/COUPLES           Budget
## 1793     KETTLE  OLDER SINGLES/COUPLES           Budget
## 1794   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 1795      THINS  OLDER SINGLES/COUPLES       Mainstream
## 1796       COBS  OLDER SINGLES/COUPLES       Mainstream
## 1797     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1798     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1799      THINS  OLDER SINGLES/COUPLES       Mainstream
## 1800     KETTLE         YOUNG FAMILIES           Budget
## 1801     KETTLE               RETIREES          Premium
## 1802     KETTLE               RETIREES          Premium
## 1803    DORITOS               RETIREES          Premium
## 1804  INFUZIONS         OLDER FAMILIES           Budget
## 1805      GRAIN         OLDER FAMILIES           Budget
## 1806  INFUZIONS         OLDER FAMILIES           Budget
## 1807    DORITOS         OLDER FAMILIES           Budget
## 1808   PRINGLES         OLDER FAMILIES           Budget
## 1809      GRAIN         OLDER FAMILIES           Budget
## 1810     KETTLE         OLDER FAMILIES           Budget
## 1811     KETTLE         OLDER FAMILIES           Budget
## 1812   PRINGLES         OLDER FAMILIES           Budget
## 1813     SMITHS         OLDER FAMILIES           Budget
## 1814   PRINGLES         OLDER FAMILIES           Budget
## 1815      GRAIN         OLDER FAMILIES           Budget
## 1816   TWISTIES         OLDER FAMILIES           Budget
## 1817     KETTLE         OLDER FAMILIES           Budget
## 1818     KETTLE         OLDER FAMILIES           Budget
## 1819   PRINGLES         OLDER FAMILIES           Budget
## 1820    DORITOS         OLDER FAMILIES           Budget
## 1821     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 1822   PRINGLES         YOUNG FAMILIES          Premium
## 1823     KETTLE         YOUNG FAMILIES          Premium
## 1824     KETTLE         YOUNG FAMILIES          Premium
## 1825       COBS         YOUNG FAMILIES          Premium
## 1826      GRAIN         YOUNG FAMILIES          Premium
## 1827     KETTLE         YOUNG FAMILIES          Premium
## 1828  INFUZIONS         YOUNG FAMILIES          Premium
## 1829   PRINGLES         YOUNG FAMILIES          Premium
## 1830     SMITHS         YOUNG FAMILIES       Mainstream
## 1831       COBS         YOUNG FAMILIES       Mainstream
## 1832   TOSTITOS         YOUNG FAMILIES       Mainstream
## 1833   TWISTIES         YOUNG FAMILIES       Mainstream
## 1834    DORITOS               RETIREES          Premium
## 1835       COBS               RETIREES          Premium
## 1836   TOSTITOS               RETIREES           Budget
## 1837   PRINGLES               RETIREES           Budget
## 1838     KETTLE               RETIREES           Budget
## 1839   TWISTIES               RETIREES           Budget
## 1840   TOSTITOS               RETIREES           Budget
## 1841   TOSTITOS               RETIREES       Mainstream
## 1842      GRAIN               RETIREES       Mainstream
## 1843      GRAIN               RETIREES       Mainstream
## 1844   PRINGLES               RETIREES       Mainstream
## 1845      THINS               RETIREES       Mainstream
## 1846       COBS               RETIREES       Mainstream
## 1847   PRINGLES               RETIREES       Mainstream
## 1848     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1849       COBS  OLDER SINGLES/COUPLES          Premium
## 1850     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1851     SMITHS  OLDER SINGLES/COUPLES          Premium
## 1852      THINS  OLDER SINGLES/COUPLES          Premium
## 1853     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1854      THINS  OLDER SINGLES/COUPLES          Premium
## 1855     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1856     KETTLE  OLDER SINGLES/COUPLES          Premium
## 1857     KETTLE         OLDER FAMILIES           Budget
## 1858     KETTLE         OLDER FAMILIES           Budget
## 1859     SMITHS         OLDER FAMILIES           Budget
## 1860       COBS               RETIREES          Premium
## 1861   TOSTITOS               RETIREES          Premium
## 1862  INFUZIONS               RETIREES          Premium
## 1863  INFUZIONS               RETIREES          Premium
## 1864      GRAIN               RETIREES          Premium
## 1865     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 1866   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 1867   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 1868     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1869     KETTLE               RETIREES           Budget
## 1870     DORITO               RETIREES           Budget
## 1871     KETTLE               RETIREES           Budget
## 1872   TOSTITOS               RETIREES           Budget
## 1873      THINS               RETIREES           Budget
## 1874     SMITHS               RETIREES           Budget
## 1875    DORITOS         YOUNG FAMILIES           Budget
## 1876   TYRRELLS         YOUNG FAMILIES           Budget
## 1877     DORITO         YOUNG FAMILIES           Budget
## 1878    DORITOS         YOUNG FAMILIES           Budget
## 1879     KETTLE         YOUNG FAMILIES           Budget
## 1880      GRAIN         YOUNG FAMILIES           Budget
## 1881   PRINGLES         YOUNG FAMILIES           Budget
## 1882     KETTLE               RETIREES           Budget
## 1883      THINS               RETIREES           Budget
## 1884     DORITO               RETIREES           Budget
## 1885   TWISTIES               RETIREES           Budget
## 1886      GRAIN  OLDER SINGLES/COUPLES          Premium
## 1887      THINS  OLDER SINGLES/COUPLES          Premium
## 1888    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 1889     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 1890    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 1891    DORITOS               RETIREES           Budget
## 1892   PRINGLES               RETIREES           Budget
## 1893   PRINGLES               RETIREES           Budget
## 1894   PRINGLES               RETIREES           Budget
## 1895     SMITHS               RETIREES           Budget
## 1896     SMITHS         YOUNG FAMILIES          Premium
## 1897     KETTLE         YOUNG FAMILIES          Premium
## 1898       COBS         YOUNG FAMILIES          Premium
## 1899   TYRRELLS         YOUNG FAMILIES          Premium
## 1900     SMITHS         YOUNG FAMILIES          Premium
## 1901      THINS         YOUNG FAMILIES          Premium
## 1902   PRINGLES               RETIREES       Mainstream
## 1903   TOSTITOS               RETIREES       Mainstream
## 1904     KETTLE               RETIREES       Mainstream
## 1905     KETTLE               RETIREES       Mainstream
## 1906   PRINGLES               RETIREES       Mainstream
## 1907     KETTLE               RETIREES       Mainstream
## 1908      GRAIN         YOUNG FAMILIES          Premium
## 1909     KETTLE         YOUNG FAMILIES          Premium
## 1910       COBS         OLDER FAMILIES           Budget
## 1911   TOSTITOS         OLDER FAMILIES           Budget
## 1912     KETTLE         OLDER FAMILIES           Budget
## 1913     INFZNS         OLDER FAMILIES           Budget
## 1914     SMITHS         OLDER FAMILIES           Budget
## 1915    DORITOS         OLDER FAMILIES           Budget
## 1916     KETTLE         OLDER FAMILIES           Budget
## 1917       COBS         YOUNG FAMILIES           Budget
## 1918       COBS         YOUNG FAMILIES           Budget
## 1919     KETTLE         YOUNG FAMILIES           Budget
## 1920    DORITOS         YOUNG FAMILIES           Budget
## 1921  INFUZIONS         YOUNG FAMILIES           Budget
## 1922    DORITOS         YOUNG FAMILIES           Budget
## 1923     KETTLE         OLDER FAMILIES       Mainstream
## 1924      GRAIN         OLDER FAMILIES       Mainstream
## 1925   TYRRELLS         OLDER FAMILIES       Mainstream
## 1926     KETTLE         OLDER FAMILIES       Mainstream
## 1927     SMITHS         OLDER FAMILIES       Mainstream
## 1928      GRAIN         OLDER FAMILIES       Mainstream
## 1929       COBS               RETIREES       Mainstream
## 1930      THINS               RETIREES       Mainstream
## 1931     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1932     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1933     INFZNS  OLDER SINGLES/COUPLES       Mainstream
## 1934      THINS  OLDER SINGLES/COUPLES       Mainstream
## 1935   CHEEZELS  YOUNG SINGLES/COUPLES       Mainstream
## 1936   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 1937      GRAIN               RETIREES           Budget
## 1938     DORITO               RETIREES           Budget
## 1939  INFUZIONS               RETIREES           Budget
## 1940     KETTLE               RETIREES           Budget
## 1941      GRAIN               RETIREES           Budget
## 1942     KETTLE               RETIREES           Budget
## 1943   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 1944     KETTLE  OLDER SINGLES/COUPLES           Budget
## 1945       COBS  OLDER SINGLES/COUPLES           Budget
## 1946     KETTLE  OLDER SINGLES/COUPLES           Budget
## 1947   TYRRELLS  OLDER SINGLES/COUPLES           Budget
## 1948     KETTLE  OLDER SINGLES/COUPLES           Budget
## 1949   PRINGLES               RETIREES       Mainstream
## 1950     KETTLE               RETIREES       Mainstream
## 1951     INFZNS               RETIREES       Mainstream
## 1952   PRINGLES               RETIREES       Mainstream
## 1953   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 1954     KETTLE  OLDER SINGLES/COUPLES           Budget
## 1955     KETTLE  OLDER SINGLES/COUPLES           Budget
## 1956  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 1957     KETTLE  OLDER SINGLES/COUPLES           Budget
## 1958   TYRRELLS         YOUNG FAMILIES       Mainstream
## 1959      GRAIN         YOUNG FAMILIES       Mainstream
## 1960    DORITOS         YOUNG FAMILIES       Mainstream
## 1961     SMITHS         YOUNG FAMILIES       Mainstream
## 1962     KETTLE         YOUNG FAMILIES       Mainstream
## 1963   PRINGLES         YOUNG FAMILIES       Mainstream
## 1964     KETTLE         YOUNG FAMILIES       Mainstream
## 1965      GRAIN  YOUNG SINGLES/COUPLES           Budget
## 1966     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 1967   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 1968    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 1969  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 1970    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 1971  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 1972  INFUZIONS         OLDER FAMILIES       Mainstream
## 1973   PRINGLES         OLDER FAMILIES       Mainstream
## 1974    DORITOS         OLDER FAMILIES       Mainstream
## 1975     KETTLE         OLDER FAMILIES       Mainstream
## 1976     KETTLE         OLDER FAMILIES       Mainstream
## 1977    DORITOS         OLDER FAMILIES       Mainstream
## 1978     SMITHS         OLDER FAMILIES       Mainstream
## 1979     KETTLE         OLDER FAMILIES       Mainstream
## 1980   TWISTIES         OLDER FAMILIES          Premium
## 1981   CHEEZELS         OLDER FAMILIES          Premium
## 1982      GRAIN         OLDER FAMILIES          Premium
## 1983   PRINGLES         OLDER FAMILIES          Premium
## 1984     SMITHS         OLDER FAMILIES          Premium
## 1985     KETTLE         OLDER FAMILIES          Premium
## 1986     KETTLE         OLDER FAMILIES          Premium
## 1987      THINS         YOUNG FAMILIES          Premium
## 1988    DORITOS         YOUNG FAMILIES          Premium
## 1989     KETTLE         YOUNG FAMILIES          Premium
## 1990     KETTLE         YOUNG FAMILIES          Premium
## 1991   TYRRELLS         YOUNG FAMILIES          Premium
## 1992   TWISTIES  YOUNG SINGLES/COUPLES          Premium
## 1993   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 1994     SMITHS  YOUNG SINGLES/COUPLES          Premium
## 1995     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 1996   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 1997     KETTLE         YOUNG FAMILIES          Premium
## 1998      GRAIN         YOUNG FAMILIES          Premium
## 1999       COBS         YOUNG FAMILIES          Premium
## 2000     KETTLE         YOUNG FAMILIES          Premium
## 2001   PRINGLES         YOUNG FAMILIES          Premium
## 2002   PRINGLES         YOUNG FAMILIES          Premium
## 2003   PRINGLES         YOUNG FAMILIES          Premium
## 2004     DORITO MIDAGE SINGLES/COUPLES          Premium
## 2005   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 2006  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 2007   CHEEZELS  OLDER SINGLES/COUPLES           Budget
## 2008  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 2009  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 2010       COBS  OLDER SINGLES/COUPLES           Budget
## 2011     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2012   CHEEZELS MIDAGE SINGLES/COUPLES       Mainstream
## 2013     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 2014     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2015    DORITOS  OLDER SINGLES/COUPLES          Premium
## 2016      THINS  OLDER SINGLES/COUPLES          Premium
## 2017   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 2018    DORITOS  OLDER SINGLES/COUPLES          Premium
## 2019   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 2020     SMITHS  OLDER SINGLES/COUPLES          Premium
## 2021   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 2022   CHEEZELS  OLDER SINGLES/COUPLES          Premium
## 2023     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2024   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 2025     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2026   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 2027  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 2028     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2029   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 2030       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 2031   TYRRELLS  YOUNG SINGLES/COUPLES          Premium
## 2032      GRAIN  YOUNG SINGLES/COUPLES          Premium
## 2033    DORITOS         YOUNG FAMILIES           Budget
## 2034     KETTLE         YOUNG FAMILIES           Budget
## 2035     KETTLE         YOUNG FAMILIES           Budget
## 2036     KETTLE         YOUNG FAMILIES           Budget
## 2037   PRINGLES         YOUNG FAMILIES           Budget
## 2038    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2039       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 2040      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 2041     SMITHS  OLDER SINGLES/COUPLES          Premium
## 2042     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2043     SMITHS  OLDER SINGLES/COUPLES          Premium
## 2044   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 2045  INFUZIONS               RETIREES           Budget
## 2046     KETTLE               RETIREES           Budget
## 2047     KETTLE               RETIREES           Budget
## 2048     KETTLE               RETIREES           Budget
## 2049   TYRRELLS           NEW FAMILIES       Mainstream
## 2050    DORITOS           NEW FAMILIES       Mainstream
## 2051   TOSTITOS           NEW FAMILIES       Mainstream
## 2052   PRINGLES           NEW FAMILIES       Mainstream
## 2053     SMITHS           NEW FAMILIES       Mainstream
## 2054     KETTLE           NEW FAMILIES       Mainstream
## 2055     SMITHS               RETIREES          Premium
## 2056      THINS               RETIREES          Premium
## 2057   PRINGLES               RETIREES          Premium
## 2058     KETTLE               RETIREES          Premium
## 2059   TYRRELLS               RETIREES          Premium
## 2060   PRINGLES               RETIREES          Premium
## 2061  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 2062       COBS  OLDER SINGLES/COUPLES       Mainstream
## 2063   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 2064   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 2065   TOSTITOS         OLDER FAMILIES           Budget
## 2066    DORITOS         OLDER FAMILIES           Budget
## 2067   TWISTIES         OLDER FAMILIES           Budget
## 2068    DORITOS         OLDER FAMILIES           Budget
## 2069       COBS         OLDER FAMILIES           Budget
## 2070     KETTLE         OLDER FAMILIES           Budget
## 2071     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2072     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2073     SMITHS         YOUNG FAMILIES           Budget
## 2074   TWISTIES         YOUNG FAMILIES           Budget
## 2075   PRINGLES         YOUNG FAMILIES           Budget
## 2076     KETTLE         YOUNG FAMILIES           Budget
## 2077   PRINGLES         YOUNG FAMILIES           Budget
## 2078     KETTLE         YOUNG FAMILIES       Mainstream
## 2079   PRINGLES         YOUNG FAMILIES       Mainstream
## 2080     DORITO         YOUNG FAMILIES       Mainstream
## 2081   CHEEZELS         YOUNG FAMILIES       Mainstream
## 2082    DORITOS         YOUNG FAMILIES       Mainstream
## 2083      THINS         YOUNG FAMILIES       Mainstream
## 2084    DORITOS         YOUNG FAMILIES       Mainstream
## 2085   TOSTITOS         YOUNG FAMILIES       Mainstream
## 2086   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 2087     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 2088   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 2089     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2090     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2091     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 2092     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2093     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 2094      THINS         OLDER FAMILIES           Budget
## 2095  INFUZIONS         OLDER FAMILIES           Budget
## 2096     KETTLE         OLDER FAMILIES           Budget
## 2097   PRINGLES         OLDER FAMILIES           Budget
## 2098     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 2099     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 2100     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 2101      THINS  OLDER SINGLES/COUPLES       Mainstream
## 2102     KETTLE         YOUNG FAMILIES           Budget
## 2103     DORITO         YOUNG FAMILIES           Budget
## 2104      GRAIN         YOUNG FAMILIES           Budget
## 2105     KETTLE         YOUNG FAMILIES           Budget
## 2106     KETTLE               RETIREES           Budget
## 2107   PRINGLES               RETIREES           Budget
## 2108   TOSTITOS         YOUNG FAMILIES          Premium
## 2109      GRAIN MIDAGE SINGLES/COUPLES       Mainstream
## 2110     INFZNS MIDAGE SINGLES/COUPLES       Mainstream
## 2111   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 2112  INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 2113   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 2114  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 2115     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2116     DORITO  OLDER SINGLES/COUPLES           Budget
## 2117   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 2118   TYRRELLS  OLDER SINGLES/COUPLES           Budget
## 2119  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 2120     KETTLE               RETIREES           Budget
## 2121      GRAIN               RETIREES           Budget
## 2122   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 2123     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2124     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2125     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 2126      GRAIN MIDAGE SINGLES/COUPLES       Mainstream
## 2127   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 2128       COBS  OLDER SINGLES/COUPLES          Premium
## 2129   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 2130      GRAIN  OLDER SINGLES/COUPLES          Premium
## 2131     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2132      THINS           NEW FAMILIES           Budget
## 2133     KETTLE           NEW FAMILIES           Budget
## 2134  INFUZIONS           NEW FAMILIES           Budget
## 2135    DORITOS           NEW FAMILIES           Budget
## 2136   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 2137  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 2138       COBS  OLDER SINGLES/COUPLES          Premium
## 2139    DORITOS         YOUNG FAMILIES           Budget
## 2140     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2141   TWISTIES               RETIREES          Premium
## 2142     SMITHS               RETIREES          Premium
## 2143   PRINGLES               RETIREES          Premium
## 2144     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 2145       COBS MIDAGE SINGLES/COUPLES          Premium
## 2146   TYRRELLS MIDAGE SINGLES/COUPLES          Premium
## 2147   TYRRELLS MIDAGE SINGLES/COUPLES          Premium
## 2148     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 2149      THINS MIDAGE SINGLES/COUPLES          Premium
## 2150       COBS MIDAGE SINGLES/COUPLES          Premium
## 2151   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 2152   TWISTIES         OLDER FAMILIES       Mainstream
## 2153   TWISTIES         OLDER FAMILIES       Mainstream
## 2154    DORITOS         OLDER FAMILIES       Mainstream
## 2155   PRINGLES         OLDER FAMILIES       Mainstream
## 2156       COBS         OLDER FAMILIES       Mainstream
## 2157    DORITOS         OLDER FAMILIES       Mainstream
## 2158       COBS         OLDER FAMILIES       Mainstream
## 2159     KETTLE         OLDER FAMILIES       Mainstream
## 2160      THINS               RETIREES          Premium
## 2161     KETTLE               RETIREES          Premium
## 2162       COBS               RETIREES          Premium
## 2163   PRINGLES               RETIREES          Premium
## 2164   TYRRELLS               RETIREES          Premium
## 2165   TYRRELLS         OLDER FAMILIES       Mainstream
## 2166    DORITOS         OLDER FAMILIES       Mainstream
## 2167    DORITOS         OLDER FAMILIES       Mainstream
## 2168    DORITOS         OLDER FAMILIES       Mainstream
## 2169   PRINGLES         OLDER FAMILIES       Mainstream
## 2170    DORITOS         OLDER FAMILIES       Mainstream
## 2171     INFZNS         OLDER FAMILIES       Mainstream
## 2172    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 2173      GRAIN  OLDER SINGLES/COUPLES       Mainstream
## 2174   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 2175  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 2176     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 2177   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 2178     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2179    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 2180   PRINGLES               RETIREES       Mainstream
## 2181   PRINGLES               RETIREES       Mainstream
## 2182   TOSTITOS               RETIREES       Mainstream
## 2183     KETTLE               RETIREES       Mainstream
## 2184   PRINGLES               RETIREES       Mainstream
## 2185   TYRRELLS  OLDER SINGLES/COUPLES           Budget
## 2186   TYRRELLS  OLDER SINGLES/COUPLES           Budget
## 2187    DORITOS  OLDER SINGLES/COUPLES           Budget
## 2188      GRAIN  OLDER SINGLES/COUPLES           Budget
## 2189      THINS  OLDER SINGLES/COUPLES           Budget
## 2190     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2191     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2192   TYRRELLS  OLDER SINGLES/COUPLES          Premium
## 2193  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 2194   TYRRELLS         OLDER FAMILIES           Budget
## 2195   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 2196   TYRRELLS MIDAGE SINGLES/COUPLES       Mainstream
## 2197     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 2198     KETTLE               RETIREES       Mainstream
## 2199      GRAIN               RETIREES       Mainstream
## 2200     SMITHS               RETIREES       Mainstream
## 2201   PRINGLES               RETIREES       Mainstream
## 2202   PRINGLES               RETIREES       Mainstream
## 2203      THINS         OLDER FAMILIES           Budget
## 2204     INFZNS         OLDER FAMILIES       Mainstream
## 2205   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 2206     INFZNS MIDAGE SINGLES/COUPLES          Premium
## 2207    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 2208     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 2209     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 2210     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2211   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 2212      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 2213    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 2214     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2215    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2216     INFZNS         OLDER FAMILIES          Premium
## 2217      THINS         OLDER FAMILIES          Premium
## 2218    DORITOS         OLDER FAMILIES          Premium
## 2219     KETTLE         OLDER FAMILIES          Premium
## 2220    DORITOS         OLDER FAMILIES       Mainstream
## 2221   PRINGLES         OLDER FAMILIES       Mainstream
## 2222     SMITHS         OLDER FAMILIES       Mainstream
## 2223   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 2224     DORITO  OLDER SINGLES/COUPLES       Mainstream
## 2225      THINS  OLDER SINGLES/COUPLES       Mainstream
## 2226   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 2227   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 2228     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 2229     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 2230     KETTLE         YOUNG FAMILIES          Premium
## 2231     KETTLE         YOUNG FAMILIES          Premium
## 2232    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2233   CHEEZELS  YOUNG SINGLES/COUPLES       Mainstream
## 2234  INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 2235  INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 2236     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 2237     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 2238   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 2239   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 2240   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 2241   TWISTIES         OLDER FAMILIES           Budget
## 2242    DORITOS         OLDER FAMILIES           Budget
## 2243    DORITOS         OLDER FAMILIES           Budget
## 2244   TYRRELLS         OLDER FAMILIES           Budget
## 2245      THINS         OLDER FAMILIES           Budget
## 2246   PRINGLES         OLDER FAMILIES           Budget
## 2247    DORITOS         OLDER FAMILIES           Budget
## 2248       COBS         OLDER FAMILIES           Budget
## 2249     DORITO         OLDER FAMILIES          Premium
## 2250       COBS         OLDER FAMILIES          Premium
## 2251  INFUZIONS         OLDER FAMILIES          Premium
## 2252  INFUZIONS         OLDER FAMILIES          Premium
## 2253     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2254     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2255    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2256   TYRRELLS  OLDER SINGLES/COUPLES          Premium
## 2257    DORITOS  OLDER SINGLES/COUPLES          Premium
## 2258     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2259   TYRRELLS               RETIREES       Mainstream
## 2260     KETTLE               RETIREES           Budget
## 2261    DORITOS               RETIREES           Budget
## 2262   TYRRELLS               RETIREES           Budget
## 2263     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2264   TYRRELLS MIDAGE SINGLES/COUPLES       Mainstream
## 2265   TYRRELLS               RETIREES       Mainstream
## 2266     KETTLE               RETIREES       Mainstream
## 2267   PRINGLES               RETIREES       Mainstream
## 2268      THINS               RETIREES       Mainstream
## 2269  INFUZIONS               RETIREES       Mainstream
## 2270   PRINGLES               RETIREES       Mainstream
## 2271   TOSTITOS               RETIREES       Mainstream
## 2272   TOSTITOS  YOUNG SINGLES/COUPLES           Budget
## 2273     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 2274     INFZNS  YOUNG SINGLES/COUPLES           Budget
## 2275     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 2276      THINS  YOUNG SINGLES/COUPLES           Budget
## 2277   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 2278       COBS  OLDER SINGLES/COUPLES       Mainstream
## 2279     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 2280   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 2281     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 2282      THINS MIDAGE SINGLES/COUPLES           Budget
## 2283      THINS MIDAGE SINGLES/COUPLES           Budget
## 2284     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 2285     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 2286     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2287     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2288      THINS  OLDER SINGLES/COUPLES          Premium
## 2289   TWISTIES         YOUNG FAMILIES          Premium
## 2290     KETTLE         YOUNG FAMILIES          Premium
## 2291    DORITOS         YOUNG FAMILIES          Premium
## 2292     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 2293  INFUZIONS  YOUNG SINGLES/COUPLES          Premium
## 2294  INFUZIONS  YOUNG SINGLES/COUPLES          Premium
## 2295   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 2296   CHEEZELS  YOUNG SINGLES/COUPLES       Mainstream
## 2297   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2298   PRINGLES               RETIREES          Premium
## 2299  INFUZIONS               RETIREES          Premium
## 2300   PRINGLES               RETIREES          Premium
## 2301    DORITOS               RETIREES          Premium
## 2302   TYRRELLS         OLDER FAMILIES       Mainstream
## 2303     KETTLE         OLDER FAMILIES       Mainstream
## 2304   PRINGLES         OLDER FAMILIES       Mainstream
## 2305   TYRRELLS         OLDER FAMILIES       Mainstream
## 2306   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 2307     SMITHS           NEW FAMILIES           Budget
## 2308     KETTLE           NEW FAMILIES           Budget
## 2309   TOSTITOS           NEW FAMILIES           Budget
## 2310     SMITHS           NEW FAMILIES           Budget
## 2311     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2312    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2313   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 2314    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2315    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2316   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 2317       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 2318     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2319      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 2320    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2321      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 2322    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2323   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 2324   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 2325     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2326   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 2327       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 2328      GRAIN  OLDER SINGLES/COUPLES           Budget
## 2329     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2330      GRAIN  OLDER SINGLES/COUPLES           Budget
## 2331      GRAIN  OLDER SINGLES/COUPLES           Budget
## 2332     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 2333   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2334   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 2335    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2336   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 2337     INFZNS  YOUNG SINGLES/COUPLES       Mainstream
## 2338     KETTLE         OLDER FAMILIES           Budget
## 2339   PRINGLES         OLDER FAMILIES           Budget
## 2340     SMITHS         OLDER FAMILIES           Budget
## 2341    DORITOS         OLDER FAMILIES           Budget
## 2342   PRINGLES         OLDER FAMILIES           Budget
## 2343     KETTLE         OLDER FAMILIES           Budget
## 2344       COBS         OLDER FAMILIES           Budget
## 2345     KETTLE         OLDER FAMILIES           Budget
## 2346   TYRRELLS MIDAGE SINGLES/COUPLES       Mainstream
## 2347    DORITOS         YOUNG FAMILIES       Mainstream
## 2348     SMITHS         YOUNG FAMILIES       Mainstream
## 2349      THINS         YOUNG FAMILIES       Mainstream
## 2350     KETTLE         YOUNG FAMILIES       Mainstream
## 2351     KETTLE         YOUNG FAMILIES       Mainstream
## 2352  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 2353      THINS  OLDER SINGLES/COUPLES           Budget
## 2354   PRINGLES         YOUNG FAMILIES       Mainstream
## 2355      GRAIN         OLDER FAMILIES       Mainstream
## 2356     KETTLE         OLDER FAMILIES       Mainstream
## 2357    DORITOS         OLDER FAMILIES       Mainstream
## 2358     KETTLE         OLDER FAMILIES       Mainstream
## 2359     KETTLE         OLDER FAMILIES           Budget
## 2360   PRINGLES         OLDER FAMILIES           Budget
## 2361    DORITOS         OLDER FAMILIES           Budget
## 2362   PRINGLES         OLDER FAMILIES           Budget
## 2363     KETTLE         OLDER FAMILIES           Budget
## 2364    DORITOS         OLDER FAMILIES           Budget
## 2365   TYRRELLS         OLDER FAMILIES           Budget
## 2366   TOSTITOS         OLDER FAMILIES           Budget
## 2367   PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 2368     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 2369       COBS MIDAGE SINGLES/COUPLES           Budget
## 2370     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 2371      THINS         YOUNG FAMILIES           Budget
## 2372   CHEEZELS         YOUNG FAMILIES           Budget
## 2373       COBS         YOUNG FAMILIES           Budget
## 2374    DORITOS         YOUNG FAMILIES           Budget
## 2375    DORITOS               RETIREES       Mainstream
## 2376     KETTLE               RETIREES       Mainstream
## 2377      THINS               RETIREES       Mainstream
## 2378      THINS  OLDER SINGLES/COUPLES           Budget
## 2379   CHEEZELS  OLDER SINGLES/COUPLES           Budget
## 2380   CHEEZELS  OLDER SINGLES/COUPLES           Budget
## 2381       COBS         YOUNG FAMILIES           Budget
## 2382   TWISTIES         YOUNG FAMILIES           Budget
## 2383    DORITOS         YOUNG FAMILIES           Budget
## 2384   TWISTIES         YOUNG FAMILIES           Budget
## 2385   TOSTITOS         YOUNG FAMILIES           Budget
## 2386     KETTLE         YOUNG FAMILIES           Budget
## 2387      GRAIN         YOUNG FAMILIES           Budget
## 2388  INFUZIONS         YOUNG FAMILIES           Budget
## 2389     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 2390    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2391   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 2392   PRINGLES         OLDER FAMILIES           Budget
## 2393       COBS         OLDER FAMILIES           Budget
## 2394    DORITOS         OLDER FAMILIES           Budget
## 2395    DORITOS         OLDER FAMILIES           Budget
## 2396      THINS               RETIREES           Budget
## 2397   PRINGLES               RETIREES           Budget
## 2398     KETTLE               RETIREES           Budget
## 2399     KETTLE               RETIREES           Budget
## 2400  INFUZIONS               RETIREES           Budget
## 2401     INFZNS               RETIREES           Budget
## 2402     SMITHS         OLDER FAMILIES           Budget
## 2403   PRINGLES         OLDER FAMILIES           Budget
## 2404   PRINGLES         OLDER FAMILIES           Budget
## 2405     KETTLE         OLDER FAMILIES           Budget
## 2406     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2407   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 2408   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 2409     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2410       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 2411  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 2412    DORITOS  OLDER SINGLES/COUPLES           Budget
## 2413     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2414   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 2415     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2416    DORITOS  OLDER SINGLES/COUPLES           Budget
## 2417   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 2418     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2419     KETTLE           NEW FAMILIES           Budget
## 2420     SMITHS           NEW FAMILIES           Budget
## 2421    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 2422   PRINGLES               RETIREES       Mainstream
## 2423       COBS         YOUNG FAMILIES       Mainstream
## 2424    DORITOS         YOUNG FAMILIES       Mainstream
## 2425     KETTLE         YOUNG FAMILIES       Mainstream
## 2426       COBS  OLDER SINGLES/COUPLES           Budget
## 2427  INFUZIONS               RETIREES          Premium
## 2428     KETTLE               RETIREES          Premium
## 2429     INFZNS               RETIREES          Premium
## 2430  INFUZIONS               RETIREES          Premium
## 2431  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 2432   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 2433   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 2434      GRAIN  OLDER SINGLES/COUPLES           Budget
## 2435     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2436       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 2437     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2438      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 2439       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 2440   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 2441    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2442   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 2443     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2444   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 2445    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2446   TWISTIES         OLDER FAMILIES       Mainstream
## 2447     KETTLE         OLDER FAMILIES       Mainstream
## 2448   TWISTIES         OLDER FAMILIES       Mainstream
## 2449   PRINGLES         OLDER FAMILIES       Mainstream
## 2450      THINS               RETIREES           Budget
## 2451     SMITHS               RETIREES           Budget
## 2452     KETTLE               RETIREES           Budget
## 2453     SMITHS               RETIREES           Budget
## 2454     KETTLE               RETIREES           Budget
## 2455     KETTLE               RETIREES           Budget
## 2456  INFUZIONS         OLDER FAMILIES           Budget
## 2457     SMITHS         OLDER FAMILIES           Budget
## 2458       COBS         OLDER FAMILIES           Budget
## 2459     DORITO         OLDER FAMILIES           Budget
## 2460    DORITOS         OLDER FAMILIES           Budget
## 2461       COBS               RETIREES       Mainstream
## 2462      THINS               RETIREES       Mainstream
## 2463       COBS               RETIREES       Mainstream
## 2464   TWISTIES         YOUNG FAMILIES          Premium
## 2465   TYRRELLS         YOUNG FAMILIES          Premium
## 2466      THINS         YOUNG FAMILIES          Premium
## 2467     SMITHS         YOUNG FAMILIES          Premium
## 2468      GRAIN         YOUNG FAMILIES          Premium
## 2469       COBS         YOUNG FAMILIES          Premium
## 2470   CHEEZELS         YOUNG FAMILIES          Premium
## 2471     KETTLE         YOUNG FAMILIES          Premium
## 2472   TYRRELLS         YOUNG FAMILIES       Mainstream
## 2473       COBS         YOUNG FAMILIES       Mainstream
## 2474   TWISTIES         YOUNG FAMILIES       Mainstream
## 2475      THINS         YOUNG FAMILIES       Mainstream
## 2476    DORITOS         YOUNG FAMILIES       Mainstream
## 2477    DORITOS         YOUNG FAMILIES       Mainstream
## 2478     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2479     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2480     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2481     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2482   TWISTIES MIDAGE SINGLES/COUPLES       Mainstream
## 2483   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 2484      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 2485     KETTLE           NEW FAMILIES       Mainstream
## 2486       COBS           NEW FAMILIES       Mainstream
## 2487      THINS           NEW FAMILIES       Mainstream
## 2488     KETTLE           NEW FAMILIES       Mainstream
## 2489   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 2490      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 2491   CHEEZELS  YOUNG SINGLES/COUPLES       Mainstream
## 2492     DORITO               RETIREES          Premium
## 2493       COBS               RETIREES          Premium
## 2494     SMITHS               RETIREES          Premium
## 2495    DORITOS               RETIREES          Premium
## 2496   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 2497   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 2498   PRINGLES         OLDER FAMILIES       Mainstream
## 2499  INFUZIONS         OLDER FAMILIES       Mainstream
## 2500   CHEEZELS         OLDER FAMILIES       Mainstream
## 2501    DORITOS         OLDER FAMILIES       Mainstream
## 2502  INFUZIONS MIDAGE SINGLES/COUPLES           Budget
## 2503      THINS MIDAGE SINGLES/COUPLES           Budget
## 2504   TOSTITOS MIDAGE SINGLES/COUPLES           Budget
## 2505      THINS MIDAGE SINGLES/COUPLES          Premium
## 2506   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 2507  INFUZIONS MIDAGE SINGLES/COUPLES          Premium
## 2508      GRAIN MIDAGE SINGLES/COUPLES          Premium
## 2509   TWISTIES         YOUNG FAMILIES           Budget
## 2510   TYRRELLS         YOUNG FAMILIES           Budget
## 2511   PRINGLES         YOUNG FAMILIES           Budget
## 2512    DORITOS         YOUNG FAMILIES           Budget
## 2513   TYRRELLS         YOUNG FAMILIES           Budget
## 2514      THINS         YOUNG FAMILIES           Budget
## 2515     KETTLE               RETIREES           Budget
## 2516    DORITOS               RETIREES           Budget
## 2517      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 2518   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 2519      GRAIN  OLDER SINGLES/COUPLES          Premium
## 2520    DORITOS  OLDER SINGLES/COUPLES          Premium
## 2521    DORITOS  OLDER SINGLES/COUPLES          Premium
## 2522    DORITOS  OLDER SINGLES/COUPLES          Premium
## 2523     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2524   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 2525      THINS  OLDER SINGLES/COUPLES          Premium
## 2526     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2527   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 2528     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2529     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2530       COBS  OLDER SINGLES/COUPLES          Premium
## 2531   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2532   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2533       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 2534     KETTLE           NEW FAMILIES           Budget
## 2535       COBS           NEW FAMILIES           Budget
## 2536  INFUZIONS           NEW FAMILIES           Budget
## 2537     KETTLE           NEW FAMILIES           Budget
## 2538   PRINGLES           NEW FAMILIES           Budget
## 2539     KETTLE         YOUNG FAMILIES           Budget
## 2540       COBS  OLDER SINGLES/COUPLES       Mainstream
## 2541     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 2542     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 2543      THINS  OLDER SINGLES/COUPLES       Mainstream
## 2544      GRAIN           NEW FAMILIES       Mainstream
## 2545   TOSTITOS           NEW FAMILIES       Mainstream
## 2546     KETTLE           NEW FAMILIES       Mainstream
## 2547   TWISTIES           NEW FAMILIES       Mainstream
## 2548       COBS           NEW FAMILIES       Mainstream
## 2549     KETTLE               RETIREES       Mainstream
## 2550   PRINGLES               RETIREES       Mainstream
## 2551   PRINGLES               RETIREES       Mainstream
## 2552     SMITHS               RETIREES       Mainstream
## 2553     INFZNS               RETIREES       Mainstream
## 2554     KETTLE               RETIREES       Mainstream
## 2555       COBS               RETIREES       Mainstream
## 2556     KETTLE         OLDER FAMILIES           Budget
## 2557     KETTLE         OLDER FAMILIES           Budget
## 2558     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 2559     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2560  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 2561    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2562     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2563   PRINGLES         YOUNG FAMILIES       Mainstream
## 2564     KETTLE               RETIREES           Budget
## 2565     KETTLE               RETIREES           Budget
## 2566   TWISTIES               RETIREES           Budget
## 2567       COBS               RETIREES           Budget
## 2568     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2569    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 2570     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 2571     KETTLE               RETIREES           Budget
## 2572    DORITOS               RETIREES           Budget
## 2573     KETTLE               RETIREES           Budget
## 2574   TOSTITOS               RETIREES           Budget
## 2575     KETTLE               RETIREES           Budget
## 2576     KETTLE               RETIREES           Budget
## 2577   TYRRELLS               RETIREES           Budget
## 2578       COBS               RETIREES           Budget
## 2579    DORITOS               RETIREES           Budget
## 2580     KETTLE               RETIREES           Budget
## 2581    DORITOS               RETIREES       Mainstream
## 2582     KETTLE               RETIREES       Mainstream
## 2583  INFUZIONS               RETIREES       Mainstream
## 2584     KETTLE               RETIREES       Mainstream
## 2585     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2586     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2587       COBS  OLDER SINGLES/COUPLES          Premium
## 2588   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 2589    DORITOS  OLDER SINGLES/COUPLES          Premium
## 2590   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 2591     KETTLE               RETIREES       Mainstream
## 2592   PRINGLES               RETIREES       Mainstream
## 2593  INFUZIONS               RETIREES       Mainstream
## 2594      GRAIN               RETIREES       Mainstream
## 2595  INFUZIONS               RETIREES       Mainstream
## 2596    DORITOS               RETIREES       Mainstream
## 2597    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2598   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 2599     SMITHS               RETIREES           Budget
## 2600    DORITOS               RETIREES           Budget
## 2601   TWISTIES               RETIREES           Budget
## 2602     KETTLE               RETIREES           Budget
## 2603      THINS               RETIREES           Budget
## 2604     KETTLE               RETIREES           Budget
## 2605    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 2606   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 2607   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 2608      THINS  OLDER SINGLES/COUPLES       Mainstream
## 2609     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 2610    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 2611   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 2612    DORITOS  OLDER SINGLES/COUPLES          Premium
## 2613     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2614     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2615   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 2616      THINS  OLDER SINGLES/COUPLES          Premium
## 2617   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 2618   PRINGLES           NEW FAMILIES       Mainstream
## 2619   PRINGLES           NEW FAMILIES       Mainstream
## 2620   TOSTITOS           NEW FAMILIES       Mainstream
## 2621     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2622    DORITOS         OLDER FAMILIES       Mainstream
## 2623       COBS         OLDER FAMILIES       Mainstream
## 2624    DORITOS         OLDER FAMILIES       Mainstream
## 2625     KETTLE         OLDER FAMILIES       Mainstream
## 2626   TOSTITOS         OLDER FAMILIES       Mainstream
## 2627   TYRRELLS         OLDER FAMILIES       Mainstream
## 2628    DORITOS         OLDER FAMILIES       Mainstream
## 2629     KETTLE         OLDER FAMILIES       Mainstream
## 2630   TYRRELLS         OLDER FAMILIES       Mainstream
## 2631  INFUZIONS         OLDER FAMILIES       Mainstream
## 2632      THINS         OLDER FAMILIES       Mainstream
## 2633     SMITHS  OLDER SINGLES/COUPLES          Premium
## 2634      THINS  OLDER SINGLES/COUPLES          Premium
## 2635    DORITOS         OLDER FAMILIES           Budget
## 2636      GRAIN         OLDER FAMILIES           Budget
## 2637  INFUZIONS         OLDER FAMILIES           Budget
## 2638     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 2639   TYRRELLS MIDAGE SINGLES/COUPLES          Premium
## 2640   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 2641     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 2642      THINS MIDAGE SINGLES/COUPLES          Premium
## 2643   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 2644   CHEEZELS MIDAGE SINGLES/COUPLES          Premium
## 2645    DORITOS  OLDER SINGLES/COUPLES          Premium
## 2646   CHEEZELS  OLDER SINGLES/COUPLES          Premium
## 2647      GRAIN  OLDER SINGLES/COUPLES          Premium
## 2648  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 2649     KETTLE               RETIREES           Budget
## 2650   PRINGLES               RETIREES           Budget
## 2651     KETTLE               RETIREES           Budget
## 2652     KETTLE               RETIREES           Budget
## 2653     SMITHS               RETIREES          Premium
## 2654   TWISTIES               RETIREES          Premium
## 2655     KETTLE               RETIREES          Premium
## 2656     KETTLE               RETIREES          Premium
## 2657    DORITOS         OLDER FAMILIES          Premium
## 2658    DORITOS         OLDER FAMILIES          Premium
## 2659   PRINGLES         OLDER FAMILIES          Premium
## 2660    DORITOS         OLDER FAMILIES          Premium
## 2661   TYRRELLS         OLDER FAMILIES          Premium
## 2662   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 2663   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 2664     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2665   TWISTIES MIDAGE SINGLES/COUPLES       Mainstream
## 2666     INFZNS  OLDER SINGLES/COUPLES          Premium
## 2667   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 2668     SMITHS  OLDER SINGLES/COUPLES          Premium
## 2669       COBS  OLDER SINGLES/COUPLES          Premium
## 2670   TOSTITOS           NEW FAMILIES          Premium
## 2671     KETTLE           NEW FAMILIES          Premium
## 2672  INFUZIONS           NEW FAMILIES          Premium
## 2673       COBS           NEW FAMILIES          Premium
## 2674    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 2675   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 2676    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 2677   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2678   CHEEZELS  YOUNG SINGLES/COUPLES       Mainstream
## 2679     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 2680   TWISTIES MIDAGE SINGLES/COUPLES          Premium
## 2681     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 2682   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 2683     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 2684    DORITOS         YOUNG FAMILIES           Budget
## 2685    DORITOS         YOUNG FAMILIES           Budget
## 2686   PRINGLES         YOUNG FAMILIES           Budget
## 2687     KETTLE         YOUNG FAMILIES           Budget
## 2688     KETTLE         YOUNG FAMILIES           Budget
## 2689      THINS  OLDER SINGLES/COUPLES       Mainstream
## 2690     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 2691     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 2692   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 2693     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 2694   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 2695     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2696    DORITOS  OLDER SINGLES/COUPLES           Budget
## 2697   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 2698     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2699     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2700   CHEEZELS  OLDER SINGLES/COUPLES           Budget
## 2701   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 2702     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2703   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 2704  INFUZIONS MIDAGE SINGLES/COUPLES       Mainstream
## 2705     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2706     KETTLE         YOUNG FAMILIES           Budget
## 2707  INFUZIONS         YOUNG FAMILIES           Budget
## 2708  INFUZIONS         YOUNG FAMILIES           Budget
## 2709     INFZNS         YOUNG FAMILIES           Budget
## 2710   TWISTIES         YOUNG FAMILIES           Budget
## 2711     SMITHS         YOUNG FAMILIES           Budget
## 2712      THINS         YOUNG FAMILIES           Budget
## 2713       COBS               RETIREES          Premium
## 2714     DORITO               RETIREES          Premium
## 2715  INFUZIONS               RETIREES          Premium
## 2716    DORITOS         OLDER FAMILIES       Mainstream
## 2717  INFUZIONS         OLDER FAMILIES       Mainstream
## 2718   PRINGLES         OLDER FAMILIES       Mainstream
## 2719   PRINGLES         OLDER FAMILIES       Mainstream
## 2720     KETTLE               RETIREES          Premium
## 2721       COBS               RETIREES          Premium
## 2722   PRINGLES               RETIREES          Premium
## 2723     KETTLE               RETIREES          Premium
## 2724   PRINGLES               RETIREES          Premium
## 2725     KETTLE               RETIREES          Premium
## 2726    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 2727     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2728     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2729   TWISTIES               RETIREES       Mainstream
## 2730    DORITOS               RETIREES       Mainstream
## 2731       COBS               RETIREES       Mainstream
## 2732     INFZNS               RETIREES       Mainstream
## 2733     SMITHS               RETIREES       Mainstream
## 2734       COBS         YOUNG FAMILIES       Mainstream
## 2735     SMITHS         YOUNG FAMILIES       Mainstream
## 2736      THINS         YOUNG FAMILIES       Mainstream
## 2737    DORITOS         YOUNG FAMILIES       Mainstream
## 2738   TWISTIES         YOUNG FAMILIES       Mainstream
## 2739     DORITO         YOUNG FAMILIES       Mainstream
## 2740   PRINGLES         YOUNG FAMILIES       Mainstream
## 2741       COBS MIDAGE SINGLES/COUPLES           Budget
## 2742     SMITHS MIDAGE SINGLES/COUPLES           Budget
## 2743  INFUZIONS MIDAGE SINGLES/COUPLES           Budget
## 2744     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 2745     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 2746   PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 2747   PRINGLES               RETIREES          Premium
## 2748      GRAIN               RETIREES          Premium
## 2749   PRINGLES               RETIREES          Premium
## 2750    DORITOS               RETIREES          Premium
## 2751   CHEEZELS               RETIREES          Premium
## 2752   PRINGLES               RETIREES          Premium
## 2753     DORITO MIDAGE SINGLES/COUPLES           Budget
## 2754    DORITOS MIDAGE SINGLES/COUPLES           Budget
## 2755     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 2756   TYRRELLS MIDAGE SINGLES/COUPLES           Budget
## 2757    DORITOS         YOUNG FAMILIES       Mainstream
## 2758     SMITHS         YOUNG FAMILIES       Mainstream
## 2759   PRINGLES         YOUNG FAMILIES       Mainstream
## 2760    DORITOS         YOUNG FAMILIES       Mainstream
## 2761   TWISTIES         YOUNG FAMILIES       Mainstream
## 2762     KETTLE         YOUNG FAMILIES       Mainstream
## 2763     KETTLE         YOUNG FAMILIES       Mainstream
## 2764   TOSTITOS         YOUNG FAMILIES       Mainstream
## 2765     KETTLE         YOUNG FAMILIES       Mainstream
## 2766   TOSTITOS               RETIREES       Mainstream
## 2767     INFZNS               RETIREES       Mainstream
## 2768     SMITHS               RETIREES       Mainstream
## 2769  INFUZIONS               RETIREES       Mainstream
## 2770     KETTLE               RETIREES       Mainstream
## 2771     KETTLE               RETIREES       Mainstream
## 2772       COBS               RETIREES       Mainstream
## 2773     KETTLE               RETIREES       Mainstream
## 2774   PRINGLES               RETIREES       Mainstream
## 2775     SMITHS               RETIREES          Premium
## 2776     KETTLE               RETIREES          Premium
## 2777   PRINGLES               RETIREES          Premium
## 2778   PRINGLES               RETIREES          Premium
## 2779      GRAIN               RETIREES          Premium
## 2780   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 2781   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 2782    DORITOS  OLDER SINGLES/COUPLES           Budget
## 2783      THINS               RETIREES           Budget
## 2784       COBS               RETIREES           Budget
## 2785       COBS               RETIREES           Budget
## 2786     KETTLE               RETIREES           Budget
## 2787     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2788   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 2789     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2790   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2791       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 2792   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 2793   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2794   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2795     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2796    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2797   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 2798     KETTLE           NEW FAMILIES       Mainstream
## 2799       COBS           NEW FAMILIES       Mainstream
## 2800   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 2801      THINS  OLDER SINGLES/COUPLES           Budget
## 2802     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2803     DORITO  OLDER SINGLES/COUPLES           Budget
## 2804     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2805    DORITOS  OLDER SINGLES/COUPLES           Budget
## 2806     KETTLE         OLDER FAMILIES           Budget
## 2807   TWISTIES         OLDER FAMILIES           Budget
## 2808     KETTLE         OLDER FAMILIES           Budget
## 2809     INFZNS         OLDER FAMILIES           Budget
## 2810       COBS         OLDER FAMILIES       Mainstream
## 2811     KETTLE         OLDER FAMILIES       Mainstream
## 2812   TWISTIES         OLDER FAMILIES       Mainstream
## 2813   PRINGLES         OLDER FAMILIES       Mainstream
## 2814   TOSTITOS         OLDER FAMILIES       Mainstream
## 2815   PRINGLES         OLDER FAMILIES       Mainstream
## 2816       COBS         OLDER FAMILIES       Mainstream
## 2817   PRINGLES         OLDER FAMILIES       Mainstream
## 2818     SMITHS         OLDER FAMILIES       Mainstream
## 2819     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2820     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2821      GRAIN  OLDER SINGLES/COUPLES          Premium
## 2822     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2823    DORITOS  OLDER SINGLES/COUPLES          Premium
## 2824   CHEEZELS  OLDER SINGLES/COUPLES          Premium
## 2825       COBS  OLDER SINGLES/COUPLES          Premium
## 2826     SMITHS  OLDER SINGLES/COUPLES          Premium
## 2827     KETTLE         YOUNG FAMILIES           Budget
## 2828     KETTLE         YOUNG FAMILIES           Budget
## 2829   PRINGLES         YOUNG FAMILIES           Budget
## 2830      THINS         YOUNG FAMILIES           Budget
## 2831     KETTLE         YOUNG FAMILIES           Budget
## 2832     KETTLE         YOUNG FAMILIES           Budget
## 2833   PRINGLES         YOUNG FAMILIES           Budget
## 2834   TWISTIES         YOUNG FAMILIES           Budget
## 2835    DORITOS         YOUNG FAMILIES           Budget
## 2836   CHEEZELS         YOUNG FAMILIES           Budget
## 2837  INFUZIONS         YOUNG FAMILIES           Budget
## 2838     KETTLE         YOUNG FAMILIES           Budget
## 2839   CHEEZELS  OLDER SINGLES/COUPLES          Premium
## 2840  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 2841      THINS  OLDER SINGLES/COUPLES           Budget
## 2842     SMITHS  OLDER SINGLES/COUPLES           Budget
## 2843     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2844  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 2845       COBS  OLDER SINGLES/COUPLES           Budget
## 2846  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 2847     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2848     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2849     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2850   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 2851      THINS  OLDER SINGLES/COUPLES           Budget
## 2852     INFZNS               RETIREES           Budget
## 2853   TWISTIES               RETIREES           Budget
## 2854     KETTLE               RETIREES           Budget
## 2855   TOSTITOS               RETIREES           Budget
## 2856   TWISTIES         OLDER FAMILIES           Budget
## 2857   CHEEZELS         OLDER FAMILIES           Budget
## 2858     DORITO         OLDER FAMILIES           Budget
## 2859     KETTLE         OLDER FAMILIES           Budget
## 2860    DORITOS         OLDER FAMILIES           Budget
## 2861   PRINGLES         OLDER FAMILIES           Budget
## 2862    DORITOS         OLDER FAMILIES           Budget
## 2863      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 2864     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2865     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2866     KETTLE               RETIREES           Budget
## 2867   PRINGLES               RETIREES           Budget
## 2868   PRINGLES               RETIREES           Budget
## 2869   TWISTIES               RETIREES           Budget
## 2870      THINS               RETIREES           Budget
## 2871     INFZNS               RETIREES           Budget
## 2872      THINS  OLDER SINGLES/COUPLES          Premium
## 2873   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 2874   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 2875   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 2876  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 2877   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 2878   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 2879      THINS  OLDER SINGLES/COUPLES           Budget
## 2880    DORITOS  OLDER SINGLES/COUPLES           Budget
## 2881   PRINGLES               RETIREES       Mainstream
## 2882       COBS               RETIREES       Mainstream
## 2883     KETTLE         YOUNG FAMILIES           Budget
## 2884   TWISTIES         YOUNG FAMILIES           Budget
## 2885  INFUZIONS         YOUNG FAMILIES           Budget
## 2886     KETTLE         YOUNG FAMILIES           Budget
## 2887   PRINGLES         YOUNG FAMILIES           Budget
## 2888   PRINGLES         YOUNG FAMILIES           Budget
## 2889   TWISTIES               RETIREES          Premium
## 2890      GRAIN               RETIREES          Premium
## 2891     KETTLE               RETIREES          Premium
## 2892      THINS               RETIREES          Premium
## 2893  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 2894      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 2895   TWISTIES MIDAGE SINGLES/COUPLES           Budget
## 2896      THINS MIDAGE SINGLES/COUPLES           Budget
## 2897      THINS MIDAGE SINGLES/COUPLES           Budget
## 2898      THINS MIDAGE SINGLES/COUPLES           Budget
## 2899     KETTLE               RETIREES       Mainstream
## 2900     INFZNS           NEW FAMILIES       Mainstream
## 2901     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 2902    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 2903   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 2904       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 2905     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 2906   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 2907      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 2908     INFZNS  YOUNG SINGLES/COUPLES       Mainstream
## 2909     DORITO MIDAGE SINGLES/COUPLES       Mainstream
## 2910     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2911     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2912     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2913     INFZNS  OLDER SINGLES/COUPLES          Premium
## 2914     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2915   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 2916    DORITOS  OLDER SINGLES/COUPLES          Premium
## 2917  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 2918   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 2919      THINS  OLDER SINGLES/COUPLES          Premium
## 2920      THINS  OLDER SINGLES/COUPLES          Premium
## 2921     KETTLE  OLDER SINGLES/COUPLES          Premium
## 2922   PRINGLES           NEW FAMILIES          Premium
## 2923     KETTLE           NEW FAMILIES          Premium
## 2924     DORITO           NEW FAMILIES          Premium
## 2925   TOSTITOS           NEW FAMILIES          Premium
## 2926      GRAIN           NEW FAMILIES          Premium
## 2927      THINS               RETIREES       Mainstream
## 2928   PRINGLES               RETIREES       Mainstream
## 2929     DORITO               RETIREES       Mainstream
## 2930       COBS               RETIREES       Mainstream
## 2931   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 2932   TYRRELLS  YOUNG SINGLES/COUPLES          Premium
## 2933   TOSTITOS  YOUNG SINGLES/COUPLES          Premium
## 2934   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 2935     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 2936   TWISTIES  YOUNG SINGLES/COUPLES          Premium
## 2937   TWISTIES               RETIREES       Mainstream
## 2938     KETTLE               RETIREES       Mainstream
## 2939     KETTLE               RETIREES       Mainstream
## 2940    DORITOS               RETIREES       Mainstream
## 2941     KETTLE               RETIREES       Mainstream
## 2942   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 2943   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 2944     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 2945     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 2946     DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 2947   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 2948     KETTLE               RETIREES       Mainstream
## 2949   PRINGLES               RETIREES       Mainstream
## 2950     KETTLE               RETIREES       Mainstream
## 2951    DORITOS               RETIREES       Mainstream
## 2952      THINS               RETIREES       Mainstream
## 2953    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 2954      GRAIN MIDAGE SINGLES/COUPLES       Mainstream
## 2955    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 2956   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 2957     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2958     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2959   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 2960      THINS  OLDER SINGLES/COUPLES           Budget
## 2961   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 2962    DORITOS  OLDER SINGLES/COUPLES           Budget
## 2963     KETTLE  OLDER SINGLES/COUPLES           Budget
## 2964     KETTLE         OLDER FAMILIES           Budget
## 2965   TYRRELLS         OLDER FAMILIES           Budget
## 2966   PRINGLES         OLDER FAMILIES           Budget
## 2967   TOSTITOS         OLDER FAMILIES           Budget
## 2968    DORITOS         OLDER FAMILIES           Budget
## 2969   PRINGLES         OLDER FAMILIES           Budget
## 2970   TYRRELLS         OLDER FAMILIES           Budget
## 2971   PRINGLES         OLDER FAMILIES           Budget
## 2972     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2973   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 2974      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 2975      GRAIN MIDAGE SINGLES/COUPLES       Mainstream
## 2976     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2977   TWISTIES         OLDER FAMILIES       Mainstream
## 2978     DORITO         OLDER FAMILIES       Mainstream
## 2979     KETTLE         OLDER FAMILIES       Mainstream
## 2980   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 2981   TWISTIES MIDAGE SINGLES/COUPLES       Mainstream
## 2982    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 2983     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 2984     KETTLE               RETIREES          Premium
## 2985     KETTLE               RETIREES          Premium
## 2986   PRINGLES               RETIREES          Premium
## 2987     KETTLE               RETIREES          Premium
## 2988     SMITHS               RETIREES          Premium
## 2989     KETTLE               RETIREES          Premium
## 2990   TWISTIES         YOUNG FAMILIES       Mainstream
## 2991      GRAIN         YOUNG FAMILIES       Mainstream
## 2992     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 2993    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 2994      THINS  OLDER SINGLES/COUPLES       Mainstream
## 2995      THINS  OLDER SINGLES/COUPLES       Mainstream
## 2996     KETTLE           NEW FAMILIES       Mainstream
## 2997     KETTLE           NEW FAMILIES       Mainstream
## 2998  INFUZIONS           NEW FAMILIES       Mainstream
## 2999     KETTLE           NEW FAMILIES       Mainstream
## 3000    DORITOS           NEW FAMILIES       Mainstream
## 3001     INFZNS  OLDER SINGLES/COUPLES          Premium
## 3002    DORITOS  OLDER SINGLES/COUPLES          Premium
## 3003     SMITHS  OLDER SINGLES/COUPLES          Premium
## 3004       COBS  OLDER SINGLES/COUPLES          Premium
## 3005     KETTLE         OLDER FAMILIES          Premium
## 3006  INFUZIONS         OLDER FAMILIES          Premium
## 3007    DORITOS         OLDER FAMILIES          Premium
## 3008     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 3009     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3010     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 3011    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 3012     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3013   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3014   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3015      THINS               RETIREES          Premium
## 3016   PRINGLES               RETIREES          Premium
## 3017      THINS         YOUNG FAMILIES       Mainstream
## 3018   TWISTIES         YOUNG FAMILIES       Mainstream
## 3019     KETTLE         YOUNG FAMILIES       Mainstream
## 3020    DORITOS  OLDER SINGLES/COUPLES          Premium
## 3021   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 3022      THINS  OLDER SINGLES/COUPLES          Premium
## 3023   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 3024    DORITOS  OLDER SINGLES/COUPLES          Premium
## 3025     DORITO               RETIREES           Budget
## 3026     KETTLE               RETIREES           Budget
## 3027    DORITOS               RETIREES           Budget
## 3028   PRINGLES               RETIREES           Budget
## 3029   PRINGLES               RETIREES           Budget
## 3030     KETTLE               RETIREES       Mainstream
## 3031    DORITOS               RETIREES       Mainstream
## 3032     KETTLE               RETIREES       Mainstream
## 3033  INFUZIONS MIDAGE SINGLES/COUPLES          Premium
## 3034    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 3035  INFUZIONS MIDAGE SINGLES/COUPLES          Premium
## 3036      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 3037     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3038   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 3039     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3040   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 3041     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3042     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3043     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3044     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 3045     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3046      THINS               RETIREES          Premium
## 3047     KETTLE               RETIREES          Premium
## 3048   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 3049     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3050    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 3051     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3052   CHEEZELS  OLDER SINGLES/COUPLES       Mainstream
## 3053      THINS  OLDER SINGLES/COUPLES       Mainstream
## 3054    DORITOS         OLDER FAMILIES       Mainstream
## 3055     SMITHS               RETIREES          Premium
## 3056       COBS               RETIREES          Premium
## 3057     KETTLE               RETIREES          Premium
## 3058    DORITOS               RETIREES          Premium
## 3059       COBS               RETIREES          Premium
## 3060      THINS               RETIREES          Premium
## 3061     DORITO  OLDER SINGLES/COUPLES       Mainstream
## 3062     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 3063      THINS  OLDER SINGLES/COUPLES       Mainstream
## 3064     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3065     KETTLE         OLDER FAMILIES           Budget
## 3066     KETTLE         OLDER FAMILIES           Budget
## 3067     KETTLE               RETIREES           Budget
## 3068       COBS               RETIREES           Budget
## 3069  INFUZIONS               RETIREES           Budget
## 3070     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3071      THINS  OLDER SINGLES/COUPLES           Budget
## 3072  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 3073      THINS  OLDER SINGLES/COUPLES           Budget
## 3074   TYRRELLS  OLDER SINGLES/COUPLES           Budget
## 3075      THINS  OLDER SINGLES/COUPLES           Budget
## 3076     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3077    DORITOS  OLDER SINGLES/COUPLES           Budget
## 3078     SMITHS MIDAGE SINGLES/COUPLES           Budget
## 3079  INFUZIONS MIDAGE SINGLES/COUPLES           Budget
## 3080     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 3081   TYRRELLS MIDAGE SINGLES/COUPLES           Budget
## 3082     SMITHS  OLDER SINGLES/COUPLES          Premium
## 3083    DORITOS  OLDER SINGLES/COUPLES          Premium
## 3084     KETTLE  OLDER SINGLES/COUPLES          Premium
## 3085  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 3086    DORITOS  OLDER SINGLES/COUPLES          Premium
## 3087   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 3088   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 3089   TYRRELLS  OLDER SINGLES/COUPLES           Budget
## 3090    DORITOS  OLDER SINGLES/COUPLES           Budget
## 3091   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 3092   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 3093   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 3094     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 3095   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 3096  INFUZIONS               RETIREES       Mainstream
## 3097     KETTLE               RETIREES       Mainstream
## 3098      THINS               RETIREES       Mainstream
## 3099    DORITOS               RETIREES       Mainstream
## 3100     KETTLE               RETIREES       Mainstream
## 3101     KETTLE               RETIREES       Mainstream
## 3102     KETTLE         OLDER FAMILIES          Premium
## 3103    DORITOS           NEW FAMILIES       Mainstream
## 3104    DORITOS           NEW FAMILIES       Mainstream
## 3105     KETTLE           NEW FAMILIES       Mainstream
## 3106   PRINGLES           NEW FAMILIES       Mainstream
## 3107       COBS           NEW FAMILIES       Mainstream
## 3108   PRINGLES           NEW FAMILIES       Mainstream
## 3109    DORITOS         OLDER FAMILIES          Premium
## 3110      THINS         OLDER FAMILIES          Premium
## 3111     KETTLE         OLDER FAMILIES          Premium
## 3112     SMITHS         YOUNG FAMILIES           Budget
## 3113    DORITOS         YOUNG FAMILIES           Budget
## 3114   TWISTIES         YOUNG FAMILIES           Budget
## 3115    DORITOS         YOUNG FAMILIES           Budget
## 3116    DORITOS         YOUNG FAMILIES           Budget
## 3117   PRINGLES         YOUNG FAMILIES           Budget
## 3118   CHEEZELS         YOUNG FAMILIES           Budget
## 3119   PRINGLES               RETIREES       Mainstream
## 3120   PRINGLES               RETIREES       Mainstream
## 3121       COBS               RETIREES       Mainstream
## 3122    DORITOS               RETIREES       Mainstream
## 3123     KETTLE               RETIREES       Mainstream
## 3124   PRINGLES               RETIREES       Mainstream
## 3125   CHEEZELS               RETIREES       Mainstream
## 3126     DORITO  YOUNG SINGLES/COUPLES           Budget
## 3127   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 3128   PRINGLES         YOUNG FAMILIES           Budget
## 3129  INFUZIONS         YOUNG FAMILIES           Budget
## 3130     KETTLE         YOUNG FAMILIES           Budget
## 3131     SMITHS         YOUNG FAMILIES           Budget
## 3132   TWISTIES         YOUNG FAMILIES           Budget
## 3133     KETTLE         YOUNG FAMILIES           Budget
## 3134      GRAIN MIDAGE SINGLES/COUPLES          Premium
## 3135     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 3136  INFUZIONS MIDAGE SINGLES/COUPLES          Premium
## 3137     SMITHS         YOUNG FAMILIES           Budget
## 3138     KETTLE         YOUNG FAMILIES           Budget
## 3139     KETTLE         OLDER FAMILIES           Budget
## 3140    DORITOS         OLDER FAMILIES           Budget
## 3141   TWISTIES         OLDER FAMILIES           Budget
## 3142    DORITOS         OLDER FAMILIES           Budget
## 3143     KETTLE         OLDER FAMILIES           Budget
## 3144    DORITOS         OLDER FAMILIES           Budget
## 3145     KETTLE         YOUNG FAMILIES       Mainstream
## 3146   TOSTITOS         YOUNG FAMILIES       Mainstream
## 3147       COBS         YOUNG FAMILIES       Mainstream
## 3148       COBS         YOUNG FAMILIES       Mainstream
## 3149     KETTLE         YOUNG FAMILIES       Mainstream
## 3150     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3151     KETTLE           NEW FAMILIES          Premium
## 3152     KETTLE           NEW FAMILIES          Premium
## 3153     SMITHS           NEW FAMILIES          Premium
## 3154   TOSTITOS           NEW FAMILIES          Premium
## 3155     KETTLE           NEW FAMILIES          Premium
## 3156   TWISTIES         OLDER FAMILIES           Budget
## 3157   TWISTIES         OLDER FAMILIES           Budget
## 3158    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 3159    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 3160    DORITOS         OLDER FAMILIES          Premium
## 3161   TYRRELLS         OLDER FAMILIES          Premium
## 3162  INFUZIONS         OLDER FAMILIES          Premium
## 3163    DORITOS         OLDER FAMILIES          Premium
## 3164       COBS         OLDER FAMILIES          Premium
## 3165     KETTLE         OLDER FAMILIES          Premium
## 3166      THINS         OLDER FAMILIES          Premium
## 3167     DORITO MIDAGE SINGLES/COUPLES          Premium
## 3168     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 3169     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 3170     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 3171      THINS MIDAGE SINGLES/COUPLES          Premium
## 3172     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 3173       COBS MIDAGE SINGLES/COUPLES          Premium
## 3174    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 3175     KETTLE               RETIREES           Budget
## 3176      THINS               RETIREES           Budget
## 3177   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 3178   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 3179     DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 3180  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 3181   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 3182   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 3183   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3184     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3185       COBS  OLDER SINGLES/COUPLES       Mainstream
## 3186   PRINGLES         YOUNG FAMILIES           Budget
## 3187    DORITOS         YOUNG FAMILIES           Budget
## 3188     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 3189   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 3190   TWISTIES               RETIREES       Mainstream
## 3191    DORITOS               RETIREES       Mainstream
## 3192     KETTLE               RETIREES       Mainstream
## 3193     KETTLE               RETIREES       Mainstream
## 3194   PRINGLES         OLDER FAMILIES       Mainstream
## 3195   PRINGLES         OLDER FAMILIES       Mainstream
## 3196   PRINGLES         OLDER FAMILIES       Mainstream
## 3197    DORITOS         OLDER FAMILIES       Mainstream
## 3198       COBS         OLDER FAMILIES       Mainstream
## 3199     KETTLE         OLDER FAMILIES       Mainstream
## 3200    DORITOS         OLDER FAMILIES       Mainstream
## 3201    DORITOS         OLDER FAMILIES       Mainstream
## 3202     INFZNS         OLDER FAMILIES           Budget
## 3203   TWISTIES         OLDER FAMILIES           Budget
## 3204      GRAIN         OLDER FAMILIES           Budget
## 3205     KETTLE         OLDER FAMILIES           Budget
## 3206     KETTLE               RETIREES          Premium
## 3207      GRAIN               RETIREES          Premium
## 3208      THINS               RETIREES          Premium
## 3209    DORITOS               RETIREES          Premium
## 3210  INFUZIONS               RETIREES          Premium
## 3211    DORITOS               RETIREES          Premium
## 3212      THINS               RETIREES          Premium
## 3213   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 3214     DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 3215     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3216   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 3217   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 3218     SMITHS         YOUNG FAMILIES           Budget
## 3219    DORITOS         YOUNG FAMILIES           Budget
## 3220   TOSTITOS         YOUNG FAMILIES           Budget
## 3221     KETTLE         YOUNG FAMILIES           Budget
## 3222      GRAIN         YOUNG FAMILIES           Budget
## 3223   TYRRELLS               RETIREES       Mainstream
## 3224     KETTLE               RETIREES       Mainstream
## 3225    DORITOS               RETIREES       Mainstream
## 3226   PRINGLES               RETIREES          Premium
## 3227    DORITOS               RETIREES          Premium
## 3228   TOSTITOS               RETIREES          Premium
## 3229    DORITOS               RETIREES          Premium
## 3230     KETTLE               RETIREES          Premium
## 3231     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 3232    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 3233    DORITOS  OLDER SINGLES/COUPLES           Budget
## 3234   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 3235       COBS  OLDER SINGLES/COUPLES           Budget
## 3236   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 3237     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 3238   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 3239    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 3240    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 3241  INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 3242       COBS  YOUNG SINGLES/COUPLES           Budget
## 3243   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 3244     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 3245     KETTLE               RETIREES           Budget
## 3246   TWISTIES               RETIREES           Budget
## 3247      THINS               RETIREES           Budget
## 3248     KETTLE               RETIREES           Budget
## 3249   CHEEZELS  OLDER SINGLES/COUPLES       Mainstream
## 3250   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 3251       COBS  OLDER SINGLES/COUPLES       Mainstream
## 3252     INFZNS  OLDER SINGLES/COUPLES       Mainstream
## 3253     INFZNS  OLDER SINGLES/COUPLES       Mainstream
## 3254  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 3255       COBS  OLDER SINGLES/COUPLES       Mainstream
## 3256      THINS  OLDER SINGLES/COUPLES       Mainstream
## 3257      THINS  OLDER SINGLES/COUPLES       Mainstream
## 3258     SMITHS               RETIREES       Mainstream
## 3259    DORITOS               RETIREES       Mainstream
## 3260       COBS               RETIREES       Mainstream
## 3261   TYRRELLS               RETIREES       Mainstream
## 3262   PRINGLES         YOUNG FAMILIES       Mainstream
## 3263    DORITOS         YOUNG FAMILIES       Mainstream
## 3264    DORITOS         YOUNG FAMILIES       Mainstream
## 3265      THINS               RETIREES          Premium
## 3266     SMITHS               RETIREES          Premium
## 3267    DORITOS               RETIREES          Premium
## 3268      GRAIN MIDAGE SINGLES/COUPLES           Budget
## 3269    DORITOS MIDAGE SINGLES/COUPLES           Budget
## 3270     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 3271      THINS MIDAGE SINGLES/COUPLES           Budget
## 3272     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3273     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3274   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 3275    DORITOS  OLDER SINGLES/COUPLES           Budget
## 3276     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3277     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3278     SMITHS  OLDER SINGLES/COUPLES           Budget
## 3279     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3280    DORITOS               RETIREES       Mainstream
## 3281   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 3282     KETTLE  OLDER SINGLES/COUPLES          Premium
## 3283   CHEEZELS  OLDER SINGLES/COUPLES          Premium
## 3284   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 3285     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3286   CHEEZELS  OLDER SINGLES/COUPLES       Mainstream
## 3287   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 3288   CHEEZELS  OLDER SINGLES/COUPLES       Mainstream
## 3289     KETTLE               RETIREES           Budget
## 3290       COBS               RETIREES           Budget
## 3291     KETTLE               RETIREES           Budget
## 3292      THINS               RETIREES           Budget
## 3293    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 3294     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 3295     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 3296   TWISTIES MIDAGE SINGLES/COUPLES          Premium
## 3297     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3298     INFZNS  OLDER SINGLES/COUPLES           Budget
## 3299   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 3300    DORITOS  OLDER SINGLES/COUPLES           Budget
## 3301  INFUZIONS         YOUNG FAMILIES           Budget
## 3302     DORITO         YOUNG FAMILIES           Budget
## 3303       COBS  OLDER SINGLES/COUPLES           Budget
## 3304   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 3305      GRAIN  OLDER SINGLES/COUPLES           Budget
## 3306   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 3307   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3308   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 3309    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 3310     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3311  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 3312    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 3313    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 3314  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 3315   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 3316     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3317       COBS  OLDER SINGLES/COUPLES       Mainstream
## 3318     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 3319   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 3320   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3321    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 3322     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3323   CHEEZELS  OLDER SINGLES/COUPLES       Mainstream
## 3324     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3325   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 3326     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3327   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 3328     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3329   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 3330     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3331    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 3332     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 3333      THINS           NEW FAMILIES           Budget
## 3334     KETTLE           NEW FAMILIES           Budget
## 3335     KETTLE           NEW FAMILIES           Budget
## 3336   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3337   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 3338     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 3339       COBS  OLDER SINGLES/COUPLES       Mainstream
## 3340     KETTLE         OLDER FAMILIES       Mainstream
## 3341    DORITOS               RETIREES       Mainstream
## 3342      THINS               RETIREES       Mainstream
## 3343   PRINGLES               RETIREES       Mainstream
## 3344       COBS               RETIREES       Mainstream
## 3345    DORITOS         YOUNG FAMILIES           Budget
## 3346  INFUZIONS         YOUNG FAMILIES           Budget
## 3347   TOSTITOS         YOUNG FAMILIES           Budget
## 3348      GRAIN         YOUNG FAMILIES           Budget
## 3349   TOSTITOS               RETIREES          Premium
## 3350     KETTLE               RETIREES          Premium
## 3351   TOSTITOS               RETIREES          Premium
## 3352     KETTLE               RETIREES          Premium
## 3353   TOSTITOS               RETIREES          Premium
## 3354   TOSTITOS               RETIREES           Budget
## 3355  INFUZIONS               RETIREES           Budget
## 3356   PRINGLES               RETIREES           Budget
## 3357    DORITOS               RETIREES           Budget
## 3358   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 3359       COBS  OLDER SINGLES/COUPLES       Mainstream
## 3360   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3361      THINS  OLDER SINGLES/COUPLES       Mainstream
## 3362   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3363    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 3364     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3365     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3366   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 3367   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 3368    DORITOS  OLDER SINGLES/COUPLES           Budget
## 3369     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3370    DORITOS  OLDER SINGLES/COUPLES           Budget
## 3371      GRAIN  OLDER SINGLES/COUPLES           Budget
## 3372     DORITO               RETIREES       Mainstream
## 3373   PRINGLES               RETIREES       Mainstream
## 3374    DORITOS               RETIREES       Mainstream
## 3375       COBS               RETIREES       Mainstream
## 3376     SMITHS               RETIREES       Mainstream
## 3377    DORITOS               RETIREES       Mainstream
## 3378     SMITHS         OLDER FAMILIES       Mainstream
## 3379       COBS         OLDER FAMILIES       Mainstream
## 3380   PRINGLES         OLDER FAMILIES       Mainstream
## 3381     KETTLE         OLDER FAMILIES       Mainstream
## 3382   PRINGLES         OLDER FAMILIES       Mainstream
## 3383     KETTLE         YOUNG FAMILIES           Budget
## 3384     KETTLE           NEW FAMILIES          Premium
## 3385       COBS           NEW FAMILIES          Premium
## 3386    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 3387   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 3388       COBS MIDAGE SINGLES/COUPLES       Mainstream
## 3389   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 3390    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 3391    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 3392     INFZNS  OLDER SINGLES/COUPLES       Mainstream
## 3393      THINS  OLDER SINGLES/COUPLES       Mainstream
## 3394      THINS  OLDER SINGLES/COUPLES       Mainstream
## 3395   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 3396     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3397     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3398     KETTLE               RETIREES       Mainstream
## 3399     KETTLE               RETIREES       Mainstream
## 3400   PRINGLES               RETIREES       Mainstream
## 3401    DORITOS               RETIREES           Budget
## 3402    DORITOS               RETIREES           Budget
## 3403   TYRRELLS               RETIREES           Budget
## 3404   TWISTIES               RETIREES           Budget
## 3405      THINS               RETIREES           Budget
## 3406   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 3407   TOSTITOS MIDAGE SINGLES/COUPLES          Premium
## 3408    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 3409       COBS  OLDER SINGLES/COUPLES       Mainstream
## 3410   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3411   CHEEZELS  OLDER SINGLES/COUPLES       Mainstream
## 3412     INFZNS               RETIREES       Mainstream
## 3413     KETTLE               RETIREES       Mainstream
## 3414     SMITHS               RETIREES       Mainstream
## 3415   TWISTIES               RETIREES       Mainstream
## 3416   TOSTITOS               RETIREES       Mainstream
## 3417     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 3418     DORITO MIDAGE SINGLES/COUPLES          Premium
## 3419     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 3420     KETTLE         OLDER FAMILIES       Mainstream
## 3421   TYRRELLS         OLDER FAMILIES       Mainstream
## 3422     SMITHS         OLDER FAMILIES       Mainstream
## 3423   PRINGLES         OLDER FAMILIES       Mainstream
## 3424       COBS         OLDER FAMILIES       Mainstream
## 3425     KETTLE         OLDER FAMILIES       Mainstream
## 3426     KETTLE         OLDER FAMILIES       Mainstream
## 3427       COBS         OLDER FAMILIES       Mainstream
## 3428       COBS         OLDER FAMILIES       Mainstream
## 3429     KETTLE         OLDER FAMILIES       Mainstream
## 3430   PRINGLES         OLDER FAMILIES       Mainstream
## 3431    DORITOS         OLDER FAMILIES       Mainstream
## 3432   TWISTIES         OLDER FAMILIES          Premium
## 3433   PRINGLES         OLDER FAMILIES          Premium
## 3434    DORITOS         OLDER FAMILIES          Premium
## 3435      GRAIN  OLDER SINGLES/COUPLES          Premium
## 3436   TYRRELLS  OLDER SINGLES/COUPLES          Premium
## 3437   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 3438   TOSTITOS         OLDER FAMILIES           Budget
## 3439    DORITOS         OLDER FAMILIES           Budget
## 3440   PRINGLES         OLDER FAMILIES           Budget
## 3441  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 3442   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 3443      THINS  OLDER SINGLES/COUPLES           Budget
## 3444      GRAIN         OLDER FAMILIES       Mainstream
## 3445   PRINGLES         OLDER FAMILIES       Mainstream
## 3446   TYRRELLS         OLDER FAMILIES       Mainstream
## 3447   TYRRELLS         OLDER FAMILIES       Mainstream
## 3448       COBS         OLDER FAMILIES       Mainstream
## 3449      THINS         OLDER FAMILIES       Mainstream
## 3450     KETTLE         OLDER FAMILIES       Mainstream
## 3451      GRAIN               RETIREES       Mainstream
## 3452   PRINGLES               RETIREES       Mainstream
## 3453      THINS               RETIREES       Mainstream
## 3454      GRAIN               RETIREES       Mainstream
## 3455     KETTLE         YOUNG FAMILIES          Premium
## 3456     KETTLE         YOUNG FAMILIES          Premium
## 3457   TYRRELLS         YOUNG FAMILIES          Premium
## 3458     KETTLE         YOUNG FAMILIES          Premium
## 3459     KETTLE         YOUNG FAMILIES          Premium
## 3460     KETTLE         YOUNG FAMILIES          Premium
## 3461       COBS         YOUNG FAMILIES          Premium
## 3462     KETTLE         YOUNG FAMILIES          Premium
## 3463    DORITOS           NEW FAMILIES          Premium
## 3464     KETTLE           NEW FAMILIES          Premium
## 3465     KETTLE           NEW FAMILIES           Budget
## 3466   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 3467   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 3468    DORITOS  OLDER SINGLES/COUPLES          Premium
## 3469     SMITHS  OLDER SINGLES/COUPLES          Premium
## 3470   TWISTIES         OLDER FAMILIES           Budget
## 3471    DORITOS         OLDER FAMILIES           Budget
## 3472    DORITOS         OLDER FAMILIES           Budget
## 3473       COBS         OLDER FAMILIES           Budget
## 3474     KETTLE         OLDER FAMILIES           Budget
## 3475     SMITHS         YOUNG FAMILIES           Budget
## 3476    DORITOS         YOUNG FAMILIES           Budget
## 3477   TWISTIES         YOUNG FAMILIES           Budget
## 3478     KETTLE         YOUNG FAMILIES           Budget
## 3479   PRINGLES         YOUNG FAMILIES           Budget
## 3480       COBS         YOUNG FAMILIES           Budget
## 3481  INFUZIONS         YOUNG FAMILIES           Budget
## 3482     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3483    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 3484    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 3485     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 3486      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 3487     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 3488     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 3489   CHEEZELS MIDAGE SINGLES/COUPLES          Premium
## 3490    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 3491    DORITOS         OLDER FAMILIES           Budget
## 3492      THINS         OLDER FAMILIES           Budget
## 3493   PRINGLES               RETIREES       Mainstream
## 3494     SMITHS               RETIREES           Budget
## 3495   PRINGLES               RETIREES           Budget
## 3496   TWISTIES               RETIREES           Budget
## 3497   PRINGLES               RETIREES           Budget
## 3498     KETTLE               RETIREES           Budget
## 3499     KETTLE               RETIREES           Budget
## 3500   PRINGLES               RETIREES           Budget
## 3501   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 3502   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 3503     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3504   PRINGLES               RETIREES           Budget
## 3505     KETTLE               RETIREES           Budget
## 3506   TYRRELLS               RETIREES           Budget
## 3507     SMITHS               RETIREES           Budget
## 3508       COBS               RETIREES           Budget
## 3509   PRINGLES               RETIREES          Premium
## 3510   PRINGLES               RETIREES          Premium
## 3511     KETTLE               RETIREES          Premium
## 3512  INFUZIONS               RETIREES          Premium
## 3513    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 3514    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 3515     DORITO               RETIREES       Mainstream
## 3516  INFUZIONS               RETIREES       Mainstream
## 3517       COBS               RETIREES       Mainstream
## 3518    DORITOS               RETIREES       Mainstream
## 3519     KETTLE               RETIREES       Mainstream
## 3520       COBS               RETIREES       Mainstream
## 3521     KETTLE         OLDER FAMILIES           Budget
## 3522   PRINGLES         OLDER FAMILIES           Budget
## 3523     KETTLE         OLDER FAMILIES           Budget
## 3524   PRINGLES         OLDER FAMILIES           Budget
## 3525    DORITOS  OLDER SINGLES/COUPLES          Premium
## 3526     DORITO  OLDER SINGLES/COUPLES          Premium
## 3527   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 3528   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 3529     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3530     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3531    DORITOS  OLDER SINGLES/COUPLES           Budget
## 3532   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 3533   TOSTITOS         YOUNG FAMILIES       Mainstream
## 3534       COBS         YOUNG FAMILIES       Mainstream
## 3535    DORITOS               RETIREES           Budget
## 3536     INFZNS               RETIREES           Budget
## 3537   PRINGLES               RETIREES           Budget
## 3538      THINS               RETIREES           Budget
## 3539   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 3540     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3541   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 3542      GRAIN         OLDER FAMILIES           Budget
## 3543       COBS         OLDER FAMILIES           Budget
## 3544     KETTLE         OLDER FAMILIES           Budget
## 3545       COBS         OLDER FAMILIES       Mainstream
## 3546    DORITOS         OLDER FAMILIES       Mainstream
## 3547    DORITOS         OLDER FAMILIES       Mainstream
## 3548       COBS MIDAGE SINGLES/COUPLES       Mainstream
## 3549    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 3550      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 3551   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 3552     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3553      GRAIN  OLDER SINGLES/COUPLES           Budget
## 3554     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3555     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3556    DORITOS  OLDER SINGLES/COUPLES           Budget
## 3557  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 3558      THINS  OLDER SINGLES/COUPLES          Premium
## 3559   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 3560    DORITOS  OLDER SINGLES/COUPLES          Premium
## 3561     KETTLE  OLDER SINGLES/COUPLES          Premium
## 3562    DORITOS  OLDER SINGLES/COUPLES          Premium
## 3563     SMITHS  OLDER SINGLES/COUPLES          Premium
## 3564    DORITOS  OLDER SINGLES/COUPLES          Premium
## 3565   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3566    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 3567   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 3568     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3569     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3570     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3571       COBS  OLDER SINGLES/COUPLES          Premium
## 3572     KETTLE  OLDER SINGLES/COUPLES          Premium
## 3573    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 3574  INFUZIONS MIDAGE SINGLES/COUPLES          Premium
## 3575   TOSTITOS MIDAGE SINGLES/COUPLES          Premium
## 3576     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 3577   PRINGLES               RETIREES           Budget
## 3578      THINS               RETIREES           Budget
## 3579    DORITOS               RETIREES           Budget
## 3580  INFUZIONS               RETIREES           Budget
## 3581     INFZNS               RETIREES           Budget
## 3582   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 3583     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3584    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 3585    DORITOS               RETIREES       Mainstream
## 3586     KETTLE               RETIREES       Mainstream
## 3587  INFUZIONS               RETIREES       Mainstream
## 3588   PRINGLES               RETIREES       Mainstream
## 3589      GRAIN               RETIREES       Mainstream
## 3590   PRINGLES               RETIREES       Mainstream
## 3591   CHEEZELS           NEW FAMILIES       Mainstream
## 3592     KETTLE           NEW FAMILIES       Mainstream
## 3593   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 3594    DORITOS  OLDER SINGLES/COUPLES          Premium
## 3595      THINS               RETIREES       Mainstream
## 3596       COBS               RETIREES       Mainstream
## 3597   PRINGLES               RETIREES       Mainstream
## 3598    DORITOS               RETIREES       Mainstream
## 3599     KETTLE               RETIREES       Mainstream
## 3600  INFUZIONS               RETIREES       Mainstream
## 3601    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 3602   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 3603      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 3604       COBS  OLDER SINGLES/COUPLES       Mainstream
## 3605       COBS  OLDER SINGLES/COUPLES       Mainstream
## 3606   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 3607   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3608     KETTLE         YOUNG FAMILIES           Budget
## 3609     KETTLE         YOUNG FAMILIES           Budget
## 3610    DORITOS         YOUNG FAMILIES           Budget
## 3611   PRINGLES         YOUNG FAMILIES           Budget
## 3612    DORITOS         YOUNG FAMILIES           Budget
## 3613   TWISTIES         YOUNG FAMILIES           Budget
## 3614     KETTLE         YOUNG FAMILIES           Budget
## 3615      GRAIN               RETIREES          Premium
## 3616     KETTLE               RETIREES          Premium
## 3617     KETTLE               RETIREES          Premium
## 3618    DORITOS               RETIREES          Premium
## 3619       COBS               RETIREES          Premium
## 3620  INFUZIONS               RETIREES          Premium
## 3621     KETTLE               RETIREES          Premium
## 3622   TOSTITOS         OLDER FAMILIES          Premium
## 3623   TOSTITOS         OLDER FAMILIES          Premium
## 3624      THINS         OLDER FAMILIES          Premium
## 3625     KETTLE         OLDER FAMILIES          Premium
## 3626    DORITOS         OLDER FAMILIES          Premium
## 3627    DORITOS         OLDER FAMILIES          Premium
## 3628     SMITHS         OLDER FAMILIES          Premium
## 3629   PRINGLES         OLDER FAMILIES          Premium
## 3630       COBS         OLDER FAMILIES          Premium
## 3631   TWISTIES  YOUNG SINGLES/COUPLES          Premium
## 3632  INFUZIONS  YOUNG SINGLES/COUPLES          Premium
## 3633   TWISTIES  YOUNG SINGLES/COUPLES          Premium
## 3634   TOSTITOS         OLDER FAMILIES           Budget
## 3635      THINS         OLDER FAMILIES           Budget
## 3636    DORITOS         OLDER FAMILIES           Budget
## 3637   TOSTITOS         OLDER FAMILIES           Budget
## 3638      GRAIN         OLDER FAMILIES           Budget
## 3639    DORITOS         OLDER FAMILIES           Budget
## 3640   TYRRELLS               RETIREES          Premium
## 3641     INFZNS               RETIREES          Premium
## 3642     KETTLE               RETIREES          Premium
## 3643       COBS               RETIREES          Premium
## 3644     KETTLE               RETIREES          Premium
## 3645   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3646       COBS  OLDER SINGLES/COUPLES       Mainstream
## 3647     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3648   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3649    DORITOS               RETIREES       Mainstream
## 3650     SMITHS               RETIREES       Mainstream
## 3651   PRINGLES               RETIREES       Mainstream
## 3652     INFZNS               RETIREES       Mainstream
## 3653      THINS               RETIREES       Mainstream
## 3654   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 3655   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 3656  INFUZIONS MIDAGE SINGLES/COUPLES       Mainstream
## 3657   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 3658     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 3659    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 3660       COBS         YOUNG FAMILIES       Mainstream
## 3661     KETTLE         YOUNG FAMILIES       Mainstream
## 3662     KETTLE         YOUNG FAMILIES       Mainstream
## 3663    DORITOS               RETIREES       Mainstream
## 3664       COBS               RETIREES       Mainstream
## 3665   CHEEZELS               RETIREES       Mainstream
## 3666    DORITOS               RETIREES       Mainstream
## 3667     SMITHS               RETIREES       Mainstream
## 3668     INFZNS               RETIREES       Mainstream
## 3669  INFUZIONS               RETIREES       Mainstream
## 3670     KETTLE               RETIREES          Premium
## 3671   PRINGLES               RETIREES          Premium
## 3672     DORITO               RETIREES          Premium
## 3673     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 3674     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 3675   TOSTITOS  YOUNG SINGLES/COUPLES           Budget
## 3676     KETTLE               RETIREES           Budget
## 3677      THINS               RETIREES           Budget
## 3678   CHEEZELS               RETIREES           Budget
## 3679      THINS           NEW FAMILIES       Mainstream
## 3680     KETTLE           NEW FAMILIES       Mainstream
## 3681   CHEEZELS           NEW FAMILIES       Mainstream
## 3682   TYRRELLS           NEW FAMILIES       Mainstream
## 3683     KETTLE           NEW FAMILIES       Mainstream
## 3684   TYRRELLS           NEW FAMILIES       Mainstream
## 3685  INFUZIONS         YOUNG FAMILIES          Premium
## 3686   TOSTITOS         YOUNG FAMILIES          Premium
## 3687   PRINGLES         YOUNG FAMILIES          Premium
## 3688  INFUZIONS         YOUNG FAMILIES          Premium
## 3689   CHEEZELS         YOUNG FAMILIES          Premium
## 3690     KETTLE         YOUNG FAMILIES          Premium
## 3691   TWISTIES         YOUNG FAMILIES          Premium
## 3692  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 3693    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 3694  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 3695   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3696     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3697     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3698   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 3699   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 3700     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3701     DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 3702   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 3703     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3704     KETTLE               RETIREES           Budget
## 3705   PRINGLES               RETIREES           Budget
## 3706    DORITOS               RETIREES           Budget
## 3707       COBS               RETIREES           Budget
## 3708    DORITOS               RETIREES           Budget
## 3709     KETTLE               RETIREES           Budget
## 3710   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 3711   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 3712       COBS  OLDER SINGLES/COUPLES          Premium
## 3713      GRAIN  OLDER SINGLES/COUPLES          Premium
## 3714      THINS  OLDER SINGLES/COUPLES          Premium
## 3715   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 3716     INFZNS         YOUNG FAMILIES       Mainstream
## 3717      GRAIN         YOUNG FAMILIES       Mainstream
## 3718      THINS         YOUNG FAMILIES       Mainstream
## 3719   PRINGLES         YOUNG FAMILIES       Mainstream
## 3720       COBS         YOUNG FAMILIES       Mainstream
## 3721  INFUZIONS MIDAGE SINGLES/COUPLES          Premium
## 3722    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 3723  INFUZIONS MIDAGE SINGLES/COUPLES          Premium
## 3724   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 3725     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 3726   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 3727     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 3728   PRINGLES               RETIREES       Mainstream
## 3729     SMITHS               RETIREES       Mainstream
## 3730     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 3731     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3732      THINS  OLDER SINGLES/COUPLES           Budget
## 3733       COBS  OLDER SINGLES/COUPLES           Budget
## 3734     DORITO  OLDER SINGLES/COUPLES           Budget
## 3735   TYRRELLS  OLDER SINGLES/COUPLES           Budget
## 3736     KETTLE         OLDER FAMILIES           Budget
## 3737      GRAIN         OLDER FAMILIES           Budget
## 3738     KETTLE         OLDER FAMILIES           Budget
## 3739      THINS         OLDER FAMILIES           Budget
## 3740   PRINGLES         OLDER FAMILIES           Budget
## 3741   TYRRELLS         YOUNG FAMILIES           Budget
## 3742   PRINGLES               RETIREES       Mainstream
## 3743      THINS               RETIREES       Mainstream
## 3744   PRINGLES               RETIREES       Mainstream
## 3745      THINS         YOUNG FAMILIES       Mainstream
## 3746     KETTLE         YOUNG FAMILIES       Mainstream
## 3747   PRINGLES         YOUNG FAMILIES       Mainstream
## 3748     KETTLE         YOUNG FAMILIES       Mainstream
## 3749   TYRRELLS         YOUNG FAMILIES       Mainstream
## 3750       COBS         YOUNG FAMILIES       Mainstream
## 3751     SMITHS         YOUNG FAMILIES       Mainstream
## 3752     KETTLE         YOUNG FAMILIES       Mainstream
## 3753   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 3754  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 3755      GRAIN           NEW FAMILIES          Premium
## 3756   PRINGLES           NEW FAMILIES          Premium
## 3757   PRINGLES           NEW FAMILIES          Premium
## 3758    DORITOS           NEW FAMILIES          Premium
## 3759      THINS           NEW FAMILIES          Premium
## 3760   PRINGLES           NEW FAMILIES          Premium
## 3761   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 3762   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 3763   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 3764     KETTLE         OLDER FAMILIES           Budget
## 3765    DORITOS         OLDER FAMILIES           Budget
## 3766     KETTLE         OLDER FAMILIES           Budget
## 3767  INFUZIONS         OLDER FAMILIES           Budget
## 3768    DORITOS         OLDER FAMILIES           Budget
## 3769   PRINGLES         OLDER FAMILIES           Budget
## 3770   PRINGLES         OLDER FAMILIES           Budget
## 3771     KETTLE         YOUNG FAMILIES          Premium
## 3772     DORITO         YOUNG FAMILIES          Premium
## 3773     DORITO         YOUNG FAMILIES          Premium
## 3774     KETTLE         YOUNG FAMILIES          Premium
## 3775   TWISTIES         YOUNG FAMILIES          Premium
## 3776    DORITOS         YOUNG FAMILIES           Budget
## 3777     KETTLE         YOUNG FAMILIES           Budget
## 3778     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3779   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 3780      GRAIN  OLDER SINGLES/COUPLES       Mainstream
## 3781     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3782     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3783  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 3784    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 3785    DORITOS         OLDER FAMILIES       Mainstream
## 3786       COBS         OLDER FAMILIES       Mainstream
## 3787   PRINGLES         OLDER FAMILIES       Mainstream
## 3788    DORITOS         OLDER FAMILIES       Mainstream
## 3789       COBS         OLDER FAMILIES       Mainstream
## 3790  INFUZIONS         OLDER FAMILIES       Mainstream
## 3791   PRINGLES         OLDER FAMILIES       Mainstream
## 3792   TYRRELLS               RETIREES           Budget
## 3793    DORITOS               RETIREES           Budget
## 3794      GRAIN               RETIREES           Budget
## 3795   TOSTITOS               RETIREES           Budget
## 3796     KETTLE               RETIREES           Budget
## 3797     KETTLE               RETIREES           Budget
## 3798     INFZNS               RETIREES           Budget
## 3799     SMITHS               RETIREES           Budget
## 3800     SMITHS               RETIREES           Budget
## 3801   TYRRELLS         YOUNG FAMILIES       Mainstream
## 3802     KETTLE         YOUNG FAMILIES       Mainstream
## 3803     KETTLE         YOUNG FAMILIES       Mainstream
## 3804   TWISTIES         YOUNG FAMILIES       Mainstream
## 3805     KETTLE         YOUNG FAMILIES       Mainstream
## 3806    DORITOS         YOUNG FAMILIES       Mainstream
## 3807     KETTLE         YOUNG FAMILIES       Mainstream
## 3808   PRINGLES         YOUNG FAMILIES       Mainstream
## 3809     KETTLE  OLDER SINGLES/COUPLES          Premium
## 3810   TOSTITOS               RETIREES           Budget
## 3811     KETTLE               RETIREES           Budget
## 3812  INFUZIONS               RETIREES           Budget
## 3813     KETTLE               RETIREES           Budget
## 3814   PRINGLES               RETIREES           Budget
## 3815   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 3816   TOSTITOS  YOUNG SINGLES/COUPLES           Budget
## 3817     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 3818     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 3819   TWISTIES  YOUNG SINGLES/COUPLES           Budget
## 3820   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3821   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3822     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3823     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3824     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 3825   TWISTIES MIDAGE SINGLES/COUPLES          Premium
## 3826   TWISTIES MIDAGE SINGLES/COUPLES          Premium
## 3827     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 3828     KETTLE               RETIREES       Mainstream
## 3829    DORITOS               RETIREES       Mainstream
## 3830       COBS               RETIREES       Mainstream
## 3831     INFZNS  YOUNG SINGLES/COUPLES          Premium
## 3832     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 3833     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 3834     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 3835   PRINGLES         YOUNG FAMILIES           Budget
## 3836   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 3837     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 3838   TWISTIES MIDAGE SINGLES/COUPLES       Mainstream
## 3839   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 3840      GRAIN  OLDER SINGLES/COUPLES          Premium
## 3841   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 3842     SMITHS  OLDER SINGLES/COUPLES          Premium
## 3843   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 3844      THINS  OLDER SINGLES/COUPLES          Premium
## 3845      THINS  OLDER SINGLES/COUPLES           Budget
## 3846    DORITOS  OLDER SINGLES/COUPLES           Budget
## 3847     KETTLE         YOUNG FAMILIES       Mainstream
## 3848   TWISTIES         YOUNG FAMILIES       Mainstream
## 3849   PRINGLES         YOUNG FAMILIES       Mainstream
## 3850     KETTLE           NEW FAMILIES           Budget
## 3851   TWISTIES           NEW FAMILIES           Budget
## 3852  INFUZIONS           NEW FAMILIES           Budget
## 3853     SMITHS         YOUNG FAMILIES       Mainstream
## 3854      GRAIN         YOUNG FAMILIES       Mainstream
## 3855    DORITOS         YOUNG FAMILIES       Mainstream
## 3856    DORITOS         YOUNG FAMILIES       Mainstream
## 3857     KETTLE         YOUNG FAMILIES       Mainstream
## 3858   TWISTIES         YOUNG FAMILIES       Mainstream
## 3859  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 3860     INFZNS  OLDER SINGLES/COUPLES          Premium
## 3861   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 3862   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 3863     KETTLE  OLDER SINGLES/COUPLES          Premium
## 3864      THINS  OLDER SINGLES/COUPLES          Premium
## 3865   TYRRELLS  OLDER SINGLES/COUPLES          Premium
## 3866    DORITOS               RETIREES           Budget
## 3867     KETTLE               RETIREES           Budget
## 3868   TYRRELLS               RETIREES           Budget
## 3869   TOSTITOS MIDAGE SINGLES/COUPLES          Premium
## 3870       COBS MIDAGE SINGLES/COUPLES          Premium
## 3871   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 3872      THINS MIDAGE SINGLES/COUPLES          Premium
## 3873     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 3874   TOSTITOS MIDAGE SINGLES/COUPLES          Premium
## 3875   TOSTITOS MIDAGE SINGLES/COUPLES          Premium
## 3876    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 3877     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 3878      GRAIN MIDAGE SINGLES/COUPLES          Premium
## 3879    DORITOS               RETIREES          Premium
## 3880    DORITOS               RETIREES          Premium
## 3881   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 3882   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 3883  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 3884     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 3885   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 3886     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3887   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 3888   CHEEZELS  OLDER SINGLES/COUPLES       Mainstream
## 3889     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3890   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 3891     SMITHS         YOUNG FAMILIES           Budget
## 3892   PRINGLES         YOUNG FAMILIES           Budget
## 3893   TWISTIES         YOUNG FAMILIES           Budget
## 3894   PRINGLES         YOUNG FAMILIES           Budget
## 3895     SMITHS         YOUNG FAMILIES           Budget
## 3896    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 3897     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 3898   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 3899   TYRRELLS               RETIREES           Budget
## 3900   TWISTIES               RETIREES           Budget
## 3901      THINS               RETIREES           Budget
## 3902      GRAIN               RETIREES           Budget
## 3903     KETTLE               RETIREES           Budget
## 3904      THINS               RETIREES           Budget
## 3905   PRINGLES               RETIREES           Budget
## 3906      GRAIN               RETIREES           Budget
## 3907      THINS               RETIREES           Budget
## 3908   PRINGLES               RETIREES           Budget
## 3909   CHEEZELS               RETIREES          Premium
## 3910    DORITOS               RETIREES          Premium
## 3911      GRAIN               RETIREES          Premium
## 3912     KETTLE               RETIREES          Premium
## 3913       COBS               RETIREES          Premium
## 3914  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 3915   CHEEZELS  OLDER SINGLES/COUPLES       Mainstream
## 3916   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 3917      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 3918     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 3919   CHEEZELS  YOUNG SINGLES/COUPLES       Mainstream
## 3920      THINS  OLDER SINGLES/COUPLES       Mainstream
## 3921      GRAIN  OLDER SINGLES/COUPLES       Mainstream
## 3922   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 3923     KETTLE         OLDER FAMILIES          Premium
## 3924     KETTLE               RETIREES       Mainstream
## 3925       COBS               RETIREES       Mainstream
## 3926    DORITOS               RETIREES       Mainstream
## 3927      THINS               RETIREES       Mainstream
## 3928   PRINGLES               RETIREES       Mainstream
## 3929     SMITHS               RETIREES       Mainstream
## 3930       COBS               RETIREES       Mainstream
## 3931   PRINGLES               RETIREES       Mainstream
## 3932    DORITOS  OLDER SINGLES/COUPLES           Budget
## 3933  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 3934      THINS  OLDER SINGLES/COUPLES           Budget
## 3935     KETTLE  OLDER SINGLES/COUPLES           Budget
## 3936   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 3937    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 3938   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 3939       COBS  OLDER SINGLES/COUPLES       Mainstream
## 3940    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 3941      GRAIN  OLDER SINGLES/COUPLES       Mainstream
## 3942   PRINGLES               RETIREES           Budget
## 3943  INFUZIONS               RETIREES           Budget
## 3944     KETTLE         OLDER FAMILIES           Budget
## 3945    DORITOS         OLDER FAMILIES           Budget
## 3946   PRINGLES         OLDER FAMILIES           Budget
## 3947    DORITOS               RETIREES       Mainstream
## 3948    DORITOS               RETIREES       Mainstream
## 3949    DORITOS               RETIREES       Mainstream
## 3950  INFUZIONS MIDAGE SINGLES/COUPLES           Budget
## 3951      THINS MIDAGE SINGLES/COUPLES           Budget
## 3952      THINS MIDAGE SINGLES/COUPLES           Budget
## 3953   TWISTIES MIDAGE SINGLES/COUPLES           Budget
## 3954    DORITOS         YOUNG FAMILIES           Budget
## 3955   PRINGLES         YOUNG FAMILIES           Budget
## 3956   TOSTITOS         YOUNG FAMILIES           Budget
## 3957       COBS  YOUNG SINGLES/COUPLES          Premium
## 3958     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 3959   TWISTIES  YOUNG SINGLES/COUPLES          Premium
## 3960     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 3961    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 3962    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 3963    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 3964   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 3965   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 3966   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 3967     SMITHS  OLDER SINGLES/COUPLES           Budget
## 3968   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 3969   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 3970     INFZNS  OLDER SINGLES/COUPLES           Budget
## 3971     KETTLE         YOUNG FAMILIES          Premium
## 3972     KETTLE         YOUNG FAMILIES          Premium
## 3973      THINS         YOUNG FAMILIES          Premium
## 3974       COBS         YOUNG FAMILIES          Premium
## 3975       COBS         YOUNG FAMILIES          Premium
## 3976   CHEEZELS         YOUNG FAMILIES          Premium
## 3977      GRAIN         YOUNG FAMILIES          Premium
## 3978     KETTLE  OLDER SINGLES/COUPLES          Premium
## 3979   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 3980    DORITOS  OLDER SINGLES/COUPLES          Premium
## 3981    DORITOS  OLDER SINGLES/COUPLES          Premium
## 3982     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 3983     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 3984      THINS MIDAGE SINGLES/COUPLES           Budget
## 3985     KETTLE         OLDER FAMILIES           Budget
## 3986     KETTLE         OLDER FAMILIES           Budget
## 3987     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 3988       COBS  YOUNG SINGLES/COUPLES           Budget
## 3989       COBS  YOUNG SINGLES/COUPLES           Budget
## 3990   PRINGLES               RETIREES       Mainstream
## 3991     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 3992     INFZNS  OLDER SINGLES/COUPLES       Mainstream
## 3993   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 3994      THINS  OLDER SINGLES/COUPLES       Mainstream
## 3995   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 3996    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 3997   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 3998      THINS  OLDER SINGLES/COUPLES       Mainstream
## 3999     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 4000     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 4001     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 4002     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 4003       COBS               RETIREES           Budget
## 4004   TWISTIES               RETIREES           Budget
## 4005     KETTLE               RETIREES           Budget
## 4006      THINS               RETIREES           Budget
## 4007   TOSTITOS               RETIREES           Budget
## 4008     KETTLE               RETIREES           Budget
## 4009   PRINGLES               RETIREES           Budget
## 4010    DORITOS               RETIREES       Mainstream
## 4011     KETTLE               RETIREES       Mainstream
## 4012   PRINGLES               RETIREES       Mainstream
## 4013   PRINGLES               RETIREES       Mainstream
## 4014   TOSTITOS               RETIREES       Mainstream
## 4015     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 4016   TOSTITOS MIDAGE SINGLES/COUPLES          Premium
## 4017  INFUZIONS MIDAGE SINGLES/COUPLES          Premium
## 4018    DORITOS               RETIREES          Premium
## 4019   PRINGLES               RETIREES          Premium
## 4020     SMITHS         YOUNG FAMILIES           Budget
## 4021   TWISTIES         YOUNG FAMILIES           Budget
## 4022      GRAIN         YOUNG FAMILIES           Budget
## 4023        RRD         YOUNG FAMILIES           Budget
## 4024         WW         YOUNG FAMILIES           Budget
## 4025    CHEETOS         YOUNG FAMILIES           Budget
## 4026         WW         YOUNG FAMILIES           Budget
## 4027     KETTLE         OLDER FAMILIES          Premium
## 4028     SMITHS         OLDER FAMILIES          Premium
## 4029     SMITHS         OLDER FAMILIES          Premium
## 4030   PRINGLES         OLDER FAMILIES          Premium
## 4031   TWISTIES         OLDER FAMILIES          Premium
## 4032   CHEEZELS         OLDER FAMILIES          Premium
## 4033      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 4034     INFZNS  YOUNG SINGLES/COUPLES       Mainstream
## 4035        RRD  YOUNG SINGLES/COUPLES       Mainstream
## 4036        CCS  YOUNG SINGLES/COUPLES       Mainstream
## 4037   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 4038      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 4039        RRD  YOUNG SINGLES/COUPLES       Mainstream
## 4040   CHEEZELS  YOUNG SINGLES/COUPLES       Mainstream
## 4041     FRENCH  YOUNG SINGLES/COUPLES       Mainstream
## 4042         WW               RETIREES          Premium
## 4043     INFZNS               RETIREES          Premium
## 4044     KETTLE               RETIREES          Premium
## 4045    DORITOS               RETIREES          Premium
## 4046     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 4047     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 4048      GRAIN  OLDER SINGLES/COUPLES       Mainstream
## 4049     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 4050        RRD  OLDER SINGLES/COUPLES       Mainstream
## 4051     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 4052    GRNWVES  OLDER SINGLES/COUPLES       Mainstream
## 4053         WW  OLDER SINGLES/COUPLES       Mainstream
## 4054     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 4055    NATURAL  OLDER SINGLES/COUPLES       Mainstream
## 4056     KETTLE         OLDER FAMILIES           Budget
## 4057     SMITHS         OLDER FAMILIES           Budget
## 4058   TWISTIES         OLDER FAMILIES           Budget
## 4059   TYRRELLS         OLDER FAMILIES           Budget
## 4060   TYRRELLS         OLDER FAMILIES           Budget
## 4061         WW         OLDER FAMILIES           Budget
## 4062  INFUZIONS         OLDER FAMILIES           Budget
## 4063    NATURAL  OLDER SINGLES/COUPLES       Mainstream
## 4064     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 4065        RED  OLDER SINGLES/COUPLES       Mainstream
## 4066   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 4067       COBS  OLDER SINGLES/COUPLES       Mainstream
## 4068    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 4069     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 4070    NATURAL  OLDER SINGLES/COUPLES       Mainstream
## 4071     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 4072        RED  OLDER SINGLES/COUPLES       Mainstream
## 4073         WW  OLDER SINGLES/COUPLES       Mainstream
## 4074      THINS         YOUNG FAMILIES          Premium
## 4075    DORITOS         YOUNG FAMILIES          Premium
## 4076        RED         YOUNG FAMILIES          Premium
## 4077   PRINGLES         YOUNG FAMILIES          Premium
## 4078   PRINGLES         YOUNG FAMILIES          Premium
## 4079     BURGER         YOUNG FAMILIES          Premium
## 4080    DORITOS         YOUNG FAMILIES          Premium
## 4081      GRAIN               RETIREES           Budget
## 4082     SMITHS               RETIREES           Budget
## 4083     KETTLE               RETIREES           Budget
## 4084        RRD               RETIREES           Budget
## 4085    DORITOS               RETIREES           Budget
## 4086   TWISTIES               RETIREES           Budget
## 4087    NATURAL         OLDER FAMILIES          Premium
## 4088     INFZNS         OLDER FAMILIES          Premium
## 4089     KETTLE         OLDER FAMILIES          Premium
## 4090   PRINGLES         OLDER FAMILIES          Premium
## 4091        RRD         OLDER FAMILIES          Premium
## 4092  INFUZIONS         OLDER FAMILIES          Premium
## 4093   PRINGLES         OLDER FAMILIES          Premium
## 4094        RED               RETIREES          Premium
## 4095     KETTLE               RETIREES          Premium
## 4096     SMITHS               RETIREES          Premium
## 4097    DORITOS               RETIREES          Premium
## 4098     KETTLE               RETIREES          Premium
## 4099     SMITHS               RETIREES          Premium
## 4100  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 4101    DORITOS  OLDER SINGLES/COUPLES          Premium
## 4102      THINS  OLDER SINGLES/COUPLES          Premium
## 4103         WW  YOUNG SINGLES/COUPLES       Mainstream
## 4104      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 4105  INFUZIONS MIDAGE SINGLES/COUPLES           Budget
## 4106   PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 4107     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 4108     SMITHS MIDAGE SINGLES/COUPLES           Budget
## 4109   PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 4110         WW  OLDER SINGLES/COUPLES           Budget
## 4111         WW  OLDER SINGLES/COUPLES           Budget
## 4112     KETTLE  OLDER SINGLES/COUPLES           Budget
## 4113        CCS  OLDER SINGLES/COUPLES           Budget
## 4114         WW  OLDER SINGLES/COUPLES           Budget
## 4115     KETTLE  OLDER SINGLES/COUPLES          Premium
## 4116   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 4117     KETTLE  OLDER SINGLES/COUPLES          Premium
## 4118        CCS MIDAGE SINGLES/COUPLES           Budget
## 4119        CCS MIDAGE SINGLES/COUPLES           Budget
## 4120      GRAIN MIDAGE SINGLES/COUPLES           Budget
## 4121        RRD MIDAGE SINGLES/COUPLES           Budget
## 4122   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 4123   TOSTITOS  YOUNG SINGLES/COUPLES          Premium
## 4124        RRD  YOUNG SINGLES/COUPLES          Premium
## 4125        CCS MIDAGE SINGLES/COUPLES       Mainstream
## 4126     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 4127      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 4128  INFUZIONS MIDAGE SINGLES/COUPLES       Mainstream
## 4129     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 4130         WW MIDAGE SINGLES/COUPLES       Mainstream
## 4131       COBS  OLDER SINGLES/COUPLES           Budget
## 4132         WW  OLDER SINGLES/COUPLES           Budget
## 4133     SMITHS  OLDER SINGLES/COUPLES           Budget
## 4134   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 4135     SMITHS  OLDER SINGLES/COUPLES           Budget
## 4136    NATURAL  OLDER SINGLES/COUPLES           Budget
## 4137   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 4138      SMITH         OLDER FAMILIES          Premium
## 4139        RRD         OLDER FAMILIES          Premium
## 4140   PRINGLES         OLDER FAMILIES          Premium
## 4141        RRD         OLDER FAMILIES          Premium
## 4142    DORITOS         OLDER FAMILIES          Premium
## 4143     SMITHS         OLDER FAMILIES          Premium
## 4144     SMITHS         OLDER FAMILIES          Premium
## 4145   PRINGLES         OLDER FAMILIES          Premium
## 4146      SNBTS  YOUNG SINGLES/COUPLES           Budget
## 4147        RRD  YOUNG SINGLES/COUPLES           Budget
## 4148     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 4149   SUNBITES  YOUNG SINGLES/COUPLES           Budget
## 4150     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 4151        RRD  YOUNG SINGLES/COUPLES           Budget
## 4152         WW         YOUNG FAMILIES           Budget
## 4153     KETTLE         YOUNG FAMILIES           Budget
## 4154   PRINGLES         YOUNG FAMILIES           Budget
## 4155     DORITO         YOUNG FAMILIES           Budget
## 4156   TOSTITOS         YOUNG FAMILIES           Budget
## 4157        NCC         YOUNG FAMILIES           Budget
## 4158        CCS         YOUNG FAMILIES           Budget
## 4159   CHEEZELS         YOUNG FAMILIES           Budget
## 4160     SMITHS         YOUNG FAMILIES          Premium
## 4161        RRD         YOUNG FAMILIES          Premium
## 4162   PRINGLES         YOUNG FAMILIES          Premium
## 4163  INFUZIONS         YOUNG FAMILIES          Premium
## 4164   PRINGLES         YOUNG FAMILIES          Premium
## 4165        RED         YOUNG FAMILIES          Premium
## 4166      THINS         YOUNG FAMILIES          Premium
## 4167       COBS         YOUNG FAMILIES          Premium
## 4168     SMITHS         YOUNG FAMILIES          Premium
## 4169    DORITOS         YOUNG FAMILIES          Premium
## 4170    DORITOS         YOUNG FAMILIES          Premium
## 4171         WW MIDAGE SINGLES/COUPLES           Budget
## 4172      THINS MIDAGE SINGLES/COUPLES           Budget
## 4173        RED MIDAGE SINGLES/COUPLES           Budget
## 4174    GRNWVES MIDAGE SINGLES/COUPLES           Budget
## 4175    DORITOS MIDAGE SINGLES/COUPLES           Budget
## 4176        RRD         YOUNG FAMILIES           Budget
## 4177      SMITH         YOUNG FAMILIES           Budget
## 4178   PRINGLES         YOUNG FAMILIES           Budget
## 4179     SMITHS         YOUNG FAMILIES           Budget
## 4180  INFUZIONS         YOUNG FAMILIES           Budget
## 4181        CCS MIDAGE SINGLES/COUPLES           Budget
## 4182     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 4183   PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 4184        RRD MIDAGE SINGLES/COUPLES           Budget
## 4185    GRNWVES MIDAGE SINGLES/COUPLES           Budget
## 4186         WW MIDAGE SINGLES/COUPLES           Budget
## 4187     BURGER MIDAGE SINGLES/COUPLES           Budget
## 4188      SMITH MIDAGE SINGLES/COUPLES           Budget
## 4189    CHEETOS  OLDER SINGLES/COUPLES           Budget
## 4190        RRD  OLDER SINGLES/COUPLES           Budget
## 4191        RRD  OLDER SINGLES/COUPLES           Budget
## 4192     KETTLE  OLDER SINGLES/COUPLES           Budget
## 4193        RRD  OLDER SINGLES/COUPLES           Budget
## 4194        RRD  OLDER SINGLES/COUPLES           Budget
## 4195        RRD  OLDER SINGLES/COUPLES           Budget
## 4196      GRAIN  OLDER SINGLES/COUPLES           Budget
## 4197       COBS  OLDER SINGLES/COUPLES           Budget
## 4198        NCC               RETIREES           Budget
## 4199    DORITOS               RETIREES           Budget
## 4200    DORITOS               RETIREES           Budget
## 4201    DORITOS               RETIREES           Budget
## 4202     KETTLE               RETIREES           Budget
## 4203     SMITHS               RETIREES           Budget
## 4204       COBS               RETIREES           Budget
## 4205        RRD               RETIREES           Budget
## 4206     SMITHS               RETIREES           Budget
## 4207     KETTLE               RETIREES           Budget
## 4208     KETTLE               RETIREES           Budget
## 4209  INFUZIONS         YOUNG FAMILIES       Mainstream
## 4210     FRENCH         YOUNG FAMILIES       Mainstream
## 4211  INFUZIONS         YOUNG FAMILIES       Mainstream
## 4212     FRENCH         YOUNG FAMILIES       Mainstream
## 4213        RED         YOUNG FAMILIES       Mainstream
## 4214    DORITOS         YOUNG FAMILIES       Mainstream
## 4215   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 4216         WW  OLDER SINGLES/COUPLES       Mainstream
## 4217     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 4218   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 4219    CHEETOS         YOUNG FAMILIES          Premium
## 4220     SMITHS         YOUNG FAMILIES          Premium
## 4221        RRD         YOUNG FAMILIES          Premium
## 4222   PRINGLES         YOUNG FAMILIES          Premium
## 4223  INFUZIONS         YOUNG FAMILIES          Premium
## 4224     KETTLE         YOUNG FAMILIES          Premium
## 4225      THINS         YOUNG FAMILIES          Premium
## 4226   TYRRELLS         YOUNG FAMILIES          Premium
## 4227        RRD         YOUNG FAMILIES          Premium
## 4228    DORITOS         YOUNG FAMILIES          Premium
## 4229     DORITO         YOUNG FAMILIES          Premium
## 4230     SMITHS         YOUNG FAMILIES       Mainstream
## 4231        RRD         YOUNG FAMILIES       Mainstream
## 4232    GRNWVES         YOUNG FAMILIES       Mainstream
## 4233     SMITHS         YOUNG FAMILIES       Mainstream
## 4234    NATURAL         YOUNG FAMILIES       Mainstream
## 4235    DORITOS         YOUNG FAMILIES       Mainstream
## 4236         WW         YOUNG FAMILIES       Mainstream
## 4237       COBS         YOUNG FAMILIES       Mainstream
## 4238     KETTLE  OLDER SINGLES/COUPLES          Premium
## 4239   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 4240        RED  OLDER SINGLES/COUPLES          Premium
## 4241   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 4242      SNBTS  OLDER SINGLES/COUPLES          Premium
## 4243  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 4244    NATURAL  OLDER SINGLES/COUPLES       Mainstream
## 4245         WW  OLDER SINGLES/COUPLES       Mainstream
## 4246      THINS  OLDER SINGLES/COUPLES       Mainstream
## 4247     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 4248     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 4249   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 4250     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 4251     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 4252         WW MIDAGE SINGLES/COUPLES       Mainstream
## 4253        CCS MIDAGE SINGLES/COUPLES       Mainstream
## 4254   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 4255   PRINGLES               RETIREES       Mainstream
## 4256        CCS               RETIREES       Mainstream
## 4257      GRAIN           NEW FAMILIES       Mainstream
## 4258     KETTLE           NEW FAMILIES       Mainstream
## 4259     SMITHS  OLDER SINGLES/COUPLES           Budget
## 4260         WW  OLDER SINGLES/COUPLES           Budget
## 4261   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 4262    NATURAL  OLDER SINGLES/COUPLES           Budget
## 4263     KETTLE  OLDER SINGLES/COUPLES           Budget
## 4264     KETTLE  OLDER SINGLES/COUPLES           Budget
## 4265        RRD         OLDER FAMILIES           Budget
## 4266       COBS         OLDER FAMILIES           Budget
## 4267    DORITOS         OLDER FAMILIES           Budget
## 4268     KETTLE         OLDER FAMILIES           Budget
## 4269      THINS         OLDER FAMILIES           Budget
## 4270        RRD         OLDER FAMILIES           Budget
## 4271  INFUZIONS         OLDER FAMILIES          Premium
## 4272       COBS         OLDER FAMILIES          Premium
## 4273   TWISTIES         OLDER FAMILIES          Premium
## 4274         WW         OLDER FAMILIES          Premium
## 4275      GRAIN         OLDER FAMILIES          Premium
## 4276         WW         OLDER FAMILIES          Premium
## 4277    DORITOS         OLDER FAMILIES          Premium
## 4278     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 4279   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 4280     KETTLE               RETIREES       Mainstream
## 4281      GRAIN               RETIREES       Mainstream
## 4282     SMITHS               RETIREES       Mainstream
## 4283     KETTLE               RETIREES       Mainstream
## 4284     KETTLE               RETIREES       Mainstream
## 4285         WW  YOUNG SINGLES/COUPLES           Budget
## 4286         WW  YOUNG SINGLES/COUPLES           Budget
## 4287    DORITOS  OLDER SINGLES/COUPLES           Budget
## 4288    DORITOS  OLDER SINGLES/COUPLES           Budget
## 4289   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 4290   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 4291     SMITHS  OLDER SINGLES/COUPLES           Budget
## 4292      SMITH  OLDER SINGLES/COUPLES           Budget
## 4293     KETTLE  OLDER SINGLES/COUPLES           Budget
## 4294        RRD  OLDER SINGLES/COUPLES           Budget
## 4295        CCS               RETIREES           Budget
## 4296   CHEEZELS               RETIREES           Budget
## 4297    DORITOS               RETIREES           Budget
## 4298        RRD               RETIREES           Budget
## 4299    DORITOS               RETIREES           Budget
## 4300    NATURAL MIDAGE SINGLES/COUPLES           Budget
## 4301        RRD MIDAGE SINGLES/COUPLES           Budget
## 4302   PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 4303     SMITHS MIDAGE SINGLES/COUPLES           Budget
## 4304    NATURAL MIDAGE SINGLES/COUPLES           Budget
## 4305    CHEETOS MIDAGE SINGLES/COUPLES           Budget
## 4306     DORITO MIDAGE SINGLES/COUPLES           Budget
## 4307      THINS         OLDER FAMILIES          Premium
## 4308        NCC         OLDER FAMILIES          Premium
## 4309     SMITHS         OLDER FAMILIES          Premium
## 4310     SMITHS         OLDER FAMILIES          Premium
## 4311     SMITHS         OLDER FAMILIES          Premium
## 4312         WW         OLDER FAMILIES          Premium
## 4313   PRINGLES         OLDER FAMILIES           Budget
## 4314   PRINGLES         OLDER FAMILIES           Budget
## 4315     SMITHS         OLDER FAMILIES           Budget
## 4316    GRNWVES         OLDER FAMILIES           Budget
## 4317     KETTLE         OLDER FAMILIES           Budget
## 4318      THINS         OLDER FAMILIES           Budget
## 4319     SMITHS         OLDER FAMILIES           Budget
## 4320    DORITOS         OLDER FAMILIES           Budget
## 4321     KETTLE               RETIREES          Premium
## 4322   TWISTIES               RETIREES          Premium
## 4323     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 4324   CHEEZELS  YOUNG SINGLES/COUPLES          Premium
## 4325     SMITHS  YOUNG SINGLES/COUPLES          Premium
## 4326        RRD         YOUNG FAMILIES       Mainstream
## 4327  INFUZIONS         YOUNG FAMILIES       Mainstream
## 4328      THINS         YOUNG FAMILIES       Mainstream
## 4329       COBS         YOUNG FAMILIES       Mainstream
## 4330    NATURAL         YOUNG FAMILIES       Mainstream
## 4331     KETTLE         YOUNG FAMILIES       Mainstream
## 4332    CHEETOS         YOUNG FAMILIES       Mainstream
## 4333        RRD         YOUNG FAMILIES       Mainstream
## 4334        RRD         YOUNG FAMILIES       Mainstream
## 4335  INFUZIONS         YOUNG FAMILIES       Mainstream
## 4336    DORITOS         YOUNG FAMILIES       Mainstream
## 4337     KETTLE         YOUNG FAMILIES       Mainstream
## 4338    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 4339     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 4340   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 4341   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 4342         WW  YOUNG SINGLES/COUPLES       Mainstream
## 4343   TOSTITOS               RETIREES           Budget
## 4344        RED               RETIREES           Budget
## 4345         WW               RETIREES           Budget
## 4346      THINS               RETIREES           Budget
## 4347        NCC               RETIREES           Budget
## 4348        CCS  OLDER SINGLES/COUPLES           Budget
## 4349         WW  OLDER SINGLES/COUPLES           Budget
## 4350    DORITOS  OLDER SINGLES/COUPLES           Budget
## 4351        CCS  OLDER SINGLES/COUPLES           Budget
## 4352  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 4353     KETTLE  OLDER SINGLES/COUPLES           Budget
## 4354     SMITHS  OLDER SINGLES/COUPLES           Budget
## 4355   TWISTIES               RETIREES       Mainstream
## 4356      THINS               RETIREES       Mainstream
## 4357   TWISTIES               RETIREES       Mainstream
## 4358   TWISTIES               RETIREES       Mainstream
## 4359        RRD               RETIREES       Mainstream
## 4360     FRENCH  OLDER SINGLES/COUPLES          Premium
## 4361        RRD  OLDER SINGLES/COUPLES          Premium
## 4362   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 4363     KETTLE  OLDER SINGLES/COUPLES          Premium
## 4364   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 4365     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 4366        RRD         YOUNG FAMILIES          Premium
## 4367   PRINGLES         YOUNG FAMILIES          Premium
## 4368    DORITOS         YOUNG FAMILIES          Premium
## 4369     KETTLE         YOUNG FAMILIES          Premium
## 4370        RRD         YOUNG FAMILIES          Premium
## 4371         WW  OLDER SINGLES/COUPLES       Mainstream
## 4372  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 4373        RRD  OLDER SINGLES/COUPLES       Mainstream
## 4374      THINS  OLDER SINGLES/COUPLES       Mainstream
## 4375     KETTLE         OLDER FAMILIES          Premium
## 4376   TOSTITOS         OLDER FAMILIES          Premium
## 4377   CHEEZELS         OLDER FAMILIES          Premium
## 4378        NCC         OLDER FAMILIES          Premium
## 4379      THINS         OLDER FAMILIES          Premium
## 4380   TWISTIES         OLDER FAMILIES          Premium
## 4381     KETTLE  OLDER SINGLES/COUPLES           Budget
## 4382        RED  OLDER SINGLES/COUPLES           Budget
## 4383        CCS  OLDER SINGLES/COUPLES           Budget
## 4384        RED  YOUNG SINGLES/COUPLES       Mainstream
## 4385     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 4386     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 4387   TOSTITOS               RETIREES           Budget
## 4388     KETTLE               RETIREES           Budget
## 4389     SMITHS               RETIREES           Budget
## 4390     SMITHS         YOUNG FAMILIES          Premium
## 4391     KETTLE         YOUNG FAMILIES          Premium
## 4392     SMITHS         YOUNG FAMILIES          Premium
## 4393      GRAIN         YOUNG FAMILIES          Premium
## 4394     KETTLE         YOUNG FAMILIES          Premium
## 4395    NATURAL         YOUNG FAMILIES          Premium
## 4396        RRD         YOUNG FAMILIES          Premium
## 4397    CHEETOS         YOUNG FAMILIES          Premium
## 4398     FRENCH         YOUNG FAMILIES          Premium
## 4399 WOOLWORTHS               RETIREES       Mainstream
## 4400        CCS               RETIREES       Mainstream
## 4401     KETTLE               RETIREES       Mainstream
## 4402     SMITHS               RETIREES       Mainstream
## 4403  INFUZIONS               RETIREES       Mainstream
## 4404      THINS               RETIREES       Mainstream
## 4405      GRAIN         YOUNG FAMILIES       Mainstream
## 4406   TOSTITOS         YOUNG FAMILIES       Mainstream
## 4407    DORITOS         YOUNG FAMILIES       Mainstream
## 4408         WW         YOUNG FAMILIES       Mainstream
## 4409    CHEETOS               RETIREES       Mainstream
## 4410        RRD               RETIREES       Mainstream
## 4411         WW               RETIREES       Mainstream
## 4412      GRAIN               RETIREES       Mainstream
## 4413  INFUZIONS               RETIREES       Mainstream
## 4414     SMITHS               RETIREES       Mainstream
## 4415     KETTLE               RETIREES       Mainstream
## 4416   PRINGLES               RETIREES       Mainstream
## 4417     KETTLE               RETIREES       Mainstream
## 4418   TWISTIES               RETIREES       Mainstream
## 4419   TOSTITOS               RETIREES       Mainstream
## 4420   TYRRELLS               RETIREES       Mainstream
## 4421        CCS         YOUNG FAMILIES          Premium
## 4422     SMITHS         YOUNG FAMILIES          Premium
## 4423     KETTLE         YOUNG FAMILIES          Premium
## 4424   PRINGLES         YOUNG FAMILIES          Premium
## 4425    GRNWVES         YOUNG FAMILIES          Premium
## 4426   TWISTIES         YOUNG FAMILIES          Premium
## 4427       COBS  OLDER SINGLES/COUPLES           Budget
## 4428  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 4429     KETTLE  OLDER SINGLES/COUPLES           Budget
## 4430    NATURAL  OLDER SINGLES/COUPLES           Budget
## 4431        RRD  OLDER SINGLES/COUPLES           Budget
## 4432     KETTLE  OLDER SINGLES/COUPLES           Budget
## 4433     KETTLE  OLDER SINGLES/COUPLES          Premium
## 4434       COBS  OLDER SINGLES/COUPLES          Premium
## 4435     KETTLE  OLDER SINGLES/COUPLES          Premium
## 4436     KETTLE  OLDER SINGLES/COUPLES          Premium
## 4437     SMITHS  OLDER SINGLES/COUPLES          Premium
## 4438      THINS  OLDER SINGLES/COUPLES          Premium
## 4439        RRD  OLDER SINGLES/COUPLES          Premium
## 4440    DORITOS  OLDER SINGLES/COUPLES          Premium
## 4441         WW         YOUNG FAMILIES       Mainstream
## 4442     SMITHS         YOUNG FAMILIES       Mainstream
## 4443        RED         YOUNG FAMILIES       Mainstream
## 4444   TWISTIES         YOUNG FAMILIES       Mainstream
## 4445     SMITHS         YOUNG FAMILIES       Mainstream
## 4446      GRAIN         YOUNG FAMILIES       Mainstream
## 4447     KETTLE         YOUNG FAMILIES       Mainstream
## 4448     SMITHS         OLDER FAMILIES       Mainstream
## 4449 WOOLWORTHS         OLDER FAMILIES       Mainstream
## 4450    DORITOS         OLDER FAMILIES       Mainstream
## 4451   TOSTITOS         OLDER FAMILIES       Mainstream
## 4452  INFUZIONS         OLDER FAMILIES       Mainstream
## 4453    NATURAL         OLDER FAMILIES       Mainstream
## 4454   CHEEZELS         OLDER FAMILIES       Mainstream
## 4455         WW         OLDER FAMILIES       Mainstream
## 4456     KETTLE         OLDER FAMILIES       Mainstream
## 4457     DORITO         OLDER FAMILIES          Premium
## 4458     FRENCH         OLDER FAMILIES          Premium
## 4459   TOSTITOS         OLDER FAMILIES          Premium
## 4460     KETTLE         OLDER FAMILIES          Premium
## 4461     KETTLE         OLDER FAMILIES          Premium
## 4462        RRD         OLDER FAMILIES          Premium
## 4463    DORITOS         OLDER FAMILIES          Premium
## 4464      SNBTS         OLDER FAMILIES          Premium
## 4465   TOSTITOS         OLDER FAMILIES          Premium
## 4466         WW         YOUNG FAMILIES           Budget
## 4467   TOSTITOS         YOUNG FAMILIES           Budget
## 4468     SMITHS         YOUNG FAMILIES           Budget
## 4469        NCC         YOUNG FAMILIES           Budget
## 4470     SMITHS  OLDER SINGLES/COUPLES           Budget
## 4471     KETTLE  OLDER SINGLES/COUPLES           Budget
## 4472  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 4473        NCC  OLDER SINGLES/COUPLES           Budget
## 4474        RRD  OLDER SINGLES/COUPLES           Budget
## 4475    NATURAL         OLDER FAMILIES           Budget
## 4476   TWISTIES         OLDER FAMILIES           Budget
## 4477    CHEETOS         OLDER FAMILIES           Budget
## 4478        RRD         OLDER FAMILIES           Budget
## 4479    DORITOS         OLDER FAMILIES           Budget
## 4480     KETTLE         OLDER FAMILIES           Budget
## 4481    NATURAL         OLDER FAMILIES           Budget
## 4482     KETTLE         YOUNG FAMILIES           Budget
## 4483     KETTLE         YOUNG FAMILIES           Budget
## 4484     KETTLE         YOUNG FAMILIES           Budget
## 4485   TYRRELLS         YOUNG FAMILIES           Budget
## 4486    DORITOS         YOUNG FAMILIES           Budget
## 4487    DORITOS         YOUNG FAMILIES           Budget
## 4488 WOOLWORTHS         YOUNG FAMILIES           Budget
## 4489   PRINGLES               RETIREES       Mainstream
## 4490     SMITHS               RETIREES       Mainstream
## 4491   PRINGLES               RETIREES       Mainstream
## 4492    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 4493     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 4494  INFUZIONS         OLDER FAMILIES       Mainstream
## 4495     SMITHS         OLDER FAMILIES       Mainstream
## 4496        RED         OLDER FAMILIES       Mainstream
## 4497     SMITHS         OLDER FAMILIES       Mainstream
## 4498   SUNBITES         OLDER FAMILIES       Mainstream
## 4499  INFUZIONS         OLDER FAMILIES       Mainstream
## 4500   PRINGLES         OLDER FAMILIES       Mainstream
## 4501     BURGER         OLDER FAMILIES       Mainstream
## 4502    NATURAL         OLDER FAMILIES       Mainstream
## 4503       COBS         YOUNG FAMILIES           Budget
## 4504   PRINGLES         YOUNG FAMILIES           Budget
## 4505     SMITHS         YOUNG FAMILIES           Budget
## 4506  INFUZIONS         YOUNG FAMILIES           Budget
## 4507         WW         YOUNG FAMILIES           Budget
## 4508    DORITOS         YOUNG FAMILIES           Budget
## 4509        RRD         YOUNG FAMILIES           Budget
## 4510  INFUZIONS         YOUNG FAMILIES           Budget
## 4511     SMITHS MIDAGE SINGLES/COUPLES           Budget
## 4512  INFUZIONS MIDAGE SINGLES/COUPLES           Budget
## 4513     SMITHS         OLDER FAMILIES          Premium
## 4514        NCC         OLDER FAMILIES          Premium
## 4515     KETTLE         OLDER FAMILIES           Budget
## 4516      THINS         OLDER FAMILIES           Budget
## 4517     SMITHS         OLDER FAMILIES           Budget
## 4518     KETTLE  OLDER SINGLES/COUPLES          Premium
## 4519    CHEETOS  OLDER SINGLES/COUPLES          Premium
## 4520     KETTLE  OLDER SINGLES/COUPLES          Premium
## 4521   CHEEZELS  OLDER SINGLES/COUPLES          Premium
## 4522     SMITHS               RETIREES       Mainstream
## 4523   PRINGLES               RETIREES       Mainstream
## 4524        RRD               RETIREES       Mainstream
## 4525        RRD               RETIREES       Mainstream
## 4526        RRD               RETIREES       Mainstream
## 4527    NATURAL         OLDER FAMILIES           Budget
## 4528     KETTLE         OLDER FAMILIES           Budget
## 4529         WW         OLDER FAMILIES           Budget
## 4530      THINS         OLDER FAMILIES           Budget
## 4531     SMITHS         OLDER FAMILIES           Budget
## 4532      SNBTS         OLDER FAMILIES           Budget
## 4533     KETTLE         OLDER FAMILIES           Budget
## 4534   CHEEZELS         OLDER FAMILIES           Budget
## 4535    DORITOS         OLDER FAMILIES           Budget
## 4536         WW  OLDER SINGLES/COUPLES          Premium
## 4537 WOOLWORTHS  OLDER SINGLES/COUPLES          Premium
## 4538        CCS  OLDER SINGLES/COUPLES          Premium
## 4539       COBS  OLDER SINGLES/COUPLES          Premium
## 4540         WW  OLDER SINGLES/COUPLES          Premium
## 4541        CCS         YOUNG FAMILIES           Budget
## 4542         WW         YOUNG FAMILIES           Budget
## 4543    NATURAL         YOUNG FAMILIES           Budget
## 4544     KETTLE         YOUNG FAMILIES           Budget
## 4545   PRINGLES         YOUNG FAMILIES           Budget
## 4546    CHEETOS         YOUNG FAMILIES           Budget
## 4547   PRINGLES         YOUNG FAMILIES           Budget
## 4548       COBS         YOUNG FAMILIES           Budget
## 4549   SUNBITES         YOUNG FAMILIES           Budget
## 4550     SMITHS         YOUNG FAMILIES           Budget
## 4551    DORITOS         YOUNG FAMILIES           Budget
## 4552      THINS  OLDER SINGLES/COUPLES          Premium
## 4553      GRAIN  OLDER SINGLES/COUPLES          Premium
## 4554   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 4555    NATURAL  YOUNG SINGLES/COUPLES           Budget
## 4556    NATURAL  YOUNG SINGLES/COUPLES           Budget
## 4557        RED  YOUNG SINGLES/COUPLES           Budget
## 4558   TYRRELLS               RETIREES           Budget
## 4559    DORITOS               RETIREES           Budget
## 4560      THINS               RETIREES           Budget
## 4561   TOSTITOS               RETIREES           Budget
## 4562       COBS               RETIREES           Budget
## 4563   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 4564      SMITH  OLDER SINGLES/COUPLES       Mainstream
## 4565 WOOLWORTHS  OLDER SINGLES/COUPLES       Mainstream
## 4566   PRINGLES               RETIREES       Mainstream
## 4567        RRD               RETIREES       Mainstream
## 4568         WW               RETIREES       Mainstream
## 4569     SMITHS  OLDER SINGLES/COUPLES           Budget
## 4570     SMITHS  OLDER SINGLES/COUPLES           Budget
## 4571      GRAIN         YOUNG FAMILIES       Mainstream
## 4572        RED         YOUNG FAMILIES       Mainstream
## 4573    NATURAL         YOUNG FAMILIES       Mainstream
## 4574   TWISTIES         YOUNG FAMILIES       Mainstream
## 4575     SMITHS         YOUNG FAMILIES       Mainstream
## 4576   PRINGLES         YOUNG FAMILIES       Mainstream
## 4577     SMITHS         YOUNG FAMILIES       Mainstream
## 4578      GRAIN         OLDER FAMILIES           Budget
## 4579        RED         OLDER FAMILIES           Budget
## 4580         WW         OLDER FAMILIES           Budget
## 4581   TWISTIES         OLDER FAMILIES           Budget
## 4582        RRD         OLDER FAMILIES           Budget
## 4583  INFUZIONS         OLDER FAMILIES           Budget
## 4584   TOSTITOS         OLDER FAMILIES           Budget
## 4585    DORITOS         OLDER FAMILIES           Budget
## 4586     KETTLE         YOUNG FAMILIES          Premium
## 4587        RRD         YOUNG FAMILIES          Premium
## 4588     DORITO         YOUNG FAMILIES          Premium
## 4589     SMITHS         YOUNG FAMILIES          Premium
## 4590         WW         YOUNG FAMILIES          Premium
## 4591        RED         YOUNG FAMILIES          Premium
## 4592   TOSTITOS         YOUNG FAMILIES          Premium
## 4593      THINS         YOUNG FAMILIES          Premium
## 4594        CCS  YOUNG SINGLES/COUPLES           Budget
## 4595     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 4596    CHEETOS  YOUNG SINGLES/COUPLES           Budget
## 4597         WW  YOUNG SINGLES/COUPLES           Budget
## 4598     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 4599    NATURAL         OLDER FAMILIES          Premium
## 4600        RRD         OLDER FAMILIES          Premium
## 4601   TWISTIES         OLDER FAMILIES          Premium
## 4602         WW         OLDER FAMILIES          Premium
## 4603   PRINGLES         OLDER FAMILIES          Premium
## 4604     SMITHS         OLDER FAMILIES          Premium
## 4605    CHEETOS         OLDER FAMILIES          Premium
## 4606   TWISTIES         OLDER FAMILIES          Premium
## 4607      GRAIN         OLDER FAMILIES          Premium
## 4608   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 4609  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 4610     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 4611      GRAIN  OLDER SINGLES/COUPLES       Mainstream
## 4612     SMITHS  YOUNG SINGLES/COUPLES          Premium
## 4613        RRD  YOUNG SINGLES/COUPLES          Premium
## 4614    NATURAL  YOUNG SINGLES/COUPLES          Premium
## 4615       COBS  YOUNG SINGLES/COUPLES          Premium
## 4616      GRAIN         OLDER FAMILIES       Mainstream
## 4617     SMITHS         OLDER FAMILIES       Mainstream
## 4618     KETTLE         OLDER FAMILIES       Mainstream
## 4619     KETTLE         OLDER FAMILIES       Mainstream
## 4620   TWISTIES         OLDER FAMILIES       Mainstream
## 4621     SMITHS MIDAGE SINGLES/COUPLES           Budget
## 4622     SMITHS MIDAGE SINGLES/COUPLES           Budget
## 4623        RRD MIDAGE SINGLES/COUPLES           Budget
## 4624        RRD MIDAGE SINGLES/COUPLES           Budget
## 4625   TOSTITOS MIDAGE SINGLES/COUPLES           Budget
## 4626         WW MIDAGE SINGLES/COUPLES           Budget
## 4627    GRNWVES               RETIREES           Budget
## 4628   PRINGLES               RETIREES           Budget
## 4629         WW               RETIREES           Budget
## 4630      THINS               RETIREES           Budget
## 4631   SUNBITES               RETIREES           Budget
## 4632         WW               RETIREES           Budget
## 4633         WW               RETIREES       Mainstream
## 4634   PRINGLES               RETIREES       Mainstream
## 4635        CCS               RETIREES       Mainstream
## 4636    NATURAL               RETIREES           Budget
## 4637  INFUZIONS               RETIREES           Budget
## 4638     SMITHS               RETIREES           Budget
## 4639     SMITHS               RETIREES           Budget
## 4640    NATURAL               RETIREES           Budget
## 4641   PRINGLES               RETIREES           Budget
## 4642    DORITOS           NEW FAMILIES           Budget
## 4643         WW           NEW FAMILIES           Budget
## 4644        RRD           NEW FAMILIES           Budget
## 4645   PRINGLES           NEW FAMILIES           Budget
## 4646   PRINGLES         OLDER FAMILIES       Mainstream
## 4647    GRNWVES         OLDER FAMILIES       Mainstream
## 4648   TWISTIES         OLDER FAMILIES       Mainstream
## 4649  INFUZIONS         OLDER FAMILIES       Mainstream
## 4650     KETTLE         OLDER FAMILIES       Mainstream
## 4651     SMITHS         OLDER FAMILIES       Mainstream
## 4652        RRD         OLDER FAMILIES       Mainstream
## 4653     KETTLE         OLDER FAMILIES       Mainstream
## 4654  INFUZIONS         OLDER FAMILIES       Mainstream
## 4655  INFUZIONS         OLDER FAMILIES       Mainstream
## 4656        RRD         OLDER FAMILIES       Mainstream
## 4657     BURGER         OLDER FAMILIES       Mainstream
## 4658     KETTLE         OLDER FAMILIES       Mainstream
## 4659      GRAIN         OLDER FAMILIES       Mainstream
## 4660     KETTLE         OLDER FAMILIES       Mainstream
## 4661    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 4662         WW  OLDER SINGLES/COUPLES       Mainstream
## 4663      THINS  OLDER SINGLES/COUPLES       Mainstream
## 4664     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 4665    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 4666        RRD  YOUNG SINGLES/COUPLES          Premium
## 4667         WW  YOUNG SINGLES/COUPLES          Premium
## 4668   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 4669       COBS  YOUNG SINGLES/COUPLES          Premium
## 4670         WW  YOUNG SINGLES/COUPLES          Premium
## 4671      GRAIN  YOUNG SINGLES/COUPLES          Premium
## 4672   TWISTIES  YOUNG SINGLES/COUPLES          Premium
## 4673    NATURAL  YOUNG SINGLES/COUPLES          Premium
## 4674        NCC  YOUNG SINGLES/COUPLES          Premium
## 4675     SMITHS  YOUNG SINGLES/COUPLES          Premium
## 4676     KETTLE         YOUNG FAMILIES           Budget
## 4677     SMITHS         YOUNG FAMILIES           Budget
## 4678         WW         YOUNG FAMILIES           Budget
## 4679     SMITHS         YOUNG FAMILIES           Budget
## 4680     SMITHS         YOUNG FAMILIES           Budget
## 4681         WW         YOUNG FAMILIES           Budget
## 4682   PRINGLES         YOUNG FAMILIES           Budget
## 4683   TOSTITOS         YOUNG FAMILIES           Budget
## 4684     FRENCH         YOUNG FAMILIES           Budget
## 4685     SMITHS         YOUNG FAMILIES           Budget
## 4686     SMITHS         YOUNG FAMILIES           Budget
## 4687    NATURAL         YOUNG FAMILIES           Budget
## 4688   TOSTITOS         YOUNG FAMILIES           Budget
## 4689   CHEEZELS         YOUNG FAMILIES           Budget
## 4690   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 4691    CHEETOS MIDAGE SINGLES/COUPLES          Premium
## 4692        RED MIDAGE SINGLES/COUPLES          Premium
## 4693        RED MIDAGE SINGLES/COUPLES          Premium
## 4694      THINS MIDAGE SINGLES/COUPLES          Premium
## 4695         WW         OLDER FAMILIES           Budget
## 4696     KETTLE         OLDER FAMILIES           Budget
## 4697     KETTLE         OLDER FAMILIES           Budget
## 4698     SMITHS         OLDER FAMILIES           Budget
## 4699   SUNBITES         OLDER FAMILIES           Budget
## 4700        RRD         OLDER FAMILIES           Budget
## 4701     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 4702     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 4703   SUNBITES MIDAGE SINGLES/COUPLES       Mainstream
## 4704     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 4705    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 4706   TWISTIES MIDAGE SINGLES/COUPLES       Mainstream
## 4707    CHEETOS MIDAGE SINGLES/COUPLES       Mainstream
## 4708     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 4709       COBS MIDAGE SINGLES/COUPLES       Mainstream
## 4710      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 4711    NATURAL  YOUNG SINGLES/COUPLES       Mainstream
## 4712     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 4713     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 4714   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 4715    CHEETOS  YOUNG SINGLES/COUPLES       Mainstream
## 4716   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 4717   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 4718     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 4719      SMITH MIDAGE SINGLES/COUPLES       Mainstream
## 4720      SMITH MIDAGE SINGLES/COUPLES       Mainstream
## 4721   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 4722     KETTLE         YOUNG FAMILIES          Premium
## 4723  INFUZIONS         YOUNG FAMILIES          Premium
## 4724   PRINGLES         YOUNG FAMILIES          Premium
## 4725    DORITOS         YOUNG FAMILIES          Premium
## 4726     SMITHS         YOUNG FAMILIES          Premium
## 4727         WW MIDAGE SINGLES/COUPLES          Premium
## 4728   TWISTIES MIDAGE SINGLES/COUPLES          Premium
## 4729   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 4730       COBS MIDAGE SINGLES/COUPLES          Premium
## 4731   TOSTITOS         YOUNG FAMILIES           Budget
## 4732        RRD         YOUNG FAMILIES           Budget
## 4733     SMITHS         YOUNG FAMILIES           Budget
## 4734     SMITHS         YOUNG FAMILIES           Budget
## 4735    DORITOS         YOUNG FAMILIES           Budget
## 4736    NATURAL         YOUNG FAMILIES           Budget
## 4737        CCS         YOUNG FAMILIES           Budget
## 4738    DORITOS         YOUNG FAMILIES           Budget
## 4739   TYRRELLS  YOUNG SINGLES/COUPLES          Premium
## 4740   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 4741      GRAIN  YOUNG SINGLES/COUPLES          Premium
## 4742         WW  YOUNG SINGLES/COUPLES          Premium
## 4743     SMITHS               RETIREES       Mainstream
## 4744        RRD               RETIREES       Mainstream
## 4745  INFUZIONS               RETIREES       Mainstream
## 4746     SMITHS               RETIREES       Mainstream
## 4747   TOSTITOS               RETIREES       Mainstream
## 4748     KETTLE               RETIREES       Mainstream
## 4749        RED MIDAGE SINGLES/COUPLES           Budget
## 4750        CCS MIDAGE SINGLES/COUPLES           Budget
## 4751       COBS MIDAGE SINGLES/COUPLES           Budget
## 4752   TOSTITOS MIDAGE SINGLES/COUPLES           Budget
## 4753   SUNBITES MIDAGE SINGLES/COUPLES           Budget
## 4754     SMITHS MIDAGE SINGLES/COUPLES           Budget
## 4755     SMITHS MIDAGE SINGLES/COUPLES           Budget
## 4756    CHEETOS MIDAGE SINGLES/COUPLES       Mainstream
## 4757    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 4758      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 4759   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 4760   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 4761     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 4762   TYRRELLS MIDAGE SINGLES/COUPLES       Mainstream
## 4763     DORITO MIDAGE SINGLES/COUPLES       Mainstream
## 4764        RRD MIDAGE SINGLES/COUPLES       Mainstream
## 4765   TOSTITOS               RETIREES       Mainstream
## 4766  INFUZIONS               RETIREES       Mainstream
## 4767     SMITHS               RETIREES       Mainstream
## 4768      THINS               RETIREES       Mainstream
## 4769   TWISTIES               RETIREES       Mainstream
## 4770    DORITOS               RETIREES       Mainstream
## 4771         WW  OLDER SINGLES/COUPLES          Premium
## 4772         WW  OLDER SINGLES/COUPLES          Premium
## 4773     DORITO  OLDER SINGLES/COUPLES          Premium
## 4774        RRD  OLDER SINGLES/COUPLES          Premium
## 4775      SMITH  YOUNG SINGLES/COUPLES       Mainstream
## 4776      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 4777     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 4778     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 4779        NCC  YOUNG SINGLES/COUPLES       Mainstream
## 4780    DORITOS               RETIREES          Premium
## 4781     SMITHS               RETIREES          Premium
## 4782  INFUZIONS               RETIREES          Premium
## 4783     SMITHS               RETIREES          Premium
## 4784     INFZNS  OLDER SINGLES/COUPLES          Premium
## 4785         WW  OLDER SINGLES/COUPLES          Premium
## 4786     DORITO  OLDER SINGLES/COUPLES          Premium
## 4787    DORITOS  OLDER SINGLES/COUPLES          Premium
## 4788    NATURAL         OLDER FAMILIES           Budget
## 4789     SMITHS         OLDER FAMILIES           Budget
## 4790        RED         OLDER FAMILIES           Budget
## 4791  INFUZIONS         OLDER FAMILIES           Budget
## 4792    NATURAL         OLDER FAMILIES           Budget
## 4793   PRINGLES         OLDER FAMILIES           Budget
## 4794     SMITHS         OLDER FAMILIES       Mainstream
## 4795         WW         OLDER FAMILIES       Mainstream
## 4796     KETTLE         OLDER FAMILIES       Mainstream
## 4797  INFUZIONS         OLDER FAMILIES       Mainstream
## 4798     BURGER         YOUNG FAMILIES           Budget
## 4799     SMITHS         YOUNG FAMILIES           Budget
## 4800     KETTLE         YOUNG FAMILIES           Budget
## 4801     SMITHS         YOUNG FAMILIES           Budget
## 4802        RED         YOUNG FAMILIES           Budget
## 4803     INFZNS         YOUNG FAMILIES           Budget
## 4804   PRINGLES         YOUNG FAMILIES           Budget
## 4805    DORITOS         YOUNG FAMILIES           Budget
## 4806   CHEEZELS         YOUNG FAMILIES           Budget
## 4807      GRAIN         YOUNG FAMILIES           Budget
## 4808        NCC               RETIREES       Mainstream
## 4809      THINS               RETIREES       Mainstream
## 4810        RRD               RETIREES       Mainstream
## 4811   PRINGLES         YOUNG FAMILIES           Budget
## 4812     KETTLE         YOUNG FAMILIES           Budget
## 4813      GRAIN         YOUNG FAMILIES           Budget
## 4814   TWISTIES         YOUNG FAMILIES           Budget
## 4815     SMITHS         YOUNG FAMILIES           Budget
## 4816         WW         YOUNG FAMILIES           Budget
## 4817         WW         YOUNG FAMILIES           Budget
## 4818   PRINGLES         OLDER FAMILIES       Mainstream
## 4819     SMITHS         OLDER FAMILIES       Mainstream
## 4820  INFUZIONS         OLDER FAMILIES       Mainstream
## 4821     FRENCH         OLDER FAMILIES       Mainstream
## 4822     INFZNS         YOUNG FAMILIES       Mainstream
## 4823        NCC         YOUNG FAMILIES       Mainstream
## 4824        RED  YOUNG SINGLES/COUPLES           Budget
## 4825        RRD  YOUNG SINGLES/COUPLES           Budget
## 4826 WOOLWORTHS           NEW FAMILIES           Budget
## 4827      SNBTS           NEW FAMILIES           Budget
## 4828     DORITO           NEW FAMILIES           Budget
## 4829     INFZNS           NEW FAMILIES           Budget
## 4830    DORITOS           NEW FAMILIES           Budget
## 4831        RED           NEW FAMILIES           Budget
## 4832   TYRRELLS           NEW FAMILIES           Budget
## 4833     INFZNS               RETIREES       Mainstream
## 4834     KETTLE               RETIREES       Mainstream
## 4835      SNBTS               RETIREES       Mainstream
## 4836    DORITOS               RETIREES       Mainstream
## 4837    NATURAL               RETIREES       Mainstream
## 4838      GRAIN         YOUNG FAMILIES          Premium
## 4839   PRINGLES         YOUNG FAMILIES          Premium
## 4840     KETTLE         YOUNG FAMILIES          Premium
## 4841        RED         YOUNG FAMILIES          Premium
## 4842     SMITHS         YOUNG FAMILIES          Premium
## 4843   CHEEZELS         OLDER FAMILIES          Premium
## 4844  INFUZIONS         OLDER FAMILIES          Premium
## 4845    DORITOS         OLDER FAMILIES          Premium
## 4846  INFUZIONS         OLDER FAMILIES          Premium
## 4847        RRD         OLDER FAMILIES          Premium
## 4848      THINS         OLDER FAMILIES          Premium
## 4849     KETTLE  OLDER SINGLES/COUPLES           Budget
## 4850       COBS  OLDER SINGLES/COUPLES           Budget
## 4851      THINS  OLDER SINGLES/COUPLES           Budget
## 4852   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 4853   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 4854     KETTLE  OLDER SINGLES/COUPLES           Budget
## 4855   TOSTITOS         YOUNG FAMILIES           Budget
## 4856   PRINGLES         YOUNG FAMILIES           Budget
## 4857     SMITHS         YOUNG FAMILIES           Budget
## 4858       COBS         OLDER FAMILIES           Budget
## 4859     SMITHS         OLDER FAMILIES           Budget
## 4860        RRD         OLDER FAMILIES           Budget
## 4861     KETTLE         OLDER FAMILIES           Budget
## 4862   PRINGLES         OLDER FAMILIES           Budget
## 4863     KETTLE         OLDER FAMILIES           Budget
## 4864    NATURAL         OLDER FAMILIES           Budget
## 4865   PRINGLES         OLDER FAMILIES           Budget
## 4866      THINS         OLDER FAMILIES           Budget
## 4867        RRD         OLDER FAMILIES           Budget
## 4868     SMITHS         OLDER FAMILIES          Premium
## 4869        RRD         OLDER FAMILIES          Premium
## 4870   TYRRELLS         OLDER FAMILIES          Premium
## 4871     SMITHS         OLDER FAMILIES          Premium
## 4872      THINS         OLDER FAMILIES          Premium
## 4873        RRD         OLDER FAMILIES          Premium
## 4874     KETTLE         OLDER FAMILIES          Premium
## 4875        CCS         YOUNG FAMILIES           Budget
## 4876        RRD         YOUNG FAMILIES           Budget
## 4877    NATURAL         YOUNG FAMILIES       Mainstream
## 4878         WW         YOUNG FAMILIES       Mainstream
## 4879   TYRRELLS         YOUNG FAMILIES       Mainstream
## 4880     KETTLE         YOUNG FAMILIES       Mainstream
## 4881     KETTLE         YOUNG FAMILIES       Mainstream
## 4882     KETTLE         YOUNG FAMILIES       Mainstream
## 4883      THINS         YOUNG FAMILIES       Mainstream
## 4884   TWISTIES         YOUNG FAMILIES          Premium
## 4885     SMITHS         YOUNG FAMILIES          Premium
## 4886    DORITOS         YOUNG FAMILIES          Premium
## 4887      SNBTS         YOUNG FAMILIES          Premium
## 4888     KETTLE         YOUNG FAMILIES          Premium
## 4889     INFZNS         YOUNG FAMILIES          Premium
## 4890   PRINGLES         YOUNG FAMILIES          Premium
## 4891        CCS         YOUNG FAMILIES          Premium
## 4892        CCS  OLDER SINGLES/COUPLES           Budget
## 4893     SMITHS  OLDER SINGLES/COUPLES           Budget
## 4894        RRD  OLDER SINGLES/COUPLES           Budget
## 4895   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 4896      THINS         OLDER FAMILIES       Mainstream
## 4897    NATURAL         OLDER FAMILIES       Mainstream
## 4898        CCS         OLDER FAMILIES       Mainstream
## 4899        CCS  OLDER SINGLES/COUPLES           Budget
## 4900      GRAIN  OLDER SINGLES/COUPLES           Budget
## 4901   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 4902   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 4903     SMITHS  OLDER SINGLES/COUPLES           Budget
## 4904   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 4905         WW               RETIREES           Budget
## 4906      SMITH               RETIREES           Budget
## 4907    CHEETOS               RETIREES           Budget
## 4908  INFUZIONS               RETIREES           Budget
## 4909     SMITHS               RETIREES           Budget
## 4910   TYRRELLS               RETIREES           Budget
## 4911     SMITHS               RETIREES           Budget
## 4912     KETTLE               RETIREES           Budget
## 4913      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 4914  INFUZIONS         OLDER FAMILIES       Mainstream
## 4915     KETTLE         OLDER FAMILIES       Mainstream
## 4916   PRINGLES         OLDER FAMILIES       Mainstream
## 4917   PRINGLES         OLDER FAMILIES       Mainstream
## 4918     SMITHS         OLDER FAMILIES       Mainstream
## 4919      GRAIN         OLDER FAMILIES       Mainstream
## 4920     DORITO         OLDER FAMILIES       Mainstream
## 4921     KETTLE         OLDER FAMILIES       Mainstream
## 4922     DORITO         OLDER FAMILIES       Mainstream
## 4923        RRD         OLDER FAMILIES       Mainstream
## 4924     SMITHS         OLDER FAMILIES       Mainstream
## 4925   TOSTITOS         OLDER FAMILIES       Mainstream
## 4926      THINS         OLDER FAMILIES       Mainstream
## 4927      THINS         OLDER FAMILIES       Mainstream
## 4928     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 4929      SMITH MIDAGE SINGLES/COUPLES       Mainstream
## 4930       COBS MIDAGE SINGLES/COUPLES       Mainstream
## 4931     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 4932   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 4933        CCS MIDAGE SINGLES/COUPLES       Mainstream
## 4934     INFZNS         OLDER FAMILIES       Mainstream
## 4935   TOSTITOS         OLDER FAMILIES       Mainstream
## 4936         WW         OLDER FAMILIES       Mainstream
## 4937      THINS         OLDER FAMILIES       Mainstream
## 4938    CHEETOS         YOUNG FAMILIES           Budget
## 4939     KETTLE         YOUNG FAMILIES           Budget
## 4940    DORITOS         YOUNG FAMILIES           Budget
## 4941         WW         YOUNG FAMILIES           Budget
## 4942     SMITHS         YOUNG FAMILIES           Budget
## 4943        RED         YOUNG FAMILIES           Budget
## 4944     KETTLE         YOUNG FAMILIES           Budget
## 4945      THINS         YOUNG FAMILIES           Budget
## 4946   SUNBITES  OLDER SINGLES/COUPLES       Mainstream
## 4947     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 4948        NCC  OLDER SINGLES/COUPLES       Mainstream
## 4949        RRD         OLDER FAMILIES          Premium
## 4950     SMITHS         OLDER FAMILIES          Premium
## 4951  INFUZIONS         OLDER FAMILIES          Premium
## 4952    NATURAL         OLDER FAMILIES          Premium
## 4953        RED         OLDER FAMILIES          Premium
## 4954   PRINGLES         OLDER FAMILIES          Premium
## 4955        RRD         OLDER FAMILIES          Premium
## 4956   CHEEZELS         OLDER FAMILIES          Premium
## 4957  INFUZIONS         OLDER FAMILIES          Premium
## 4958   TWISTIES         OLDER FAMILIES          Premium
## 4959    CHEETOS  YOUNG SINGLES/COUPLES       Mainstream
## 4960    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 4961         WW MIDAGE SINGLES/COUPLES          Premium
## 4962     BURGER MIDAGE SINGLES/COUPLES          Premium
## 4963         WW MIDAGE SINGLES/COUPLES          Premium
## 4964        RRD MIDAGE SINGLES/COUPLES          Premium
## 4965         WW MIDAGE SINGLES/COUPLES          Premium
## 4966    CHEETOS  OLDER SINGLES/COUPLES          Premium
## 4967     KETTLE  OLDER SINGLES/COUPLES          Premium
## 4968        RED  OLDER SINGLES/COUPLES          Premium
## 4969        CCS  OLDER SINGLES/COUPLES          Premium
## 4970     SMITHS  OLDER SINGLES/COUPLES          Premium
## 4971   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 4972   TOSTITOS         YOUNG FAMILIES          Premium
## 4973    DORITOS         YOUNG FAMILIES          Premium
## 4974     SMITHS         YOUNG FAMILIES          Premium
## 4975      THINS         YOUNG FAMILIES          Premium
## 4976        RRD         YOUNG FAMILIES          Premium
## 4977    NATURAL         YOUNG FAMILIES          Premium
## 4978    DORITOS         YOUNG FAMILIES          Premium
## 4979     KETTLE         YOUNG FAMILIES          Premium
## 4980        RED         YOUNG FAMILIES          Premium
## 4981     KETTLE         OLDER FAMILIES           Budget
## 4982         WW         OLDER FAMILIES           Budget
## 4983      SMITH         OLDER FAMILIES           Budget
## 4984      THINS         OLDER FAMILIES           Budget
## 4985        NCC         OLDER FAMILIES           Budget
## 4986    DORITOS         OLDER FAMILIES           Budget
## 4987     KETTLE         OLDER FAMILIES           Budget
## 4988        RRD         OLDER FAMILIES           Budget
## 4989      GRAIN         OLDER FAMILIES           Budget
## 4990     SMITHS         OLDER FAMILIES           Budget
## 4991        RRD         OLDER FAMILIES           Budget
## 4992        RRD         YOUNG FAMILIES       Mainstream
## 4993     SMITHS         YOUNG FAMILIES       Mainstream
## 4994    DORITOS         YOUNG FAMILIES       Mainstream
## 4995   PRINGLES         YOUNG FAMILIES       Mainstream
## 4996     SMITHS         YOUNG FAMILIES       Mainstream
## 4997        RRD         YOUNG FAMILIES       Mainstream
## 4998      SMITH         YOUNG FAMILIES       Mainstream
## 4999   PRINGLES         YOUNG FAMILIES           Budget
## 5000     SMITHS         YOUNG FAMILIES           Budget
## 5001     SMITHS         YOUNG FAMILIES          Premium
## 5002   CHEEZELS         YOUNG FAMILIES          Premium
## 5003   TOSTITOS         YOUNG FAMILIES          Premium
## 5004     KETTLE         YOUNG FAMILIES          Premium
## 5005      THINS         YOUNG FAMILIES          Premium
## 5006     KETTLE         YOUNG FAMILIES          Premium
## 5007      SMITH         YOUNG FAMILIES          Premium
## 5008    DORITOS         YOUNG FAMILIES          Premium
## 5009        CCS  YOUNG SINGLES/COUPLES       Mainstream
## 5010        RRD  YOUNG SINGLES/COUPLES       Mainstream
## 5011      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 5012     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 5013    CHEETOS  YOUNG SINGLES/COUPLES       Mainstream
## 5014   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 5015        RED  YOUNG SINGLES/COUPLES       Mainstream
## 5016     DORITO  OLDER SINGLES/COUPLES       Mainstream
## 5017    NATURAL  OLDER SINGLES/COUPLES       Mainstream
## 5018         WW  OLDER SINGLES/COUPLES       Mainstream
## 5019   TYRRELLS MIDAGE SINGLES/COUPLES       Mainstream
## 5020        CCS MIDAGE SINGLES/COUPLES       Mainstream
## 5021        RRD MIDAGE SINGLES/COUPLES       Mainstream
## 5022       COBS               RETIREES          Premium
## 5023     SMITHS               RETIREES          Premium
## 5024        RED               RETIREES          Premium
## 5025     KETTLE               RETIREES          Premium
## 5026     KETTLE               RETIREES          Premium
## 5027     INFZNS MIDAGE SINGLES/COUPLES          Premium
## 5028       COBS MIDAGE SINGLES/COUPLES          Premium
## 5029   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 5030    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 5031   PRINGLES         OLDER FAMILIES       Mainstream
## 5032     SMITHS         OLDER FAMILIES       Mainstream
## 5033   PRINGLES         OLDER FAMILIES       Mainstream
## 5034        RED         OLDER FAMILIES       Mainstream
## 5035        RRD         OLDER FAMILIES       Mainstream
## 5036   TWISTIES         OLDER FAMILIES       Mainstream
## 5037     KETTLE         OLDER FAMILIES       Mainstream
## 5038     KETTLE  OLDER SINGLES/COUPLES          Premium
## 5039      THINS  OLDER SINGLES/COUPLES          Premium
## 5040     SMITHS  OLDER SINGLES/COUPLES          Premium
## 5041   CHEEZELS               RETIREES           Budget
## 5042         WW               RETIREES           Budget
## 5043    GRNWVES               RETIREES           Budget
## 5044        RRD               RETIREES           Budget
## 5045      THINS               RETIREES           Budget
## 5046        RRD               RETIREES           Budget
## 5047   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 5048        RRD  OLDER SINGLES/COUPLES           Budget
## 5049   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 5050  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 5051        NCC  OLDER SINGLES/COUPLES           Budget
## 5052    NATURAL  OLDER SINGLES/COUPLES           Budget
## 5053     BURGER         YOUNG FAMILIES       Mainstream
## 5054     KETTLE         YOUNG FAMILIES       Mainstream
## 5055     KETTLE         YOUNG FAMILIES       Mainstream
## 5056      SMITH         YOUNG FAMILIES       Mainstream
## 5057        RRD         YOUNG FAMILIES       Mainstream
## 5058     KETTLE         YOUNG FAMILIES       Mainstream
## 5059   PRINGLES         YOUNG FAMILIES       Mainstream
## 5060     KETTLE         YOUNG FAMILIES       Mainstream
## 5061         WW         YOUNG FAMILIES       Mainstream
## 5062      SMITH         YOUNG FAMILIES       Mainstream
## 5063      SNBTS         YOUNG FAMILIES       Mainstream
## 5064     KETTLE  OLDER SINGLES/COUPLES          Premium
## 5065     SMITHS  OLDER SINGLES/COUPLES          Premium
## 5066         WW  OLDER SINGLES/COUPLES          Premium
## 5067    NATURAL  OLDER SINGLES/COUPLES          Premium
## 5068    DORITOS         OLDER FAMILIES          Premium
## 5069      THINS         OLDER FAMILIES          Premium
## 5070   TWISTIES         OLDER FAMILIES          Premium
## 5071     SMITHS         OLDER FAMILIES          Premium
## 5072  INFUZIONS         OLDER FAMILIES          Premium
## 5073         WW         OLDER FAMILIES          Premium
## 5074     SMITHS  OLDER SINGLES/COUPLES           Budget
## 5075        RRD  OLDER SINGLES/COUPLES           Budget
## 5076    CHEETOS  OLDER SINGLES/COUPLES           Budget
## 5077  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 5078   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 5079        NCC  OLDER SINGLES/COUPLES           Budget
## 5080     SMITHS  OLDER SINGLES/COUPLES          Premium
## 5081        RRD  OLDER SINGLES/COUPLES          Premium
## 5082     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 5083       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 5084   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 5085     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 5086    NATURAL  YOUNG SINGLES/COUPLES       Mainstream
## 5087     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 5088  INFUZIONS               RETIREES          Premium
## 5089     SMITHS               RETIREES          Premium
## 5090   PRINGLES               RETIREES          Premium
## 5091      SNBTS               RETIREES          Premium
## 5092     SMITHS               RETIREES          Premium
## 5093        CCS               RETIREES          Premium
## 5094   CHEEZELS  YOUNG SINGLES/COUPLES           Budget
## 5095   CHEEZELS  YOUNG SINGLES/COUPLES           Budget
## 5096       COBS               RETIREES           Budget
## 5097       COBS               RETIREES           Budget
## 5098     BURGER               RETIREES           Budget
## 5099     SMITHS               RETIREES           Budget
## 5100     KETTLE               RETIREES           Budget
## 5101 WOOLWORTHS         YOUNG FAMILIES           Budget
## 5102        CCS MIDAGE SINGLES/COUPLES       Mainstream
## 5103        RRD MIDAGE SINGLES/COUPLES       Mainstream
## 5104   TWISTIES MIDAGE SINGLES/COUPLES       Mainstream
## 5105     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 5106     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 5107     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 5108      GRAIN MIDAGE SINGLES/COUPLES       Mainstream
## 5109    NATURAL MIDAGE SINGLES/COUPLES       Mainstream
## 5110   SUNBITES         YOUNG FAMILIES           Budget
## 5111        RRD         YOUNG FAMILIES           Budget
## 5112      GRAIN         YOUNG FAMILIES           Budget
## 5113        CCS         YOUNG FAMILIES           Budget
## 5114    DORITOS         YOUNG FAMILIES           Budget
## 5115    NATURAL         YOUNG FAMILIES           Budget
## 5116    DORITOS         YOUNG FAMILIES           Budget
## 5117     SMITHS         YOUNG FAMILIES           Budget
## 5118      GRAIN         YOUNG FAMILIES           Budget
## 5119     KETTLE         YOUNG FAMILIES           Budget
## 5120      GRAIN MIDAGE SINGLES/COUPLES          Premium
## 5121     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 5122     INFZNS MIDAGE SINGLES/COUPLES          Premium
## 5123      SMITH MIDAGE SINGLES/COUPLES          Premium
## 5124         WW MIDAGE SINGLES/COUPLES          Premium
## 5125     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 5126   CHEEZELS  YOUNG SINGLES/COUPLES           Budget
## 5127    CHEETOS  YOUNG SINGLES/COUPLES           Budget
## 5128   SUNBITES  YOUNG SINGLES/COUPLES           Budget
## 5129   TOSTITOS  YOUNG SINGLES/COUPLES           Budget
## 5130   TWISTIES  YOUNG SINGLES/COUPLES           Budget
## 5131        RRD  YOUNG SINGLES/COUPLES           Budget
## 5132   TYRRELLS  YOUNG SINGLES/COUPLES           Budget
## 5133         WW  YOUNG SINGLES/COUPLES           Budget
## 5134         WW         OLDER FAMILIES           Budget
## 5135     SMITHS         OLDER FAMILIES           Budget
## 5136     DORITO         OLDER FAMILIES           Budget
## 5137   SUNBITES         OLDER FAMILIES           Budget
## 5138     SMITHS         OLDER FAMILIES           Budget
## 5139  INFUZIONS         OLDER FAMILIES           Budget
## 5140        RRD         OLDER FAMILIES           Budget
## 5141     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 5142        RRD  YOUNG SINGLES/COUPLES       Mainstream
## 5143    NATURAL  YOUNG SINGLES/COUPLES       Mainstream
## 5144   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 5145     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 5146    NATURAL  YOUNG SINGLES/COUPLES       Mainstream
## 5147    NATURAL  YOUNG SINGLES/COUPLES       Mainstream
## 5148   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 5149  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 5150  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 5151   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 5152   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 5153      SMITH  OLDER SINGLES/COUPLES           Budget
## 5154     SMITHS  OLDER SINGLES/COUPLES           Budget
## 5155     SMITHS               RETIREES          Premium
## 5156     SMITHS               RETIREES          Premium
## 5157   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 5158    NATURAL  OLDER SINGLES/COUPLES          Premium
## 5159    DORITOS  OLDER SINGLES/COUPLES          Premium
## 5160   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 5161   PRINGLES               RETIREES          Premium
## 5162     SMITHS               RETIREES          Premium
## 5163   PRINGLES               RETIREES          Premium
## 5164   PRINGLES               RETIREES          Premium
## 5165    CHEETOS               RETIREES          Premium
## 5166     SMITHS               RETIREES       Mainstream
## 5167    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 5168   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 5169      SNBTS  OLDER SINGLES/COUPLES       Mainstream
## 5170   SUNBITES  OLDER SINGLES/COUPLES       Mainstream
## 5171   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 5172    DORITOS  OLDER SINGLES/COUPLES           Budget
## 5173     KETTLE  OLDER SINGLES/COUPLES           Budget
## 5174      THINS  OLDER SINGLES/COUPLES           Budget
## 5175     KETTLE         OLDER FAMILIES           Budget
## 5176    GRNWVES         OLDER FAMILIES           Budget
## 5177    DORITOS         OLDER FAMILIES           Budget
## 5178     SMITHS         OLDER FAMILIES           Budget
## 5179   PRINGLES         OLDER FAMILIES           Budget
## 5180   CHEEZELS         OLDER FAMILIES           Budget
## 5181    DORITOS         OLDER FAMILIES           Budget
## 5182   CHEEZELS               RETIREES           Budget
## 5183      THINS               RETIREES           Budget
## 5184         WW           NEW FAMILIES       Mainstream
## 5185     SMITHS           NEW FAMILIES       Mainstream
## 5186   CHEEZELS           NEW FAMILIES       Mainstream
## 5187     SMITHS           NEW FAMILIES       Mainstream
## 5188     KETTLE           NEW FAMILIES       Mainstream
## 5189     SMITHS           NEW FAMILIES       Mainstream
## 5190   TWISTIES               RETIREES       Mainstream
## 5191     SMITHS               RETIREES       Mainstream
## 5192  INFUZIONS               RETIREES       Mainstream
## 5193    DORITOS               RETIREES       Mainstream
## 5194     KETTLE         OLDER FAMILIES          Premium
## 5195      THINS         OLDER FAMILIES          Premium
## 5196     KETTLE         OLDER FAMILIES          Premium
## 5197    GRNWVES         OLDER FAMILIES          Premium
## 5198     KETTLE         OLDER FAMILIES          Premium
## 5199        RED               RETIREES           Budget
## 5200     KETTLE               RETIREES           Budget
## 5201         WW               RETIREES           Budget
## 5202     SMITHS               RETIREES           Budget
## 5203        RRD               RETIREES           Budget
## 5204  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 5205         WW  OLDER SINGLES/COUPLES           Budget
## 5206   CHEEZELS  OLDER SINGLES/COUPLES           Budget
## 5207     SMITHS               RETIREES       Mainstream
## 5208   TWISTIES               RETIREES       Mainstream
## 5209         WW               RETIREES       Mainstream
## 5210        NCC  OLDER SINGLES/COUPLES          Premium
## 5211     KETTLE  OLDER SINGLES/COUPLES          Premium
## 5212     SMITHS  OLDER SINGLES/COUPLES          Premium
## 5213        RRD  OLDER SINGLES/COUPLES          Premium
## 5214     SMITHS               RETIREES          Premium
## 5215     KETTLE               RETIREES          Premium
## 5216       COBS               RETIREES          Premium
## 5217   PRINGLES               RETIREES          Premium
## 5218   PRINGLES               RETIREES          Premium
## 5219   TYRRELLS               RETIREES          Premium
## 5220     FRENCH         OLDER FAMILIES           Budget
## 5221     KETTLE         OLDER FAMILIES           Budget
## 5222  INFUZIONS         OLDER FAMILIES           Budget
## 5223   TWISTIES         OLDER FAMILIES           Budget
## 5224      GRAIN         OLDER FAMILIES           Budget
## 5225      THINS  OLDER SINGLES/COUPLES           Budget
## 5226  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 5227       COBS  OLDER SINGLES/COUPLES           Budget
## 5228       COBS  OLDER SINGLES/COUPLES           Budget
## 5229       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 5230    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 5231        RED  YOUNG SINGLES/COUPLES       Mainstream
## 5232   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 5233    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 5234     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 5235   TWISTIES         YOUNG FAMILIES       Mainstream
## 5236    NATURAL         YOUNG FAMILIES       Mainstream
## 5237     KETTLE         YOUNG FAMILIES       Mainstream
## 5238      THINS         YOUNG FAMILIES       Mainstream
## 5239        RED         YOUNG FAMILIES       Mainstream
## 5240       COBS         YOUNG FAMILIES       Mainstream
## 5241     BURGER         YOUNG FAMILIES       Mainstream
## 5242        RRD         YOUNG FAMILIES       Mainstream
## 5243     KETTLE         YOUNG FAMILIES       Mainstream
## 5244    NATURAL MIDAGE SINGLES/COUPLES       Mainstream
## 5245  INFUZIONS MIDAGE SINGLES/COUPLES       Mainstream
## 5246     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 5247  INFUZIONS MIDAGE SINGLES/COUPLES       Mainstream
## 5248    NATURAL         OLDER FAMILIES          Premium
## 5249    DORITOS         OLDER FAMILIES          Premium
## 5250       COBS         OLDER FAMILIES          Premium
## 5251        CCS         OLDER FAMILIES          Premium
## 5252        RRD         OLDER FAMILIES          Premium
## 5253    NATURAL         OLDER FAMILIES          Premium
## 5254     INFZNS         OLDER FAMILIES           Budget
## 5255       COBS         OLDER FAMILIES           Budget
## 5256         WW         OLDER FAMILIES           Budget
## 5257      GRAIN         OLDER FAMILIES           Budget
## 5258     SMITHS         OLDER FAMILIES           Budget
## 5259   TWISTIES         OLDER FAMILIES           Budget
## 5260  INFUZIONS         OLDER FAMILIES           Budget
## 5261     SMITHS         OLDER FAMILIES           Budget
## 5262        RRD         OLDER FAMILIES           Budget
## 5263        RED         OLDER FAMILIES           Budget
## 5264    DORITOS         OLDER FAMILIES           Budget
## 5265        RRD         OLDER FAMILIES           Budget
## 5266         WW         OLDER FAMILIES           Budget
## 5267    DORITOS         OLDER FAMILIES           Budget
## 5268   PRINGLES         OLDER FAMILIES           Budget
## 5269     SMITHS         OLDER FAMILIES           Budget
## 5270         WW         OLDER FAMILIES           Budget
## 5271     KETTLE         OLDER FAMILIES           Budget
## 5272     SMITHS         OLDER FAMILIES           Budget
## 5273         WW         OLDER FAMILIES           Budget
## 5274    CHEETOS  OLDER SINGLES/COUPLES       Mainstream
## 5275   TWISTIES               RETIREES           Budget
## 5276        RRD  YOUNG SINGLES/COUPLES          Premium
## 5277         WW  YOUNG SINGLES/COUPLES          Premium
## 5278        RRD MIDAGE SINGLES/COUPLES           Budget
## 5279        CCS MIDAGE SINGLES/COUPLES           Budget
## 5280   PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 5281     SMITHS               RETIREES          Premium
## 5282   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 5283   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 5284    NATURAL  YOUNG SINGLES/COUPLES           Budget
## 5285     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 5286   PRINGLES               RETIREES           Budget
## 5287     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 5288        RRD  YOUNG SINGLES/COUPLES          Premium
## 5289      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 5290       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 5291   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 5292    DORITOS  YOUNG SINGLES/COUPLES          Premium
## 5293        RED  OLDER SINGLES/COUPLES          Premium
## 5294     KETTLE  OLDER SINGLES/COUPLES          Premium
## 5295     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 5296   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 5297     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 5298    DORITOS  OLDER SINGLES/COUPLES           Budget
## 5299   PRINGLES         OLDER FAMILIES          Premium
## 5300     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 5301         WW         YOUNG FAMILIES           Budget
## 5302     SMITHS         YOUNG FAMILIES           Budget
## 5303     SMITHS         YOUNG FAMILIES           Budget
## 5304     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 5305  INFUZIONS         YOUNG FAMILIES       Mainstream
## 5306    DORITOS         YOUNG FAMILIES       Mainstream
## 5307   TYRRELLS         YOUNG FAMILIES       Mainstream
## 5308        RRD  YOUNG SINGLES/COUPLES           Budget
## 5309        CCS  YOUNG SINGLES/COUPLES           Budget
## 5310   SUNBITES  YOUNG SINGLES/COUPLES          Premium
## 5311   CHEEZELS         OLDER FAMILIES           Budget
## 5312       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 5313    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 5314    NATURAL  YOUNG SINGLES/COUPLES       Mainstream
## 5315    NATURAL               RETIREES       Mainstream
## 5316      THINS               RETIREES          Premium
## 5317     KETTLE         YOUNG FAMILIES       Mainstream
## 5318    DORITOS         YOUNG FAMILIES       Mainstream
## 5319     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 5320    NATURAL  YOUNG SINGLES/COUPLES           Budget
## 5321     BURGER               RETIREES       Mainstream
## 5322     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 5323    NATURAL MIDAGE SINGLES/COUPLES          Premium
## 5324     SMITHS               RETIREES       Mainstream
## 5325      SNBTS               RETIREES       Mainstream
## 5326   TWISTIES               RETIREES           Budget
## 5327   TYRRELLS               RETIREES           Budget
## 5328     SMITHS         OLDER FAMILIES           Budget
## 5329        CCS         OLDER FAMILIES           Budget
## 5330   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 5331     KETTLE  OLDER SINGLES/COUPLES          Premium
## 5332    DORITOS  OLDER SINGLES/COUPLES          Premium
## 5333        RRD  OLDER SINGLES/COUPLES       Mainstream
## 5334        CCS  OLDER SINGLES/COUPLES       Mainstream
## 5335        RRD  OLDER SINGLES/COUPLES       Mainstream
## 5336      SMITH  OLDER SINGLES/COUPLES       Mainstream
## 5337   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 5338     SMITHS  YOUNG SINGLES/COUPLES          Premium
## 5339   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 5340  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 5341        RRD         YOUNG FAMILIES       Mainstream
## 5342     KETTLE         YOUNG FAMILIES       Mainstream
## 5343   TOSTITOS MIDAGE SINGLES/COUPLES          Premium
## 5344   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 5345        RED  YOUNG SINGLES/COUPLES       Mainstream
## 5346   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 5347       COBS  YOUNG SINGLES/COUPLES           Budget
## 5348        RRD  YOUNG SINGLES/COUPLES           Budget
## 5349         WW  YOUNG SINGLES/COUPLES           Budget
## 5350         WW           NEW FAMILIES           Budget
## 5351      GRAIN         OLDER FAMILIES           Budget
## 5352    NATURAL         OLDER FAMILIES          Premium
## 5353        RED         YOUNG FAMILIES          Premium
## 5354        RRD         YOUNG FAMILIES          Premium
## 5355         WW  YOUNG SINGLES/COUPLES           Budget
## 5356  INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 5357         WW           NEW FAMILIES           Budget
## 5358     SMITHS           NEW FAMILIES           Budget
## 5359        RRD  OLDER SINGLES/COUPLES       Mainstream
## 5360   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 5361         WW  YOUNG SINGLES/COUPLES       Mainstream
## 5362     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 5363        CCS  YOUNG SINGLES/COUPLES       Mainstream
## 5364     KETTLE         OLDER FAMILIES       Mainstream
## 5365   TOSTITOS         YOUNG FAMILIES          Premium
## 5366        RRD         YOUNG FAMILIES          Premium
## 5367        RRD  YOUNG SINGLES/COUPLES          Premium
## 5368     SMITHS               RETIREES       Mainstream
## 5369     SMITHS               RETIREES       Mainstream
## 5370     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 5371    DORITOS               RETIREES       Mainstream
## 5372    NATURAL               RETIREES       Mainstream
## 5373      THINS               RETIREES       Mainstream
## 5374    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 5375     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 5376     SMITHS         OLDER FAMILIES           Budget
## 5377         WW         OLDER FAMILIES           Budget
## 5378      THINS         OLDER FAMILIES           Budget
## 5379     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 5380      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 5381     DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 5382   TWISTIES         OLDER FAMILIES           Budget
## 5383     KETTLE  OLDER SINGLES/COUPLES          Premium
## 5384     KETTLE  OLDER SINGLES/COUPLES          Premium
## 5385      SNBTS               RETIREES          Premium
## 5386   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 5387        RRD  YOUNG SINGLES/COUPLES       Mainstream
## 5388     INFZNS         OLDER FAMILIES          Premium
## 5389     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 5390     KETTLE               RETIREES           Budget
## 5391   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 5392     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 5393     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 5394     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 5395     SMITHS  OLDER SINGLES/COUPLES           Budget
## 5396    DORITOS         YOUNG FAMILIES       Mainstream
## 5397        RED           NEW FAMILIES       Mainstream
## 5398  INFUZIONS         YOUNG FAMILIES       Mainstream
## 5399   TYRRELLS         YOUNG FAMILIES       Mainstream
## 5400         WW  YOUNG SINGLES/COUPLES       Mainstream
## 5401   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 5402   TWISTIES               RETIREES       Mainstream
## 5403   CHEEZELS MIDAGE SINGLES/COUPLES          Premium
## 5404        CCS MIDAGE SINGLES/COUPLES          Premium
## 5405      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 5406        RRD MIDAGE SINGLES/COUPLES       Mainstream
## 5407         WW MIDAGE SINGLES/COUPLES           Budget
## 5408         WW  OLDER SINGLES/COUPLES          Premium
## 5409     SMITHS               RETIREES          Premium
## 5410     BURGER               RETIREES           Budget
## 5411   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 5412     KETTLE               RETIREES          Premium
## 5413     KETTLE               RETIREES       Mainstream
## 5414     SMITHS               RETIREES       Mainstream
## 5415     SMITHS               RETIREES       Mainstream
## 5416   CHEEZELS         OLDER FAMILIES       Mainstream
## 5417   TYRRELLS         OLDER FAMILIES       Mainstream
## 5418        RRD         OLDER FAMILIES       Mainstream
## 5419     FRENCH MIDAGE SINGLES/COUPLES          Premium
## 5420      GRAIN MIDAGE SINGLES/COUPLES          Premium
## 5421   CHEEZELS MIDAGE SINGLES/COUPLES          Premium
## 5422     KETTLE           NEW FAMILIES           Budget
## 5423     SMITHS           NEW FAMILIES           Budget
## 5424    DORITOS           NEW FAMILIES           Budget
## 5425     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 5426    DORITOS MIDAGE SINGLES/COUPLES           Budget
## 5427   PRINGLES         OLDER FAMILIES          Premium
## 5428     SMITHS               RETIREES       Mainstream
## 5429     FRENCH  OLDER SINGLES/COUPLES          Premium
## 5430      SMITH  OLDER SINGLES/COUPLES          Premium
## 5431     KETTLE         OLDER FAMILIES       Mainstream
## 5432   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 5433         WW               RETIREES           Budget
## 5434      THINS               RETIREES           Budget
## 5435   TWISTIES MIDAGE SINGLES/COUPLES       Mainstream
## 5436     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 5437   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 5438     SMITHS               RETIREES       Mainstream
## 5439     KETTLE               RETIREES       Mainstream
## 5440      SNBTS  YOUNG SINGLES/COUPLES           Budget
## 5441   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 5442         WW  YOUNG SINGLES/COUPLES           Budget
## 5443    DORITOS               RETIREES           Budget
## 5444    DORITOS               RETIREES           Budget
## 5445   TOSTITOS           NEW FAMILIES       Mainstream
## 5446     SMITHS           NEW FAMILIES       Mainstream
## 5447         WW               RETIREES       Mainstream
## 5448   TOSTITOS MIDAGE SINGLES/COUPLES          Premium
## 5449  INFUZIONS MIDAGE SINGLES/COUPLES          Premium
## 5450        RED MIDAGE SINGLES/COUPLES          Premium
## 5451    GRNWVES  OLDER SINGLES/COUPLES       Mainstream
## 5452     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 5453        RRD  OLDER SINGLES/COUPLES           Budget
## 5454       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 5455     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 5456    CHEETOS  YOUNG SINGLES/COUPLES       Mainstream
## 5457   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 5458   TYRRELLS         OLDER FAMILIES          Premium
## 5459        RRD MIDAGE SINGLES/COUPLES          Premium
## 5460    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 5461    CHEETOS  OLDER SINGLES/COUPLES          Premium
## 5462         WW  OLDER SINGLES/COUPLES          Premium
## 5463     SMITHS  OLDER SINGLES/COUPLES           Budget
## 5464        RED         OLDER FAMILIES       Mainstream
## 5465     SMITHS         OLDER FAMILIES       Mainstream
## 5466      GRAIN         OLDER FAMILIES       Mainstream
## 5467        CCS MIDAGE SINGLES/COUPLES          Premium
## 5468        RED  YOUNG SINGLES/COUPLES       Mainstream
## 5469     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 5470  INFUZIONS         YOUNG FAMILIES           Budget
## 5471     SMITHS           NEW FAMILIES          Premium
## 5472         WW           NEW FAMILIES          Premium
## 5473    DORITOS  YOUNG SINGLES/COUPLES          Premium
## 5474        RRD  YOUNG SINGLES/COUPLES          Premium
## 5475   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 5476     SMITHS  YOUNG SINGLES/COUPLES          Premium
## 5477 WOOLWORTHS  YOUNG SINGLES/COUPLES           Budget
## 5478      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 5479  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 5480    DORITOS         YOUNG FAMILIES       Mainstream
## 5481    CHEETOS               RETIREES       Mainstream
## 5482      SMITH               RETIREES       Mainstream
## 5483   PRINGLES               RETIREES       Mainstream
## 5484     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 5485   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 5486    NATURAL               RETIREES       Mainstream
## 5487     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 5488    CHEETOS  YOUNG SINGLES/COUPLES           Budget
## 5489      SNBTS         YOUNG FAMILIES           Budget
## 5490        CCS  YOUNG SINGLES/COUPLES       Mainstream
## 5491      THINS         YOUNG FAMILIES          Premium
## 5492     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 5493   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 5494    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 5495      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 5496      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 5497    NATURAL  YOUNG SINGLES/COUPLES       Mainstream
## 5498         WW         OLDER FAMILIES          Premium
## 5499         WW         OLDER FAMILIES          Premium
## 5500 WOOLWORTHS  OLDER SINGLES/COUPLES          Premium
## 5501        RRD  OLDER SINGLES/COUPLES          Premium
## 5502   PRINGLES         YOUNG FAMILIES           Budget
## 5503      THINS         YOUNG FAMILIES           Budget
## 5504    DORITOS         YOUNG FAMILIES           Budget
## 5505     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 5506     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 5507     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 5508    DORITOS               RETIREES       Mainstream
## 5509      SMITH               RETIREES       Mainstream
## 5510   PRINGLES         YOUNG FAMILIES           Budget
## 5511      THINS MIDAGE SINGLES/COUPLES           Budget
## 5512   PRINGLES               RETIREES       Mainstream
## 5513     KETTLE               RETIREES       Mainstream
## 5514     SMITHS               RETIREES       Mainstream
## 5515      SNBTS         OLDER FAMILIES          Premium
## 5516  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 5517   TYRRELLS MIDAGE SINGLES/COUPLES       Mainstream
## 5518        CCS               RETIREES          Premium
## 5519   TOSTITOS               RETIREES          Premium
## 5520     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 5521     FRENCH           NEW FAMILIES       Mainstream
## 5522   PRINGLES           NEW FAMILIES       Mainstream
## 5523     BURGER           NEW FAMILIES           Budget
## 5524     KETTLE           NEW FAMILIES           Budget
## 5525         WW           NEW FAMILIES           Budget
## 5526    NATURAL  YOUNG SINGLES/COUPLES           Budget
## 5527         WW           NEW FAMILIES       Mainstream
## 5528   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 5529     FRENCH  YOUNG SINGLES/COUPLES           Budget
## 5530        RRD  YOUNG SINGLES/COUPLES           Budget
## 5531      SMITH               RETIREES       Mainstream
## 5532   SUNBITES  OLDER SINGLES/COUPLES           Budget
## 5533         WW  YOUNG SINGLES/COUPLES          Premium
## 5534     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 5535    NATURAL  YOUNG SINGLES/COUPLES       Mainstream
## 5536       COBS  OLDER SINGLES/COUPLES       Mainstream
## 5537      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 5538 WOOLWORTHS  YOUNG SINGLES/COUPLES       Mainstream
## 5539       COBS               RETIREES       Mainstream
## 5540   TWISTIES               RETIREES       Mainstream
## 5541        RRD               RETIREES       Mainstream
## 5542      GRAIN  OLDER SINGLES/COUPLES       Mainstream
## 5543     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 5544       COBS               RETIREES          Premium
## 5545     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 5546         WW  OLDER SINGLES/COUPLES           Budget
## 5547     SMITHS  OLDER SINGLES/COUPLES           Budget
## 5548   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 5549    CHEETOS  OLDER SINGLES/COUPLES           Budget
## 5550    DORITOS  OLDER SINGLES/COUPLES           Budget
## 5551     KETTLE               RETIREES          Premium
## 5552      SNBTS               RETIREES       Mainstream
## 5553   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 5554      SMITH  OLDER SINGLES/COUPLES       Mainstream
## 5555     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 5556   PRINGLES         YOUNG FAMILIES       Mainstream
## 5557        CCS         YOUNG FAMILIES       Mainstream
## 5558     SMITHS         YOUNG FAMILIES       Mainstream
## 5559     SMITHS               RETIREES           Budget
## 5560     KETTLE               RETIREES          Premium
## 5561  INFUZIONS MIDAGE SINGLES/COUPLES          Premium
## 5562         WW MIDAGE SINGLES/COUPLES          Premium
## 5563     BURGER         OLDER FAMILIES           Budget
## 5564   TYRRELLS           NEW FAMILIES           Budget
## 5565        RED         YOUNG FAMILIES           Budget
## 5566   PRINGLES         YOUNG FAMILIES           Budget
## 5567    NATURAL         OLDER FAMILIES           Budget
## 5568     SMITHS         OLDER FAMILIES           Budget
## 5569      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 5570        RRD  YOUNG SINGLES/COUPLES          Premium
## 5571   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 5572     KETTLE               RETIREES           Budget
## 5573  INFUZIONS               RETIREES           Budget
## 5574        RRD               RETIREES           Budget
## 5575   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 5576   CHEEZELS         YOUNG FAMILIES           Budget
## 5577        RRD           NEW FAMILIES       Mainstream
## 5578     SMITHS         OLDER FAMILIES           Budget
## 5579         WW           NEW FAMILIES          Premium
## 5580   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 5581     SMITHS  OLDER SINGLES/COUPLES           Budget
## 5582       COBS  OLDER SINGLES/COUPLES           Budget
## 5583     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 5584     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 5585     SMITHS               RETIREES       Mainstream
## 5586        RED               RETIREES       Mainstream
## 5587        RRD  OLDER SINGLES/COUPLES       Mainstream
## 5588     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 5589   TOSTITOS               RETIREES          Premium
## 5590        RRD               RETIREES       Mainstream
## 5591   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 5592      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 5593     KETTLE  OLDER SINGLES/COUPLES           Budget
## 5594    DORITOS  OLDER SINGLES/COUPLES           Budget
## 5595   PRINGLES         OLDER FAMILIES           Budget
## 5596   CHEEZELS  OLDER SINGLES/COUPLES           Budget
## 5597     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 5598     SMITHS         YOUNG FAMILIES           Budget
## 5599    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 5600        RRD MIDAGE SINGLES/COUPLES          Premium
## 5601   TYRRELLS MIDAGE SINGLES/COUPLES          Premium
## 5602    DORITOS           NEW FAMILIES          Premium
## 5603     SMITHS           NEW FAMILIES          Premium
## 5604   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 5605         WW               RETIREES           Budget
## 5606     KETTLE               RETIREES       Mainstream
## 5607     SMITHS               RETIREES           Budget
## 5608    CHEETOS               RETIREES           Budget
## 5609      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 5610      THINS               RETIREES           Budget
## 5611       COBS               RETIREES          Premium
## 5612   PRINGLES         YOUNG FAMILIES          Premium
## 5613   PRINGLES         YOUNG FAMILIES       Mainstream
## 5614  INFUZIONS  YOUNG SINGLES/COUPLES          Premium
## 5615        RRD  YOUNG SINGLES/COUPLES           Budget
## 5616        RRD MIDAGE SINGLES/COUPLES          Premium
## 5617   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 5618        RRD  OLDER SINGLES/COUPLES       Mainstream
## 5619     SMITHS               RETIREES       Mainstream
## 5620        CCS           NEW FAMILIES           Budget
## 5621     KETTLE  OLDER SINGLES/COUPLES           Budget
## 5622      SMITH         OLDER FAMILIES          Premium
## 5623   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 5624        RED         YOUNG FAMILIES           Budget
## 5625        RED               RETIREES           Budget
## 5626         WW               RETIREES           Budget
## 5627         WW               RETIREES           Budget
## 5628     FRENCH         OLDER FAMILIES          Premium
## 5629     SMITHS         OLDER FAMILIES          Premium
## 5630    GRNWVES         OLDER FAMILIES          Premium
## 5631   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 5632        RRD           NEW FAMILIES           Budget
## 5633    NATURAL           NEW FAMILIES           Budget
## 5634     SMITHS         OLDER FAMILIES           Budget
## 5635     SMITHS         OLDER FAMILIES           Budget
## 5636    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 5637        RRD MIDAGE SINGLES/COUPLES           Budget
## 5638    NATURAL         YOUNG FAMILIES           Budget
## 5639        RED         YOUNG FAMILIES           Budget
## 5640     KETTLE         YOUNG FAMILIES          Premium
## 5641      GRAIN         YOUNG FAMILIES          Premium
## 5642   TWISTIES         YOUNG FAMILIES          Premium
## 5643    DORITOS         OLDER FAMILIES          Premium
## 5644        RED         OLDER FAMILIES          Premium
## 5645   PRINGLES               RETIREES          Premium
## 5646   PRINGLES               RETIREES          Premium
## 5647     KETTLE               RETIREES          Premium
## 5648     BURGER               RETIREES          Premium
## 5649     SMITHS               RETIREES          Premium
## 5650   PRINGLES               RETIREES          Premium
## 5651      GRAIN  YOUNG SINGLES/COUPLES          Premium
## 5652    NATURAL  YOUNG SINGLES/COUPLES          Premium
## 5653     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 5654        CCS         YOUNG FAMILIES           Budget
## 5655     DORITO         YOUNG FAMILIES           Budget
## 5656    CHEETOS  YOUNG SINGLES/COUPLES           Budget
## 5657     KETTLE  OLDER SINGLES/COUPLES          Premium
## 5658     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 5659     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 5660         WW               RETIREES          Premium
## 5661    DORITOS         OLDER FAMILIES           Budget
## 5662   TOSTITOS         OLDER FAMILIES           Budget
## 5663      SNBTS  YOUNG SINGLES/COUPLES           Budget
## 5664        CCS MIDAGE SINGLES/COUPLES          Premium
## 5665    NATURAL MIDAGE SINGLES/COUPLES          Premium
## 5666         WW MIDAGE SINGLES/COUPLES          Premium
## 5667        CCS  OLDER SINGLES/COUPLES          Premium
## 5668     KETTLE  OLDER SINGLES/COUPLES          Premium
## 5669   CHEEZELS  OLDER SINGLES/COUPLES          Premium
## 5670        NCC  OLDER SINGLES/COUPLES          Premium
## 5671     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 5672   CHEEZELS  YOUNG SINGLES/COUPLES           Budget
## 5673         WW  YOUNG SINGLES/COUPLES           Budget
## 5674   PRINGLES         OLDER FAMILIES           Budget
## 5675     SMITHS  YOUNG SINGLES/COUPLES          Premium
## 5676     SMITHS           NEW FAMILIES           Budget
## 5677       COBS         YOUNG FAMILIES       Mainstream
## 5678        RRD               RETIREES           Budget
## 5679     SMITHS               RETIREES           Budget
## 5680      SNBTS MIDAGE SINGLES/COUPLES          Premium
## 5681     FRENCH MIDAGE SINGLES/COUPLES          Premium
## 5682   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 5683    CHEETOS  OLDER SINGLES/COUPLES           Budget
## 5684    NATURAL  OLDER SINGLES/COUPLES           Budget
## 5685        CCS  OLDER SINGLES/COUPLES           Budget
## 5686  INFUZIONS  YOUNG SINGLES/COUPLES          Premium
## 5687     INFZNS               RETIREES          Premium
## 5688     KETTLE               RETIREES          Premium
## 5689        CCS         OLDER FAMILIES          Premium
## 5690      THINS         OLDER FAMILIES          Premium
## 5691     FRENCH               RETIREES       Mainstream
## 5692    DORITOS               RETIREES           Budget
## 5693    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 5694  INFUZIONS MIDAGE SINGLES/COUPLES       Mainstream
## 5695     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 5696     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 5697        RED  OLDER SINGLES/COUPLES           Budget
## 5698     FRENCH  OLDER SINGLES/COUPLES           Budget
## 5699     SMITHS  OLDER SINGLES/COUPLES           Budget
## 5700      THINS         OLDER FAMILIES           Budget
## 5701   TOSTITOS         OLDER FAMILIES           Budget
## 5702     SMITHS         OLDER FAMILIES           Budget
## 5703     SMITHS               RETIREES           Budget
## 5704         WW               RETIREES           Budget
## 5705         WW               RETIREES           Budget
## 5706      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 5707      SMITH  OLDER SINGLES/COUPLES           Budget
## 5708     KETTLE  OLDER SINGLES/COUPLES           Budget
## 5709    DORITOS  OLDER SINGLES/COUPLES           Budget
## 5710     KETTLE  OLDER SINGLES/COUPLES           Budget
## 5711     BURGER  OLDER SINGLES/COUPLES           Budget
## 5712       COBS  OLDER SINGLES/COUPLES           Budget
## 5713     KETTLE  OLDER SINGLES/COUPLES          Premium
## 5714     SMITHS  OLDER SINGLES/COUPLES           Budget
## 5715      THINS               RETIREES           Budget
## 5716        RRD               RETIREES           Budget
## 5717     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 5718      GRAIN  OLDER SINGLES/COUPLES       Mainstream
## 5719     SMITHS         OLDER FAMILIES          Premium
## 5720         WW         OLDER FAMILIES          Premium
## 5721    GRNWVES         OLDER FAMILIES          Premium
## 5722  INFUZIONS               RETIREES       Mainstream
## 5723     KETTLE               RETIREES           Budget
## 5724     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 5725      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 5726    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 5727      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 5728   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 5729    NATURAL  OLDER SINGLES/COUPLES       Mainstream
## 5730       COBS               RETIREES          Premium
## 5731   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 5732      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 5733   TOSTITOS         YOUNG FAMILIES          Premium
## 5734    NATURAL               RETIREES           Budget
## 5735      THINS               RETIREES           Budget
## 5736   PRINGLES               RETIREES       Mainstream
## 5737       COBS               RETIREES       Mainstream
## 5738     SMITHS         YOUNG FAMILIES       Mainstream
## 5739     KETTLE  OLDER SINGLES/COUPLES           Budget
## 5740        RRD  OLDER SINGLES/COUPLES           Budget
## 5741     KETTLE               RETIREES       Mainstream
## 5742  INFUZIONS  YOUNG SINGLES/COUPLES          Premium
## 5743  INFUZIONS  YOUNG SINGLES/COUPLES          Premium
## 5744       COBS  OLDER SINGLES/COUPLES       Mainstream
## 5745        RRD         OLDER FAMILIES       Mainstream
## 5746      GRAIN  YOUNG SINGLES/COUPLES           Budget
## 5747     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 5748    NATURAL               RETIREES          Premium
## 5749   TWISTIES               RETIREES          Premium
## 5750   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 5751   TWISTIES MIDAGE SINGLES/COUPLES       Mainstream
## 5752        RRD  OLDER SINGLES/COUPLES          Premium
## 5753     SMITHS               RETIREES       Mainstream
## 5754     SMITHS               RETIREES       Mainstream
## 5755        RED  YOUNG SINGLES/COUPLES           Budget
## 5756        CCS               RETIREES       Mainstream
## 5757         WW         YOUNG FAMILIES       Mainstream
## 5758     KETTLE         YOUNG FAMILIES       Mainstream
## 5759     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 5760     KETTLE               RETIREES       Mainstream
## 5761     KETTLE               RETIREES       Mainstream
## 5762    DORITOS               RETIREES       Mainstream
## 5763     KETTLE               RETIREES       Mainstream
## 5764   TYRRELLS               RETIREES       Mainstream
## 5765     KETTLE  OLDER SINGLES/COUPLES          Premium
## 5766      THINS  OLDER SINGLES/COUPLES          Premium
## 5767   TWISTIES  YOUNG SINGLES/COUPLES          Premium
## 5768   CHEEZELS  YOUNG SINGLES/COUPLES          Premium
## 5769    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 5770   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 5771   TYRRELLS MIDAGE SINGLES/COUPLES       Mainstream
## 5772  INFUZIONS MIDAGE SINGLES/COUPLES       Mainstream
## 5773      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 5774     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 5775     INFZNS  OLDER SINGLES/COUPLES       Mainstream
## 5776   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 5777     INFZNS  OLDER SINGLES/COUPLES       Mainstream
## 5778  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 5779     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 5780     SMITHS               RETIREES       Mainstream
## 5781     KETTLE               RETIREES       Mainstream
## 5782     KETTLE               RETIREES       Mainstream
## 5783       COBS               RETIREES       Mainstream
## 5784    DORITOS         OLDER FAMILIES           Budget
## 5785     KETTLE         OLDER FAMILIES           Budget
## 5786     INFZNS         OLDER FAMILIES           Budget
## 5787   TWISTIES         OLDER FAMILIES           Budget
## 5788     KETTLE         OLDER FAMILIES           Budget
## 5789     SMITHS         OLDER FAMILIES           Budget
## 5790     INFZNS         OLDER FAMILIES           Budget
## 5791    DORITOS         OLDER FAMILIES           Budget
## 5792     KETTLE         OLDER FAMILIES           Budget
## 5793     KETTLE         OLDER FAMILIES           Budget
## 5794     SMITHS               RETIREES          Premium
## 5795     KETTLE               RETIREES          Premium
## 5796   TYRRELLS               RETIREES          Premium
## 5797     KETTLE               RETIREES          Premium
## 5798     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 5799   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 5800       COBS  YOUNG SINGLES/COUPLES          Premium
## 5801     DORITO  YOUNG SINGLES/COUPLES          Premium
## 5802    DORITOS               RETIREES          Premium
## 5803     KETTLE               RETIREES          Premium
## 5804     KETTLE               RETIREES          Premium
## 5805     KETTLE               RETIREES          Premium
## 5806   TOSTITOS         OLDER FAMILIES           Budget
## 5807   PRINGLES         OLDER FAMILIES           Budget
## 5808  INFUZIONS         OLDER FAMILIES           Budget
## 5809     KETTLE         OLDER FAMILIES           Budget
## 5810     KETTLE         OLDER FAMILIES           Budget
## 5811   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 5812     DORITO  OLDER SINGLES/COUPLES       Mainstream
## 5813     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 5814  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 5815     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 5816   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 5817   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 5818    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 5819   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 5820    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 5821   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 5822    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 5823   TWISTIES         OLDER FAMILIES           Budget
## 5824     KETTLE         OLDER FAMILIES           Budget
## 5825      GRAIN         OLDER FAMILIES           Budget
## 5826   PRINGLES         YOUNG FAMILIES          Premium
## 5827     KETTLE         YOUNG FAMILIES          Premium
## 5828   CHEEZELS  OLDER SINGLES/COUPLES          Premium
## 5829   TYRRELLS  OLDER SINGLES/COUPLES          Premium
## 5830       COBS  OLDER SINGLES/COUPLES          Premium
## 5831    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 5832     KETTLE         OLDER FAMILIES       Mainstream
## 5833   TOSTITOS         OLDER FAMILIES       Mainstream
## 5834     KETTLE         OLDER FAMILIES       Mainstream
## 5835     SMITHS         OLDER FAMILIES       Mainstream
## 5836      THINS  OLDER SINGLES/COUPLES           Budget
## 5837   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 5838   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 5839    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 5840   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 5841   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 5842     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 5843     INFZNS  YOUNG SINGLES/COUPLES       Mainstream
## 5844   TWISTIES         OLDER FAMILIES       Mainstream
## 5845      THINS         OLDER FAMILIES       Mainstream
## 5846      THINS         OLDER FAMILIES       Mainstream
## 5847   PRINGLES         OLDER FAMILIES       Mainstream
## 5848   PRINGLES         OLDER FAMILIES       Mainstream
## 5849   PRINGLES         OLDER FAMILIES       Mainstream
## 5850     KETTLE         OLDER FAMILIES       Mainstream
## 5851   PRINGLES         OLDER FAMILIES       Mainstream
## 5852     DORITO  YOUNG SINGLES/COUPLES           Budget
## 5853   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 5854     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 5855      THINS  OLDER SINGLES/COUPLES       Mainstream
## 5856     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 5857       COBS         OLDER FAMILIES          Premium
## 5858    DORITOS         OLDER FAMILIES          Premium
## 5859   TWISTIES         OLDER FAMILIES          Premium
## 5860     SMITHS               RETIREES          Premium
## 5861   PRINGLES               RETIREES          Premium
## 5862   TYRRELLS               RETIREES          Premium
## 5863      THINS               RETIREES          Premium
## 5864   PRINGLES               RETIREES          Premium
## 5865       COBS               RETIREES          Premium
## 5866    DORITOS               RETIREES          Premium
## 5867    DORITOS               RETIREES          Premium
## 5868     SMITHS               RETIREES          Premium
## 5869   CHEEZELS               RETIREES          Premium
## 5870   TYRRELLS               RETIREES          Premium
## 5871   TOSTITOS               RETIREES          Premium
## 5872       COBS               RETIREES          Premium
## 5873     KETTLE               RETIREES       Mainstream
## 5874  INFUZIONS               RETIREES           Budget
## 5875   TYRRELLS               RETIREES           Budget
## 5876   TWISTIES               RETIREES           Budget
## 5877       COBS               RETIREES           Budget
## 5878   CHEEZELS               RETIREES           Budget
## 5879    DORITOS               RETIREES           Budget
## 5880    DORITOS               RETIREES           Budget
## 5881      THINS  OLDER SINGLES/COUPLES           Budget
## 5882   TYRRELLS  OLDER SINGLES/COUPLES           Budget
## 5883     SMITHS  OLDER SINGLES/COUPLES           Budget
## 5884   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 5885   TWISTIES               RETIREES           Budget
## 5886   PRINGLES               RETIREES           Budget
## 5887    DORITOS               RETIREES           Budget
## 5888    DORITOS               RETIREES          Premium
## 5889  INFUZIONS               RETIREES          Premium
## 5890     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 5891   CHEEZELS MIDAGE SINGLES/COUPLES       Mainstream
## 5892     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 5893   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 5894      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 5895   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 5896    DORITOS               RETIREES       Mainstream
## 5897    DORITOS               RETIREES       Mainstream
## 5898      THINS               RETIREES       Mainstream
## 5899     KETTLE               RETIREES       Mainstream
## 5900    DORITOS               RETIREES       Mainstream
## 5901    DORITOS               RETIREES       Mainstream
## 5902   PRINGLES               RETIREES          Premium
## 5903     KETTLE               RETIREES          Premium
## 5904     KETTLE               RETIREES          Premium
## 5905   TOSTITOS               RETIREES          Premium
## 5906   TWISTIES               RETIREES          Premium
## 5907     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 5908    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 5909     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 5910  INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 5911    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 5912     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 5913     DORITO  YOUNG SINGLES/COUPLES           Budget
## 5914     DORITO  YOUNG SINGLES/COUPLES           Budget
## 5915      THINS  YOUNG SINGLES/COUPLES           Budget
## 5916    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 5917     DORITO  YOUNG SINGLES/COUPLES           Budget
## 5918   PRINGLES         YOUNG FAMILIES       Mainstream
## 5919   PRINGLES         YOUNG FAMILIES       Mainstream
## 5920     KETTLE         YOUNG FAMILIES       Mainstream
## 5921    DORITOS         YOUNG FAMILIES       Mainstream
## 5922   CHEEZELS         YOUNG FAMILIES       Mainstream
## 5923   PRINGLES         YOUNG FAMILIES       Mainstream
## 5924   TOSTITOS         YOUNG FAMILIES       Mainstream
## 5925      THINS         YOUNG FAMILIES       Mainstream
## 5926  INFUZIONS         YOUNG FAMILIES       Mainstream
## 5927     KETTLE               RETIREES       Mainstream
## 5928     KETTLE               RETIREES       Mainstream
## 5929   PRINGLES               RETIREES       Mainstream
## 5930     KETTLE               RETIREES       Mainstream
## 5931      THINS         OLDER FAMILIES           Budget
## 5932   TOSTITOS         OLDER FAMILIES           Budget
## 5933     KETTLE         OLDER FAMILIES           Budget
## 5934  INFUZIONS         OLDER FAMILIES           Budget
## 5935  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 5936      GRAIN  OLDER SINGLES/COUPLES           Budget
## 5937   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 5938     KETTLE  OLDER SINGLES/COUPLES           Budget
## 5939    DORITOS  OLDER SINGLES/COUPLES           Budget
## 5940     KETTLE  OLDER SINGLES/COUPLES           Budget
## 5941     KETTLE  OLDER SINGLES/COUPLES           Budget
## 5942   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 5943     KETTLE  OLDER SINGLES/COUPLES           Budget
## 5944     KETTLE         YOUNG FAMILIES           Budget
## 5945     SMITHS               RETIREES       Mainstream
## 5946     SMITHS               RETIREES       Mainstream
## 5947   PRINGLES               RETIREES       Mainstream
## 5948     KETTLE               RETIREES       Mainstream
## 5949    DORITOS         YOUNG FAMILIES           Budget
## 5950   TYRRELLS         YOUNG FAMILIES           Budget
## 5951   PRINGLES         YOUNG FAMILIES           Budget
## 5952     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 5953   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 5954   PRINGLES         YOUNG FAMILIES       Mainstream
## 5955   TWISTIES MIDAGE SINGLES/COUPLES       Mainstream
## 5956     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 5957     DORITO  OLDER SINGLES/COUPLES          Premium
## 5958     KETTLE  OLDER SINGLES/COUPLES          Premium
## 5959      GRAIN  OLDER SINGLES/COUPLES          Premium
## 5960     SMITHS               RETIREES          Premium
## 5961      GRAIN               RETIREES          Premium
## 5962      GRAIN               RETIREES          Premium
## 5963    DORITOS               RETIREES          Premium
## 5964  INFUZIONS               RETIREES          Premium
## 5965    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 5966    DORITOS               RETIREES          Premium
## 5967   TOSTITOS               RETIREES          Premium
## 5968   PRINGLES               RETIREES          Premium
## 5969       COBS               RETIREES       Mainstream
## 5970    DORITOS               RETIREES       Mainstream
## 5971   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 5972   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 5973    DORITOS  OLDER SINGLES/COUPLES           Budget
## 5974       COBS  OLDER SINGLES/COUPLES           Budget
## 5975     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 5976   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 5977   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 5978     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 5979       COBS  OLDER SINGLES/COUPLES       Mainstream
## 5980     KETTLE               RETIREES          Premium
## 5981      THINS               RETIREES          Premium
## 5982      THINS               RETIREES          Premium
## 5983     SMITHS         YOUNG FAMILIES           Budget
## 5984   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 5985    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 5986   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 5987   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 5988   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 5989      THINS  OLDER SINGLES/COUPLES           Budget
## 5990  INFUZIONS               RETIREES           Budget
## 5991    DORITOS               RETIREES           Budget
## 5992     SMITHS               RETIREES           Budget
## 5993     SMITHS           NEW FAMILIES           Budget
## 5994      GRAIN           NEW FAMILIES           Budget
## 5995      THINS           NEW FAMILIES           Budget
## 5996      GRAIN         YOUNG FAMILIES       Mainstream
## 5997     KETTLE         YOUNG FAMILIES       Mainstream
## 5998    DORITOS         YOUNG FAMILIES       Mainstream
## 5999   TOSTITOS         YOUNG FAMILIES       Mainstream
## 6000   TWISTIES         YOUNG FAMILIES       Mainstream
## 6001   PRINGLES         YOUNG FAMILIES       Mainstream
## 6002     KETTLE         YOUNG FAMILIES       Mainstream
## 6003     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6004     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6005   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 6006   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 6007      THINS MIDAGE SINGLES/COUPLES          Premium
## 6008     KETTLE               RETIREES           Budget
## 6009       COBS               RETIREES           Budget
## 6010  INFUZIONS               RETIREES           Budget
## 6011   PRINGLES               RETIREES           Budget
## 6012       COBS         OLDER FAMILIES           Budget
## 6013      GRAIN         OLDER FAMILIES           Budget
## 6014    DORITOS         OLDER FAMILIES           Budget
## 6015   PRINGLES               RETIREES           Budget
## 6016     SMITHS               RETIREES           Budget
## 6017   PRINGLES               RETIREES           Budget
## 6018     KETTLE               RETIREES           Budget
## 6019      THINS               RETIREES           Budget
## 6020    DORITOS               RETIREES           Budget
## 6021   PRINGLES               RETIREES           Budget
## 6022   PRINGLES               RETIREES           Budget
## 6023   PRINGLES               RETIREES           Budget
## 6024  INFUZIONS               RETIREES           Budget
## 6025   PRINGLES               RETIREES           Budget
## 6026    DORITOS               RETIREES           Budget
## 6027   CHEEZELS  OLDER SINGLES/COUPLES           Budget
## 6028     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6029   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 6030    DORITOS  OLDER SINGLES/COUPLES          Premium
## 6031     KETTLE  OLDER SINGLES/COUPLES          Premium
## 6032    DORITOS  OLDER SINGLES/COUPLES          Premium
## 6033   TWISTIES MIDAGE SINGLES/COUPLES           Budget
## 6034     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 6035     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 6036     KETTLE         OLDER FAMILIES           Budget
## 6037   PRINGLES         OLDER FAMILIES           Budget
## 6038      THINS MIDAGE SINGLES/COUPLES           Budget
## 6039   PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 6040   TWISTIES MIDAGE SINGLES/COUPLES           Budget
## 6041      THINS MIDAGE SINGLES/COUPLES           Budget
## 6042   TOSTITOS MIDAGE SINGLES/COUPLES           Budget
## 6043     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 6044   PRINGLES         OLDER FAMILIES          Premium
## 6045     SMITHS         OLDER FAMILIES          Premium
## 6046     KETTLE               RETIREES           Budget
## 6047    DORITOS  OLDER SINGLES/COUPLES          Premium
## 6048     KETTLE  OLDER SINGLES/COUPLES          Premium
## 6049     KETTLE  OLDER SINGLES/COUPLES          Premium
## 6050     KETTLE  OLDER SINGLES/COUPLES          Premium
## 6051      GRAIN MIDAGE SINGLES/COUPLES       Mainstream
## 6052  INFUZIONS MIDAGE SINGLES/COUPLES       Mainstream
## 6053     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 6054   PRINGLES         OLDER FAMILIES           Budget
## 6055     KETTLE         OLDER FAMILIES           Budget
## 6056     KETTLE         OLDER FAMILIES           Budget
## 6057     INFZNS         OLDER FAMILIES           Budget
## 6058   PRINGLES         OLDER FAMILIES           Budget
## 6059      GRAIN         OLDER FAMILIES           Budget
## 6060   PRINGLES         OLDER FAMILIES           Budget
## 6061   TYRRELLS MIDAGE SINGLES/COUPLES       Mainstream
## 6062     DORITO MIDAGE SINGLES/COUPLES       Mainstream
## 6063   TWISTIES MIDAGE SINGLES/COUPLES       Mainstream
## 6064     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 6065     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 6066   TWISTIES MIDAGE SINGLES/COUPLES           Budget
## 6067      THINS MIDAGE SINGLES/COUPLES           Budget
## 6068    DORITOS MIDAGE SINGLES/COUPLES           Budget
## 6069     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 6070  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 6071   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 6072     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6073      THINS  OLDER SINGLES/COUPLES       Mainstream
## 6074     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 6075      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 6076  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 6077    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 6078  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 6079      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 6080      THINS         YOUNG FAMILIES           Budget
## 6081     KETTLE         YOUNG FAMILIES           Budget
## 6082      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 6083     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6084  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 6085   CHEEZELS  OLDER SINGLES/COUPLES           Budget
## 6086     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6087      GRAIN  OLDER SINGLES/COUPLES           Budget
## 6088   TOSTITOS         OLDER FAMILIES       Mainstream
## 6089    DORITOS         OLDER FAMILIES       Mainstream
## 6090    DORITOS         OLDER FAMILIES       Mainstream
## 6091     KETTLE         OLDER FAMILIES       Mainstream
## 6092    DORITOS         OLDER FAMILIES       Mainstream
## 6093    DORITOS         OLDER FAMILIES       Mainstream
## 6094   TOSTITOS         OLDER FAMILIES       Mainstream
## 6095     KETTLE         OLDER FAMILIES           Budget
## 6096     KETTLE         OLDER FAMILIES           Budget
## 6097     KETTLE         OLDER FAMILIES           Budget
## 6098    DORITOS         OLDER FAMILIES           Budget
## 6099      THINS         OLDER FAMILIES           Budget
## 6100  INFUZIONS MIDAGE SINGLES/COUPLES       Mainstream
## 6101     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 6102      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 6103     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 6104     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 6105   TYRRELLS MIDAGE SINGLES/COUPLES       Mainstream
## 6106     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 6107   CHEEZELS MIDAGE SINGLES/COUPLES       Mainstream
## 6108  INFUZIONS MIDAGE SINGLES/COUPLES       Mainstream
## 6109   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 6110     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 6111    DORITOS  OLDER SINGLES/COUPLES           Budget
## 6112     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 6113  INFUZIONS           NEW FAMILIES       Mainstream
## 6114    DORITOS           NEW FAMILIES       Mainstream
## 6115  INFUZIONS           NEW FAMILIES       Mainstream
## 6116   TWISTIES           NEW FAMILIES       Mainstream
## 6117      THINS               RETIREES           Budget
## 6118      THINS               RETIREES           Budget
## 6119   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 6120     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6121     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6122    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 6123    DORITOS         YOUNG FAMILIES          Premium
## 6124   TOSTITOS         YOUNG FAMILIES          Premium
## 6125     KETTLE         YOUNG FAMILIES          Premium
## 6126      THINS               RETIREES          Premium
## 6127     INFZNS               RETIREES          Premium
## 6128     KETTLE         YOUNG FAMILIES          Premium
## 6129     KETTLE         YOUNG FAMILIES          Premium
## 6130  INFUZIONS         YOUNG FAMILIES          Premium
## 6131     KETTLE         YOUNG FAMILIES          Premium
## 6132     KETTLE         YOUNG FAMILIES          Premium
## 6133   TWISTIES         YOUNG FAMILIES       Mainstream
## 6134      THINS         YOUNG FAMILIES       Mainstream
## 6135     KETTLE         YOUNG FAMILIES       Mainstream
## 6136   TWISTIES         OLDER FAMILIES          Premium
## 6137   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 6138   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 6139   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 6140      THINS  OLDER SINGLES/COUPLES       Mainstream
## 6141    DORITOS  OLDER SINGLES/COUPLES          Premium
## 6142   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 6143  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 6144   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 6145   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 6146     SMITHS  OLDER SINGLES/COUPLES           Budget
## 6147   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 6148     SMITHS  OLDER SINGLES/COUPLES           Budget
## 6149    DORITOS  OLDER SINGLES/COUPLES           Budget
## 6150   TWISTIES           NEW FAMILIES       Mainstream
## 6151     SMITHS         YOUNG FAMILIES          Premium
## 6152    DORITOS         YOUNG FAMILIES          Premium
## 6153   PRINGLES         YOUNG FAMILIES          Premium
## 6154     KETTLE         YOUNG FAMILIES          Premium
## 6155   TWISTIES         OLDER FAMILIES           Budget
## 6156     KETTLE         OLDER FAMILIES           Budget
## 6157     SMITHS         OLDER FAMILIES           Budget
## 6158     KETTLE         OLDER FAMILIES           Budget
## 6159    DORITOS         OLDER FAMILIES           Budget
## 6160      GRAIN         OLDER FAMILIES           Budget
## 6161   PRINGLES         YOUNG FAMILIES           Budget
## 6162  INFUZIONS         YOUNG FAMILIES           Budget
## 6163     KETTLE         YOUNG FAMILIES           Budget
## 6164     INFZNS         YOUNG FAMILIES           Budget
## 6165   TYRRELLS         YOUNG FAMILIES           Budget
## 6166   PRINGLES         YOUNG FAMILIES           Budget
## 6167   TYRRELLS         YOUNG FAMILIES           Budget
## 6168  INFUZIONS         YOUNG FAMILIES           Budget
## 6169     KETTLE               RETIREES           Budget
## 6170     KETTLE               RETIREES           Budget
## 6171      THINS               RETIREES           Budget
## 6172     KETTLE               RETIREES           Budget
## 6173   TOSTITOS               RETIREES           Budget
## 6174     DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 6175      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 6176   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 6177   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 6178   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 6179       COBS MIDAGE SINGLES/COUPLES       Mainstream
## 6180      THINS               RETIREES           Budget
## 6181    DORITOS               RETIREES           Budget
## 6182     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 6183   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 6184     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6185       COBS  OLDER SINGLES/COUPLES       Mainstream
## 6186   TWISTIES               RETIREES       Mainstream
## 6187   TYRRELLS               RETIREES       Mainstream
## 6188      THINS               RETIREES       Mainstream
## 6189   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 6190     SMITHS  OLDER SINGLES/COUPLES           Budget
## 6191   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 6192     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6193     DORITO  OLDER SINGLES/COUPLES           Budget
## 6194    DORITOS               RETIREES          Premium
## 6195   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 6196    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 6197   TWISTIES  YOUNG SINGLES/COUPLES           Budget
## 6198    DORITOS  OLDER SINGLES/COUPLES          Premium
## 6199   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 6200   PRINGLES         OLDER FAMILIES           Budget
## 6201    DORITOS         OLDER FAMILIES           Budget
## 6202    DORITOS         OLDER FAMILIES           Budget
## 6203   TWISTIES         OLDER FAMILIES           Budget
## 6204     KETTLE         OLDER FAMILIES           Budget
## 6205   PRINGLES         OLDER FAMILIES           Budget
## 6206      THINS         OLDER FAMILIES           Budget
## 6207     KETTLE         OLDER FAMILIES           Budget
## 6208     KETTLE         OLDER FAMILIES           Budget
## 6209   TOSTITOS         OLDER FAMILIES           Budget
## 6210     KETTLE         OLDER FAMILIES           Budget
## 6211     KETTLE  OLDER SINGLES/COUPLES          Premium
## 6212     SMITHS  OLDER SINGLES/COUPLES          Premium
## 6213     KETTLE  OLDER SINGLES/COUPLES          Premium
## 6214      THINS  OLDER SINGLES/COUPLES          Premium
## 6215     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6216      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 6217   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 6218     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 6219     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 6220   TWISTIES MIDAGE SINGLES/COUPLES          Premium
## 6221   TYRRELLS MIDAGE SINGLES/COUPLES          Premium
## 6222   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 6223     SMITHS  OLDER SINGLES/COUPLES          Premium
## 6224     KETTLE  OLDER SINGLES/COUPLES          Premium
## 6225   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 6226   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 6227      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 6228     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 6229      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 6230    DORITOS  OLDER SINGLES/COUPLES          Premium
## 6231     KETTLE  OLDER SINGLES/COUPLES          Premium
## 6232     SMITHS  OLDER SINGLES/COUPLES          Premium
## 6233     SMITHS  OLDER SINGLES/COUPLES          Premium
## 6234   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 6235     SMITHS  OLDER SINGLES/COUPLES           Budget
## 6236   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 6237   TYRRELLS  OLDER SINGLES/COUPLES           Budget
## 6238    DORITOS  OLDER SINGLES/COUPLES           Budget
## 6239   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 6240       COBS MIDAGE SINGLES/COUPLES           Budget
## 6241  INFUZIONS MIDAGE SINGLES/COUPLES           Budget
## 6242     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 6243   TWISTIES MIDAGE SINGLES/COUPLES           Budget
## 6244   PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 6245     INFZNS  YOUNG SINGLES/COUPLES       Mainstream
## 6246    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 6247    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 6248   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 6249   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 6250     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 6251       COBS  OLDER SINGLES/COUPLES       Mainstream
## 6252   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 6253     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6254    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 6255      THINS  OLDER SINGLES/COUPLES       Mainstream
## 6256    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 6257     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 6258     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 6259     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 6260     KETTLE         YOUNG FAMILIES           Budget
## 6261      THINS         YOUNG FAMILIES           Budget
## 6262       COBS         YOUNG FAMILIES           Budget
## 6263   PRINGLES         YOUNG FAMILIES           Budget
## 6264       COBS         YOUNG FAMILIES           Budget
## 6265   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 6266       COBS         YOUNG FAMILIES          Premium
## 6267     KETTLE         YOUNG FAMILIES          Premium
## 6268    DORITOS         YOUNG FAMILIES          Premium
## 6269    DORITOS         YOUNG FAMILIES          Premium
## 6270   PRINGLES         YOUNG FAMILIES          Premium
## 6271    DORITOS         YOUNG FAMILIES          Premium
## 6272   PRINGLES         YOUNG FAMILIES          Premium
## 6273     KETTLE         YOUNG FAMILIES          Premium
## 6274   TWISTIES         YOUNG FAMILIES       Mainstream
## 6275      THINS         YOUNG FAMILIES       Mainstream
## 6276   TYRRELLS         YOUNG FAMILIES       Mainstream
## 6277      GRAIN         YOUNG FAMILIES       Mainstream
## 6278  INFUZIONS         YOUNG FAMILIES       Mainstream
## 6279       COBS         YOUNG FAMILIES       Mainstream
## 6280      THINS  OLDER SINGLES/COUPLES       Mainstream
## 6281     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6282  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 6283     DORITO  OLDER SINGLES/COUPLES       Mainstream
## 6284   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 6285     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6286     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6287       COBS  OLDER SINGLES/COUPLES       Mainstream
## 6288     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6289      GRAIN  OLDER SINGLES/COUPLES       Mainstream
## 6290   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 6291      THINS  OLDER SINGLES/COUPLES           Budget
## 6292      THINS  OLDER SINGLES/COUPLES           Budget
## 6293      THINS  OLDER SINGLES/COUPLES           Budget
## 6294     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6295     KETTLE           NEW FAMILIES           Budget
## 6296      THINS           NEW FAMILIES           Budget
## 6297      GRAIN           NEW FAMILIES           Budget
## 6298  INFUZIONS           NEW FAMILIES           Budget
## 6299   TWISTIES           NEW FAMILIES           Budget
## 6300     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6301      THINS  OLDER SINGLES/COUPLES       Mainstream
## 6302    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 6303     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6304       COBS               RETIREES           Budget
## 6305     SMITHS               RETIREES           Budget
## 6306    DORITOS               RETIREES           Budget
## 6307   PRINGLES               RETIREES           Budget
## 6308     KETTLE               RETIREES           Budget
## 6309      THINS         YOUNG FAMILIES           Budget
## 6310   PRINGLES         YOUNG FAMILIES           Budget
## 6311     KETTLE         YOUNG FAMILIES           Budget
## 6312     SMITHS         YOUNG FAMILIES           Budget
## 6313    DORITOS         YOUNG FAMILIES           Budget
## 6314  INFUZIONS               RETIREES       Mainstream
## 6315   TYRRELLS               RETIREES       Mainstream
## 6316     KETTLE               RETIREES       Mainstream
## 6317   PRINGLES               RETIREES       Mainstream
## 6318    DORITOS               RETIREES       Mainstream
## 6319  INFUZIONS MIDAGE SINGLES/COUPLES           Budget
## 6320     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 6321   TOSTITOS MIDAGE SINGLES/COUPLES           Budget
## 6322  INFUZIONS MIDAGE SINGLES/COUPLES           Budget
## 6323  INFUZIONS MIDAGE SINGLES/COUPLES           Budget
## 6324      GRAIN MIDAGE SINGLES/COUPLES           Budget
## 6325     SMITHS         OLDER FAMILIES           Budget
## 6326     KETTLE         OLDER FAMILIES           Budget
## 6327   PRINGLES         OLDER FAMILIES           Budget
## 6328     KETTLE         OLDER FAMILIES           Budget
## 6329   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 6330       COBS  OLDER SINGLES/COUPLES       Mainstream
## 6331     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 6332    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 6333    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 6334   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 6335     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 6336      GRAIN MIDAGE SINGLES/COUPLES       Mainstream
## 6337     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 6338    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 6339     SMITHS         OLDER FAMILIES           Budget
## 6340   PRINGLES         OLDER FAMILIES           Budget
## 6341   PRINGLES         OLDER FAMILIES           Budget
## 6342     KETTLE         OLDER FAMILIES           Budget
## 6343     KETTLE         OLDER FAMILIES           Budget
## 6344     KETTLE         OLDER FAMILIES           Budget
## 6345   TOSTITOS         OLDER FAMILIES           Budget
## 6346   TYRRELLS         OLDER FAMILIES           Budget
## 6347     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6348   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 6349     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 6350     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 6351      THINS  YOUNG SINGLES/COUPLES           Budget
## 6352   PRINGLES         YOUNG FAMILIES           Budget
## 6353   PRINGLES         YOUNG FAMILIES           Budget
## 6354   PRINGLES         YOUNG FAMILIES           Budget
## 6355    DORITOS  OLDER SINGLES/COUPLES          Premium
## 6356    DORITOS  OLDER SINGLES/COUPLES          Premium
## 6357   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 6358   TOSTITOS         YOUNG FAMILIES           Budget
## 6359     KETTLE         YOUNG FAMILIES           Budget
## 6360    DORITOS         YOUNG FAMILIES           Budget
## 6361    DORITOS         YOUNG FAMILIES           Budget
## 6362  INFUZIONS         YOUNG FAMILIES           Budget
## 6363     INFZNS         YOUNG FAMILIES           Budget
## 6364      GRAIN         YOUNG FAMILIES           Budget
## 6365     KETTLE         YOUNG FAMILIES           Budget
## 6366   TYRRELLS         YOUNG FAMILIES           Budget
## 6367  INFUZIONS         YOUNG FAMILIES           Budget
## 6368   TYRRELLS               RETIREES           Budget
## 6369     SMITHS         OLDER FAMILIES          Premium
## 6370     DORITO         OLDER FAMILIES          Premium
## 6371     DORITO         OLDER FAMILIES          Premium
## 6372       COBS         OLDER FAMILIES          Premium
## 6373   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 6374     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6375     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6376   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 6377   PRINGLES               RETIREES       Mainstream
## 6378     KETTLE               RETIREES       Mainstream
## 6379     SMITHS               RETIREES       Mainstream
## 6380    DORITOS               RETIREES       Mainstream
## 6381   TYRRELLS               RETIREES       Mainstream
## 6382     KETTLE               RETIREES       Mainstream
## 6383     KETTLE               RETIREES       Mainstream
## 6384      THINS               RETIREES       Mainstream
## 6385      THINS           NEW FAMILIES       Mainstream
## 6386    DORITOS           NEW FAMILIES       Mainstream
## 6387     KETTLE           NEW FAMILIES       Mainstream
## 6388       COBS  OLDER SINGLES/COUPLES       Mainstream
## 6389     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6390   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 6391    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 6392      THINS  OLDER SINGLES/COUPLES       Mainstream
## 6393    DORITOS               RETIREES           Budget
## 6394     KETTLE               RETIREES           Budget
## 6395      GRAIN               RETIREES           Budget
## 6396      THINS  OLDER SINGLES/COUPLES          Premium
## 6397    DORITOS  OLDER SINGLES/COUPLES          Premium
## 6398     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6399   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 6400     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6401     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6402    DORITOS         OLDER FAMILIES       Mainstream
## 6403     SMITHS         OLDER FAMILIES       Mainstream
## 6404    DORITOS         OLDER FAMILIES       Mainstream
## 6405  INFUZIONS         OLDER FAMILIES       Mainstream
## 6406    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 6407    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 6408     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 6409     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 6410     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 6411  INFUZIONS               RETIREES       Mainstream
## 6412      THINS               RETIREES       Mainstream
## 6413     KETTLE               RETIREES       Mainstream
## 6414      THINS               RETIREES       Mainstream
## 6415    DORITOS               RETIREES       Mainstream
## 6416     KETTLE               RETIREES       Mainstream
## 6417   PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 6418     INFZNS MIDAGE SINGLES/COUPLES           Budget
## 6419      THINS MIDAGE SINGLES/COUPLES           Budget
## 6420   PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 6421     SMITHS MIDAGE SINGLES/COUPLES           Budget
## 6422     SMITHS MIDAGE SINGLES/COUPLES           Budget
## 6423     KETTLE               RETIREES          Premium
## 6424  INFUZIONS               RETIREES          Premium
## 6425     KETTLE               RETIREES          Premium
## 6426   TWISTIES               RETIREES          Premium
## 6427     DORITO               RETIREES          Premium
## 6428   TWISTIES               RETIREES          Premium
## 6429    DORITOS               RETIREES          Premium
## 6430   PRINGLES         OLDER FAMILIES           Budget
## 6431     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 6432  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 6433     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 6434     KETTLE               RETIREES           Budget
## 6435    DORITOS               RETIREES           Budget
## 6436     KETTLE               RETIREES           Budget
## 6437     DORITO  OLDER SINGLES/COUPLES          Premium
## 6438    DORITOS  OLDER SINGLES/COUPLES          Premium
## 6439    DORITOS  OLDER SINGLES/COUPLES          Premium
## 6440   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 6441     KETTLE               RETIREES          Premium
## 6442    DORITOS               RETIREES          Premium
## 6443   PRINGLES               RETIREES          Premium
## 6444    DORITOS               RETIREES          Premium
## 6445   TOSTITOS               RETIREES          Premium
## 6446     SMITHS               RETIREES          Premium
## 6447   TOSTITOS           NEW FAMILIES           Budget
## 6448   TOSTITOS           NEW FAMILIES           Budget
## 6449       COBS           NEW FAMILIES           Budget
## 6450      GRAIN           NEW FAMILIES           Budget
## 6451   TOSTITOS           NEW FAMILIES           Budget
## 6452  INFUZIONS               RETIREES       Mainstream
## 6453     KETTLE               RETIREES       Mainstream
## 6454   PRINGLES               RETIREES       Mainstream
## 6455      THINS               RETIREES       Mainstream
## 6456  INFUZIONS               RETIREES       Mainstream
## 6457   TOSTITOS               RETIREES       Mainstream
## 6458   TOSTITOS               RETIREES       Mainstream
## 6459     SMITHS               RETIREES       Mainstream
## 6460     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6461      GRAIN  OLDER SINGLES/COUPLES           Budget
## 6462   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 6463      THINS  OLDER SINGLES/COUPLES           Budget
## 6464     SMITHS  OLDER SINGLES/COUPLES           Budget
## 6465     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6466     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6467   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 6468      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 6469      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 6470  INFUZIONS         OLDER FAMILIES           Budget
## 6471   TOSTITOS         OLDER FAMILIES           Budget
## 6472     KETTLE               RETIREES           Budget
## 6473     KETTLE               RETIREES           Budget
## 6474     KETTLE               RETIREES           Budget
## 6475   TYRRELLS               RETIREES           Budget
## 6476     KETTLE               RETIREES           Budget
## 6477   CHEEZELS               RETIREES           Budget
## 6478  INFUZIONS         YOUNG FAMILIES       Mainstream
## 6479      THINS         YOUNG FAMILIES       Mainstream
## 6480  INFUZIONS         YOUNG FAMILIES       Mainstream
## 6481   PRINGLES         YOUNG FAMILIES       Mainstream
## 6482      THINS         YOUNG FAMILIES       Mainstream
## 6483     KETTLE         YOUNG FAMILIES       Mainstream
## 6484     KETTLE           NEW FAMILIES       Mainstream
## 6485      THINS           NEW FAMILIES       Mainstream
## 6486     KETTLE           NEW FAMILIES       Mainstream
## 6487     KETTLE           NEW FAMILIES       Mainstream
## 6488   TWISTIES         OLDER FAMILIES          Premium
## 6489   TWISTIES         OLDER FAMILIES           Budget
## 6490       COBS         OLDER FAMILIES           Budget
## 6491   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 6492       COBS  OLDER SINGLES/COUPLES           Budget
## 6493     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6494       COBS  OLDER SINGLES/COUPLES           Budget
## 6495     KETTLE               RETIREES          Premium
## 6496     KETTLE               RETIREES          Premium
## 6497   TWISTIES               RETIREES          Premium
## 6498    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 6499  INFUZIONS               RETIREES          Premium
## 6500     INFZNS               RETIREES          Premium
## 6501  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 6502     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6503     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6504    DORITOS  OLDER SINGLES/COUPLES           Budget
## 6505     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6506   PRINGLES         YOUNG FAMILIES       Mainstream
## 6507   TWISTIES         YOUNG FAMILIES       Mainstream
## 6508   TYRRELLS         YOUNG FAMILIES       Mainstream
## 6509    DORITOS         YOUNG FAMILIES       Mainstream
## 6510   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 6511     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6512     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6513  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 6514   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 6515   PRINGLES         YOUNG FAMILIES           Budget
## 6516     KETTLE         YOUNG FAMILIES           Budget
## 6517     KETTLE         YOUNG FAMILIES           Budget
## 6518       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 6519    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 6520      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 6521       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 6522   CHEEZELS  YOUNG SINGLES/COUPLES       Mainstream
## 6523    DORITOS               RETIREES           Budget
## 6524    DORITOS               RETIREES           Budget
## 6525  INFUZIONS               RETIREES           Budget
## 6526    DORITOS               RETIREES           Budget
## 6527   TWISTIES               RETIREES           Budget
## 6528     INFZNS               RETIREES           Budget
## 6529   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 6530     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 6531     KETTLE               RETIREES          Premium
## 6532       COBS               RETIREES          Premium
## 6533     KETTLE               RETIREES          Premium
## 6534   PRINGLES               RETIREES          Premium
## 6535     KETTLE               RETIREES          Premium
## 6536     DORITO               RETIREES          Premium
## 6537     SMITHS               RETIREES          Premium
## 6538     SMITHS               RETIREES           Budget
## 6539   TYRRELLS               RETIREES           Budget
## 6540   TWISTIES               RETIREES           Budget
## 6541       COBS               RETIREES           Budget
## 6542     SMITHS         YOUNG FAMILIES       Mainstream
## 6543     KETTLE         YOUNG FAMILIES       Mainstream
## 6544     INFZNS               RETIREES           Budget
## 6545     KETTLE               RETIREES           Budget
## 6546      THINS               RETIREES           Budget
## 6547     KETTLE               RETIREES           Budget
## 6548    DORITOS               RETIREES           Budget
## 6549   TWISTIES               RETIREES       Mainstream
## 6550    DORITOS         YOUNG FAMILIES           Budget
## 6551      THINS         YOUNG FAMILIES           Budget
## 6552      THINS         YOUNG FAMILIES           Budget
## 6553    DORITOS         YOUNG FAMILIES           Budget
## 6554       COBS         YOUNG FAMILIES           Budget
## 6555     DORITO         YOUNG FAMILIES           Budget
## 6556  INFUZIONS         YOUNG FAMILIES           Budget
## 6557    DORITOS               RETIREES       Mainstream
## 6558      GRAIN               RETIREES       Mainstream
## 6559   PRINGLES               RETIREES       Mainstream
## 6560  INFUZIONS               RETIREES          Premium
## 6561    DORITOS               RETIREES          Premium
## 6562      THINS               RETIREES          Premium
## 6563    DORITOS               RETIREES          Premium
## 6564   TWISTIES         OLDER FAMILIES       Mainstream
## 6565   TOSTITOS         OLDER FAMILIES       Mainstream
## 6566   CHEEZELS  OLDER SINGLES/COUPLES           Budget
## 6567       COBS  OLDER SINGLES/COUPLES           Budget
## 6568      GRAIN  OLDER SINGLES/COUPLES           Budget
## 6569      THINS  OLDER SINGLES/COUPLES           Budget
## 6570      GRAIN               RETIREES          Premium
## 6571   TYRRELLS               RETIREES          Premium
## 6572   TOSTITOS               RETIREES          Premium
## 6573     KETTLE               RETIREES          Premium
## 6574     KETTLE               RETIREES          Premium
## 6575   PRINGLES               RETIREES          Premium
## 6576     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 6577     SMITHS MIDAGE SINGLES/COUPLES           Budget
## 6578     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 6579   PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 6580     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 6581  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 6582       COBS  OLDER SINGLES/COUPLES           Budget
## 6583    DORITOS  OLDER SINGLES/COUPLES           Budget
## 6584   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 6585   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 6586     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6587      THINS  OLDER SINGLES/COUPLES           Budget
## 6588     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6589       COBS  OLDER SINGLES/COUPLES           Budget
## 6590   PRINGLES               RETIREES       Mainstream
## 6591     INFZNS               RETIREES       Mainstream
## 6592       COBS               RETIREES       Mainstream
## 6593   TWISTIES               RETIREES       Mainstream
## 6594   TWISTIES               RETIREES          Premium
## 6595   TWISTIES               RETIREES          Premium
## 6596   PRINGLES               RETIREES          Premium
## 6597  INFUZIONS               RETIREES          Premium
## 6598  INFUZIONS               RETIREES          Premium
## 6599  INFUZIONS               RETIREES          Premium
## 6600    DORITOS               RETIREES          Premium
## 6601   PRINGLES               RETIREES          Premium
## 6602     KETTLE               RETIREES          Premium
## 6603     KETTLE               RETIREES          Premium
## 6604   PRINGLES               RETIREES          Premium
## 6605   PRINGLES               RETIREES          Premium
## 6606   PRINGLES               RETIREES          Premium
## 6607      THINS               RETIREES          Premium
## 6608       COBS               RETIREES          Premium
## 6609   TYRRELLS  OLDER SINGLES/COUPLES          Premium
## 6610    DORITOS  OLDER SINGLES/COUPLES          Premium
## 6611     KETTLE  OLDER SINGLES/COUPLES          Premium
## 6612  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 6613     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6614   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 6615     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6616   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 6617   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 6618   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 6619    DORITOS               RETIREES           Budget
## 6620      GRAIN               RETIREES           Budget
## 6621     KETTLE               RETIREES          Premium
## 6622  INFUZIONS               RETIREES          Premium
## 6623    DORITOS               RETIREES          Premium
## 6624   PRINGLES               RETIREES          Premium
## 6625     INFZNS               RETIREES          Premium
## 6626     KETTLE               RETIREES          Premium
## 6627      THINS               RETIREES          Premium
## 6628    DORITOS  OLDER SINGLES/COUPLES          Premium
## 6629    DORITOS  OLDER SINGLES/COUPLES          Premium
## 6630     KETTLE  OLDER SINGLES/COUPLES          Premium
## 6631  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 6632    DORITOS               RETIREES           Budget
## 6633       COBS               RETIREES           Budget
## 6634     KETTLE               RETIREES           Budget
## 6635   CHEEZELS  YOUNG SINGLES/COUPLES          Premium
## 6636   TOSTITOS  YOUNG SINGLES/COUPLES          Premium
## 6637   PRINGLES               RETIREES           Budget
## 6638   PRINGLES               RETIREES           Budget
## 6639   PRINGLES               RETIREES           Budget
## 6640     SMITHS               RETIREES           Budget
## 6641     SMITHS               RETIREES           Budget
## 6642     KETTLE               RETIREES           Budget
## 6643   PRINGLES         YOUNG FAMILIES          Premium
## 6644   TOSTITOS         YOUNG FAMILIES          Premium
## 6645     KETTLE         YOUNG FAMILIES          Premium
## 6646    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 6647     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 6648    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 6649    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 6650       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 6651    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 6652    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 6653     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6654     KETTLE         OLDER FAMILIES       Mainstream
## 6655     SMITHS         OLDER FAMILIES       Mainstream
## 6656   TOSTITOS  YOUNG SINGLES/COUPLES           Budget
## 6657   CHEEZELS  YOUNG SINGLES/COUPLES           Budget
## 6658     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 6659    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 6660   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 6661     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 6662   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 6663   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 6664     KETTLE  OLDER SINGLES/COUPLES          Premium
## 6665   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 6666     KETTLE  OLDER SINGLES/COUPLES          Premium
## 6667   CHEEZELS         YOUNG FAMILIES           Budget
## 6668    DORITOS         YOUNG FAMILIES           Budget
## 6669     SMITHS         YOUNG FAMILIES           Budget
## 6670     INFZNS         YOUNG FAMILIES           Budget
## 6671   TYRRELLS         YOUNG FAMILIES           Budget
## 6672      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 6673   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 6674   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 6675   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 6676      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 6677   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 6678       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 6679     INFZNS  YOUNG SINGLES/COUPLES       Mainstream
## 6680   PRINGLES               RETIREES           Budget
## 6681     KETTLE               RETIREES           Budget
## 6682      THINS               RETIREES           Budget
## 6683     KETTLE               RETIREES           Budget
## 6684   TYRRELLS         OLDER FAMILIES          Premium
## 6685       COBS         OLDER FAMILIES          Premium
## 6686     INFZNS         OLDER FAMILIES          Premium
## 6687   TWISTIES         OLDER FAMILIES          Premium
## 6688  INFUZIONS               RETIREES          Premium
## 6689   CHEEZELS               RETIREES          Premium
## 6690     KETTLE               RETIREES          Premium
## 6691   PRINGLES               RETIREES          Premium
## 6692   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 6693   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 6694    DORITOS  OLDER SINGLES/COUPLES           Budget
## 6695       COBS  OLDER SINGLES/COUPLES           Budget
## 6696     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 6697     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 6698   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 6699   TWISTIES MIDAGE SINGLES/COUPLES          Premium
## 6700     KETTLE         OLDER FAMILIES       Mainstream
## 6701   PRINGLES         OLDER FAMILIES       Mainstream
## 6702   PRINGLES         OLDER FAMILIES       Mainstream
## 6703      GRAIN         OLDER FAMILIES       Mainstream
## 6704     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6705     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6706     KETTLE  OLDER SINGLES/COUPLES           Budget
## 6707   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 6708  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 6709   PRINGLES               RETIREES       Mainstream
## 6710   PRINGLES               RETIREES       Mainstream
## 6711     KETTLE               RETIREES       Mainstream
## 6712     DORITO               RETIREES       Mainstream
## 6713     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6714    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 6715    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 6716       COBS MIDAGE SINGLES/COUPLES       Mainstream
## 6717     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 6718     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 6719       COBS MIDAGE SINGLES/COUPLES       Mainstream
## 6720   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 6721    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 6722     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6723     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6724     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6725      THINS  OLDER SINGLES/COUPLES           Budget
## 6726   TYRRELLS  OLDER SINGLES/COUPLES           Budget
## 6727   TYRRELLS  OLDER SINGLES/COUPLES           Budget
## 6728      THINS  OLDER SINGLES/COUPLES           Budget
## 6729      THINS               RETIREES           Budget
## 6730      GRAIN               RETIREES           Budget
## 6731    DORITOS               RETIREES           Budget
## 6732  INFUZIONS               RETIREES           Budget
## 6733    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 6734   TYRRELLS MIDAGE SINGLES/COUPLES       Mainstream
## 6735   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 6736    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 6737    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 6738   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 6739   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 6740   PRINGLES         OLDER FAMILIES           Budget
## 6741    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 6742  INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 6743      GRAIN  YOUNG SINGLES/COUPLES           Budget
## 6744   TWISTIES         YOUNG FAMILIES       Mainstream
## 6745     SMITHS         YOUNG FAMILIES       Mainstream
## 6746     KETTLE         YOUNG FAMILIES       Mainstream
## 6747   TYRRELLS         YOUNG FAMILIES       Mainstream
## 6748      THINS         YOUNG FAMILIES       Mainstream
## 6749   PRINGLES               RETIREES       Mainstream
## 6750     KETTLE               RETIREES       Mainstream
## 6751     SMITHS               RETIREES       Mainstream
## 6752     KETTLE               RETIREES       Mainstream
## 6753     KETTLE               RETIREES       Mainstream
## 6754    DORITOS               RETIREES       Mainstream
## 6755     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6756   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 6757  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 6758    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 6759      GRAIN  OLDER SINGLES/COUPLES       Mainstream
## 6760   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 6761   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 6762   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 6763  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 6764   TOSTITOS         OLDER FAMILIES           Budget
## 6765    DORITOS         OLDER FAMILIES           Budget
## 6766   PRINGLES         OLDER FAMILIES           Budget
## 6767    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 6768   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 6769   TWISTIES MIDAGE SINGLES/COUPLES       Mainstream
## 6770     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 6771  INFUZIONS MIDAGE SINGLES/COUPLES       Mainstream
## 6772       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 6773     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 6774     INFZNS  YOUNG SINGLES/COUPLES       Mainstream
## 6775     DORITO               RETIREES          Premium
## 6776       COBS               RETIREES          Premium
## 6777   TWISTIES               RETIREES          Premium
## 6778     KETTLE               RETIREES          Premium
## 6779   TWISTIES               RETIREES          Premium
## 6780     KETTLE  OLDER SINGLES/COUPLES          Premium
## 6781     SMITHS  OLDER SINGLES/COUPLES          Premium
## 6782   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 6783      GRAIN  OLDER SINGLES/COUPLES          Premium
## 6784  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 6785       COBS  OLDER SINGLES/COUPLES       Mainstream
## 6786     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6787   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 6788     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 6789   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 6790     DORITO  OLDER SINGLES/COUPLES       Mainstream
## 6791     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 6792     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 6793     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 6794      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 6795      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 6796      GRAIN         YOUNG FAMILIES       Mainstream
## 6797     KETTLE         YOUNG FAMILIES       Mainstream
## 6798   TWISTIES         YOUNG FAMILIES       Mainstream
## 6799    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 6800     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6801      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 6802   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 6803       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 6804     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6805   TOSTITOS  YOUNG SINGLES/COUPLES           Budget
## 6806     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 6807     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 6808  INFUZIONS MIDAGE SINGLES/COUPLES          Premium
## 6809   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 6810      GRAIN MIDAGE SINGLES/COUPLES          Premium
## 6811     KETTLE               RETIREES          Premium
## 6812   PRINGLES               RETIREES           Budget
## 6813   TWISTIES               RETIREES           Budget
## 6814     KETTLE               RETIREES           Budget
## 6815      GRAIN  YOUNG SINGLES/COUPLES           Budget
## 6816      THINS         YOUNG FAMILIES       Mainstream
## 6817    DORITOS         YOUNG FAMILIES       Mainstream
## 6818    DORITOS         YOUNG FAMILIES       Mainstream
## 6819      GRAIN         YOUNG FAMILIES       Mainstream
## 6820      THINS         YOUNG FAMILIES       Mainstream
## 6821     KETTLE         YOUNG FAMILIES       Mainstream
## 6822      GRAIN         OLDER FAMILIES          Premium
## 6823    DORITOS         OLDER FAMILIES          Premium
## 6824     INFZNS         OLDER FAMILIES          Premium
## 6825     KETTLE         OLDER FAMILIES          Premium
## 6826      GRAIN         OLDER FAMILIES          Premium
## 6827      THINS         OLDER FAMILIES          Premium
## 6828     INFZNS         OLDER FAMILIES          Premium
## 6829     KETTLE         OLDER FAMILIES          Premium
## 6830     KETTLE         YOUNG FAMILIES           Budget
## 6831    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 6832   TYRRELLS         YOUNG FAMILIES           Budget
## 6833    DORITOS         YOUNG FAMILIES           Budget
## 6834   TWISTIES         YOUNG FAMILIES           Budget
## 6835   TWISTIES         YOUNG FAMILIES           Budget
## 6836     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6837     KETTLE               RETIREES          Premium
## 6838     KETTLE               RETIREES          Premium
## 6839       COBS               RETIREES          Premium
## 6840     SMITHS               RETIREES          Premium
## 6841      THINS               RETIREES          Premium
## 6842  INFUZIONS               RETIREES           Budget
## 6843     SMITHS               RETIREES           Budget
## 6844   PRINGLES               RETIREES           Budget
## 6845     DORITO MIDAGE SINGLES/COUPLES       Mainstream
## 6846      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 6847      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 6848     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 6849   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 6850  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 6851     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6852     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6853   PRINGLES         YOUNG FAMILIES       Mainstream
## 6854   TOSTITOS         YOUNG FAMILIES       Mainstream
## 6855   TOSTITOS         YOUNG FAMILIES       Mainstream
## 6856   PRINGLES         YOUNG FAMILIES       Mainstream
## 6857    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 6858    DORITOS               RETIREES       Mainstream
## 6859     KETTLE               RETIREES       Mainstream
## 6860    DORITOS               RETIREES       Mainstream
## 6861     KETTLE               RETIREES       Mainstream
## 6862   PRINGLES               RETIREES       Mainstream
## 6863    DORITOS               RETIREES       Mainstream
## 6864   PRINGLES               RETIREES       Mainstream
## 6865     KETTLE               RETIREES       Mainstream
## 6866   TYRRELLS               RETIREES       Mainstream
## 6867     KETTLE               RETIREES          Premium
## 6868      THINS               RETIREES          Premium
## 6869   PRINGLES               RETIREES          Premium
## 6870  INFUZIONS               RETIREES          Premium
## 6871      THINS               RETIREES          Premium
## 6872   TOSTITOS               RETIREES           Budget
## 6873   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 6874   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 6875   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 6876     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6877   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 6878     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6879      GRAIN  OLDER SINGLES/COUPLES       Mainstream
## 6880  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 6881   PRINGLES         OLDER FAMILIES           Budget
## 6882     KETTLE         OLDER FAMILIES           Budget
## 6883     KETTLE         OLDER FAMILIES           Budget
## 6884      GRAIN         OLDER FAMILIES           Budget
## 6885      GRAIN         OLDER FAMILIES           Budget
## 6886     KETTLE         OLDER FAMILIES           Budget
## 6887   TWISTIES         OLDER FAMILIES           Budget
## 6888     SMITHS               RETIREES       Mainstream
## 6889       COBS               RETIREES       Mainstream
## 6890       COBS               RETIREES       Mainstream
## 6891     KETTLE               RETIREES       Mainstream
## 6892     DORITO               RETIREES       Mainstream
## 6893   PRINGLES               RETIREES       Mainstream
## 6894  INFUZIONS               RETIREES       Mainstream
## 6895     KETTLE               RETIREES       Mainstream
## 6896     KETTLE               RETIREES           Budget
## 6897      GRAIN  OLDER SINGLES/COUPLES           Budget
## 6898      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 6899     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 6900      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 6901     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 6902     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 6903   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 6904      THINS  YOUNG SINGLES/COUPLES           Budget
## 6905   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 6906   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 6907   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 6908       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 6909      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 6910   TYRRELLS           NEW FAMILIES           Budget
## 6911   PRINGLES           NEW FAMILIES           Budget
## 6912  INFUZIONS           NEW FAMILIES           Budget
## 6913    DORITOS         YOUNG FAMILIES          Premium
## 6914     KETTLE         YOUNG FAMILIES          Premium
## 6915  INFUZIONS         YOUNG FAMILIES          Premium
## 6916     INFZNS         OLDER FAMILIES       Mainstream
## 6917      GRAIN         OLDER FAMILIES       Mainstream
## 6918      GRAIN         OLDER FAMILIES       Mainstream
## 6919   TYRRELLS         OLDER FAMILIES       Mainstream
## 6920    DORITOS  OLDER SINGLES/COUPLES          Premium
## 6921    DORITOS  OLDER SINGLES/COUPLES          Premium
## 6922     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 6923   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 6924  INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 6925     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 6926   TWISTIES  YOUNG SINGLES/COUPLES           Budget
## 6927       COBS  YOUNG SINGLES/COUPLES           Budget
## 6928   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 6929   PRINGLES         YOUNG FAMILIES           Budget
## 6930       COBS         YOUNG FAMILIES           Budget
## 6931  INFUZIONS         YOUNG FAMILIES           Budget
## 6932   TWISTIES         YOUNG FAMILIES           Budget
## 6933   PRINGLES               RETIREES           Budget
## 6934       COBS               RETIREES           Budget
## 6935    DORITOS               RETIREES           Budget
## 6936     KETTLE               RETIREES           Budget
## 6937     KETTLE               RETIREES           Budget
## 6938    DORITOS               RETIREES           Budget
## 6939   TWISTIES         YOUNG FAMILIES           Budget
## 6940     SMITHS         YOUNG FAMILIES           Budget
## 6941   CHEEZELS         OLDER FAMILIES          Premium
## 6942     KETTLE         OLDER FAMILIES          Premium
## 6943      THINS               RETIREES          Premium
## 6944    DORITOS               RETIREES          Premium
## 6945     KETTLE               RETIREES          Premium
## 6946     KETTLE               RETIREES          Premium
## 6947     KETTLE               RETIREES          Premium
## 6948   TYRRELLS MIDAGE SINGLES/COUPLES          Premium
## 6949   TWISTIES               RETIREES       Mainstream
## 6950  INFUZIONS               RETIREES       Mainstream
## 6951     KETTLE               RETIREES       Mainstream
## 6952     SMITHS               RETIREES       Mainstream
## 6953     KETTLE               RETIREES       Mainstream
## 6954     KETTLE         OLDER FAMILIES           Budget
## 6955   PRINGLES         OLDER FAMILIES           Budget
## 6956     KETTLE         OLDER FAMILIES           Budget
## 6957   TOSTITOS MIDAGE SINGLES/COUPLES          Premium
## 6958     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 6959    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 6960       COBS MIDAGE SINGLES/COUPLES          Premium
## 6961   CHEEZELS MIDAGE SINGLES/COUPLES          Premium
## 6962   TOSTITOS           NEW FAMILIES       Mainstream
## 6963   TOSTITOS           NEW FAMILIES       Mainstream
## 6964     KETTLE           NEW FAMILIES       Mainstream
## 6965  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 6966   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 6967     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 6968      GRAIN               RETIREES          Premium
## 6969  INFUZIONS               RETIREES          Premium
## 6970    DORITOS               RETIREES          Premium
## 6971   TWISTIES               RETIREES          Premium
## 6972   TWISTIES               RETIREES          Premium
## 6973     KETTLE               RETIREES          Premium
## 6974   TWISTIES               RETIREES          Premium
## 6975   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 6976   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 6977    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 6978      GRAIN         YOUNG FAMILIES           Budget
## 6979    DORITOS         YOUNG FAMILIES           Budget
## 6980   TWISTIES         YOUNG FAMILIES           Budget
## 6981  INFUZIONS         YOUNG FAMILIES           Budget
## 6982   CHEEZELS         YOUNG FAMILIES           Budget
## 6983   TOSTITOS         YOUNG FAMILIES           Budget
## 6984     KETTLE         YOUNG FAMILIES           Budget
## 6985     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 6986       COBS  YOUNG SINGLES/COUPLES          Premium
## 6987      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 6988    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 6989    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 6990   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 6991       COBS MIDAGE SINGLES/COUPLES       Mainstream
## 6992     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 6993   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 6994     KETTLE         YOUNG FAMILIES           Budget
## 6995   PRINGLES         YOUNG FAMILIES           Budget
## 6996     KETTLE         YOUNG FAMILIES           Budget
## 6997     KETTLE         YOUNG FAMILIES           Budget
## 6998     KETTLE  OLDER SINGLES/COUPLES          Premium
## 6999   TYRRELLS  OLDER SINGLES/COUPLES          Premium
## 7000   TYRRELLS  OLDER SINGLES/COUPLES          Premium
## 7001   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 7002    DORITOS         YOUNG FAMILIES           Budget
## 7003   PRINGLES         YOUNG FAMILIES           Budget
## 7004   TYRRELLS         YOUNG FAMILIES           Budget
## 7005       COBS         YOUNG FAMILIES          Premium
## 7006     KETTLE         YOUNG FAMILIES          Premium
## 7007     KETTLE         YOUNG FAMILIES          Premium
## 7008     KETTLE         YOUNG FAMILIES          Premium
## 7009   TYRRELLS           NEW FAMILIES          Premium
## 7010     KETTLE           NEW FAMILIES          Premium
## 7011    DORITOS           NEW FAMILIES          Premium
## 7012     KETTLE           NEW FAMILIES          Premium
## 7013   PRINGLES               RETIREES       Mainstream
## 7014    DORITOS               RETIREES       Mainstream
## 7015     KETTLE               RETIREES       Mainstream
## 7016   PRINGLES               RETIREES       Mainstream
## 7017    DORITOS               RETIREES       Mainstream
## 7018   TWISTIES               RETIREES       Mainstream
## 7019    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 7020  INFUZIONS MIDAGE SINGLES/COUPLES       Mainstream
## 7021       COBS         YOUNG FAMILIES           Budget
## 7022    DORITOS         YOUNG FAMILIES           Budget
## 7023    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 7024  INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 7025     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 7026   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 7027     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 7028      THINS  OLDER SINGLES/COUPLES       Mainstream
## 7029     KETTLE         OLDER FAMILIES           Budget
## 7030   TWISTIES         OLDER FAMILIES           Budget
## 7031    DORITOS         OLDER FAMILIES           Budget
## 7032   TYRRELLS         OLDER FAMILIES           Budget
## 7033     KETTLE         OLDER FAMILIES           Budget
## 7034  INFUZIONS         OLDER FAMILIES           Budget
## 7035     KETTLE         OLDER FAMILIES           Budget
## 7036      THINS         OLDER FAMILIES           Budget
## 7037   TOSTITOS         OLDER FAMILIES           Budget
## 7038   TYRRELLS         OLDER FAMILIES           Budget
## 7039   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 7040     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7041   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 7042     DORITO               RETIREES          Premium
## 7043     KETTLE               RETIREES          Premium
## 7044    DORITOS               RETIREES          Premium
## 7045      GRAIN               RETIREES          Premium
## 7046   PRINGLES         OLDER FAMILIES          Premium
## 7047    DORITOS         OLDER FAMILIES          Premium
## 7048   TYRRELLS         OLDER FAMILIES          Premium
## 7049     DORITO         OLDER FAMILIES          Premium
## 7050  INFUZIONS         OLDER FAMILIES          Premium
## 7051   TOSTITOS         OLDER FAMILIES          Premium
## 7052   TWISTIES  YOUNG SINGLES/COUPLES           Budget
## 7053      THINS  YOUNG SINGLES/COUPLES           Budget
## 7054      THINS  YOUNG SINGLES/COUPLES           Budget
## 7055     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 7056     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 7057    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 7058    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 7059      GRAIN  YOUNG SINGLES/COUPLES           Budget
## 7060    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 7061     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 7062      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 7063     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 7064   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 7065   TOSTITOS MIDAGE SINGLES/COUPLES          Premium
## 7066      THINS MIDAGE SINGLES/COUPLES          Premium
## 7067     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 7068     KETTLE         YOUNG FAMILIES          Premium
## 7069   TYRRELLS         YOUNG FAMILIES          Premium
## 7070   PRINGLES         YOUNG FAMILIES          Premium
## 7071     KETTLE               RETIREES          Premium
## 7072     KETTLE               RETIREES          Premium
## 7073   PRINGLES               RETIREES          Premium
## 7074  INFUZIONS               RETIREES          Premium
## 7075   PRINGLES           NEW FAMILIES       Mainstream
## 7076     KETTLE           NEW FAMILIES       Mainstream
## 7077     SMITHS           NEW FAMILIES       Mainstream
## 7078       COBS  OLDER SINGLES/COUPLES          Premium
## 7079      THINS  OLDER SINGLES/COUPLES          Premium
## 7080    DORITOS  OLDER SINGLES/COUPLES          Premium
## 7081   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 7082     SMITHS  OLDER SINGLES/COUPLES          Premium
## 7083   TOSTITOS               RETIREES          Premium
## 7084     SMITHS         OLDER FAMILIES           Budget
## 7085    DORITOS         OLDER FAMILIES           Budget
## 7086   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 7087   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 7088      THINS  OLDER SINGLES/COUPLES       Mainstream
## 7089  INFUZIONS               RETIREES          Premium
## 7090     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 7091     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7092    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7093     SMITHS         YOUNG FAMILIES           Budget
## 7094     KETTLE         YOUNG FAMILIES           Budget
## 7095     KETTLE         YOUNG FAMILIES           Budget
## 7096   PRINGLES         YOUNG FAMILIES           Budget
## 7097      GRAIN         YOUNG FAMILIES           Budget
## 7098   PRINGLES               RETIREES           Budget
## 7099     INFZNS               RETIREES           Budget
## 7100   TYRRELLS               RETIREES           Budget
## 7101     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7102    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7103     KETTLE               RETIREES           Budget
## 7104  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 7105      THINS MIDAGE SINGLES/COUPLES           Budget
## 7106     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 7107   TOSTITOS MIDAGE SINGLES/COUPLES           Budget
## 7108    DORITOS MIDAGE SINGLES/COUPLES           Budget
## 7109     KETTLE               RETIREES       Mainstream
## 7110     SMITHS               RETIREES       Mainstream
## 7111   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 7112     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 7113    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 7114   TWISTIES         YOUNG FAMILIES          Premium
## 7115   TWISTIES         YOUNG FAMILIES          Premium
## 7116     KETTLE         OLDER FAMILIES           Budget
## 7117     SMITHS         OLDER FAMILIES           Budget
## 7118     KETTLE         OLDER FAMILIES           Budget
## 7119     KETTLE         OLDER FAMILIES           Budget
## 7120   TWISTIES         OLDER FAMILIES           Budget
## 7121       COBS         OLDER FAMILIES           Budget
## 7122     KETTLE         OLDER FAMILIES           Budget
## 7123     KETTLE               RETIREES       Mainstream
## 7124     INFZNS               RETIREES       Mainstream
## 7125     KETTLE  OLDER SINGLES/COUPLES           Budget
## 7126       COBS  OLDER SINGLES/COUPLES           Budget
## 7127     KETTLE  OLDER SINGLES/COUPLES           Budget
## 7128       COBS         OLDER FAMILIES          Premium
## 7129   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 7130  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 7131     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7132   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 7133   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 7134   TYRRELLS  OLDER SINGLES/COUPLES          Premium
## 7135   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 7136     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 7137    DORITOS  YOUNG SINGLES/COUPLES          Premium
## 7138   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 7139     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7140     SMITHS  OLDER SINGLES/COUPLES          Premium
## 7141      THINS  OLDER SINGLES/COUPLES          Premium
## 7142     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7143     INFZNS         OLDER FAMILIES           Budget
## 7144     KETTLE         OLDER FAMILIES           Budget
## 7145   TWISTIES         OLDER FAMILIES           Budget
## 7146       COBS         OLDER FAMILIES           Budget
## 7147    DORITOS         OLDER FAMILIES           Budget
## 7148   PRINGLES         OLDER FAMILIES           Budget
## 7149       COBS         OLDER FAMILIES           Budget
## 7150   TOSTITOS         OLDER FAMILIES          Premium
## 7151   TWISTIES         OLDER FAMILIES          Premium
## 7152  INFUZIONS         OLDER FAMILIES          Premium
## 7153     KETTLE         OLDER FAMILIES          Premium
## 7154    DORITOS         OLDER FAMILIES          Premium
## 7155   TWISTIES         OLDER FAMILIES          Premium
## 7156     KETTLE         OLDER FAMILIES          Premium
## 7157     KETTLE  OLDER SINGLES/COUPLES           Budget
## 7158    DORITOS  OLDER SINGLES/COUPLES           Budget
## 7159    DORITOS  OLDER SINGLES/COUPLES           Budget
## 7160    DORITOS  OLDER SINGLES/COUPLES           Budget
## 7161     DORITO  OLDER SINGLES/COUPLES           Budget
## 7162    DORITOS  OLDER SINGLES/COUPLES           Budget
## 7163   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 7164   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 7165     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7166     INFZNS           NEW FAMILIES       Mainstream
## 7167       COBS           NEW FAMILIES       Mainstream
## 7168  INFUZIONS           NEW FAMILIES       Mainstream
## 7169   PRINGLES               RETIREES          Premium
## 7170     SMITHS               RETIREES          Premium
## 7171      GRAIN               RETIREES          Premium
## 7172   TWISTIES  YOUNG SINGLES/COUPLES          Premium
## 7173   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 7174   TWISTIES  YOUNG SINGLES/COUPLES           Budget
## 7175     DORITO  YOUNG SINGLES/COUPLES           Budget
## 7176   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 7177   PRINGLES               RETIREES          Premium
## 7178     KETTLE               RETIREES          Premium
## 7179     KETTLE               RETIREES       Mainstream
## 7180    DORITOS  OLDER SINGLES/COUPLES          Premium
## 7181   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 7182     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 7183     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 7184     KETTLE               RETIREES          Premium
## 7185   TOSTITOS               RETIREES          Premium
## 7186   CHEEZELS  YOUNG SINGLES/COUPLES          Premium
## 7187   PRINGLES               RETIREES       Mainstream
## 7188     KETTLE               RETIREES       Mainstream
## 7189     KETTLE         YOUNG FAMILIES       Mainstream
## 7190   PRINGLES         YOUNG FAMILIES       Mainstream
## 7191      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 7192     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7193      THINS  OLDER SINGLES/COUPLES          Premium
## 7194   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 7195     DORITO  YOUNG SINGLES/COUPLES          Premium
## 7196  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 7197     KETTLE         YOUNG FAMILIES       Mainstream
## 7198   PRINGLES         YOUNG FAMILIES       Mainstream
## 7199     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7200    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7201   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7202     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7203   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7204     KETTLE               RETIREES          Premium
## 7205    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7206     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7207     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7208      THINS  OLDER SINGLES/COUPLES       Mainstream
## 7209   TWISTIES               RETIREES          Premium
## 7210     KETTLE               RETIREES          Premium
## 7211      THINS  OLDER SINGLES/COUPLES           Budget
## 7212     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 7213     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 7214       COBS MIDAGE SINGLES/COUPLES       Mainstream
## 7215   TYRRELLS MIDAGE SINGLES/COUPLES       Mainstream
## 7216      GRAIN               RETIREES          Premium
## 7217     KETTLE               RETIREES          Premium
## 7218     KETTLE               RETIREES          Premium
## 7219    DORITOS  OLDER SINGLES/COUPLES          Premium
## 7220     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7221   PRINGLES         OLDER FAMILIES          Premium
## 7222     KETTLE         OLDER FAMILIES          Premium
## 7223     KETTLE         OLDER FAMILIES          Premium
## 7224     DORITO           NEW FAMILIES           Budget
## 7225     INFZNS           NEW FAMILIES           Budget
## 7226     KETTLE         YOUNG FAMILIES          Premium
## 7227    DORITOS  OLDER SINGLES/COUPLES           Budget
## 7228      THINS  OLDER SINGLES/COUPLES           Budget
## 7229     KETTLE  OLDER SINGLES/COUPLES           Budget
## 7230   TWISTIES  YOUNG SINGLES/COUPLES           Budget
## 7231    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 7232      THINS         YOUNG FAMILIES       Mainstream
## 7233    DORITOS         YOUNG FAMILIES       Mainstream
## 7234    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7235     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 7236   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 7237      GRAIN               RETIREES       Mainstream
## 7238   TYRRELLS  OLDER SINGLES/COUPLES           Budget
## 7239       COBS  OLDER SINGLES/COUPLES           Budget
## 7240   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 7241   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7242  INFUZIONS MIDAGE SINGLES/COUPLES          Premium
## 7243    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7244    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7245       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 7246     KETTLE               RETIREES           Budget
## 7247  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 7248     KETTLE               RETIREES       Mainstream
## 7249   PRINGLES               RETIREES       Mainstream
## 7250       COBS               RETIREES       Mainstream
## 7251    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 7252    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 7253    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 7254   TYRRELLS         YOUNG FAMILIES       Mainstream
## 7255   PRINGLES         YOUNG FAMILIES       Mainstream
## 7256      GRAIN         YOUNG FAMILIES       Mainstream
## 7257     KETTLE               RETIREES       Mainstream
## 7258    DORITOS               RETIREES       Mainstream
## 7259   PRINGLES               RETIREES       Mainstream
## 7260      GRAIN MIDAGE SINGLES/COUPLES          Premium
## 7261     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 7262     KETTLE         YOUNG FAMILIES       Mainstream
## 7263      THINS           NEW FAMILIES       Mainstream
## 7264   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 7265     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7266   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 7267     DORITO  OLDER SINGLES/COUPLES       Mainstream
## 7268     KETTLE               RETIREES       Mainstream
## 7269    DORITOS               RETIREES       Mainstream
## 7270   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 7271      THINS         YOUNG FAMILIES          Premium
## 7272   PRINGLES         YOUNG FAMILIES          Premium
## 7273   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7274   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 7275   PRINGLES               RETIREES          Premium
## 7276    DORITOS               RETIREES       Mainstream
## 7277      GRAIN               RETIREES       Mainstream
## 7278    DORITOS         OLDER FAMILIES           Budget
## 7279     KETTLE         OLDER FAMILIES           Budget
## 7280   PRINGLES         OLDER FAMILIES           Budget
## 7281   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 7282     KETTLE               RETIREES       Mainstream
## 7283     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7284   TWISTIES MIDAGE SINGLES/COUPLES       Mainstream
## 7285     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 7286       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 7287     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 7288  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 7289   TWISTIES         OLDER FAMILIES          Premium
## 7290   TWISTIES         YOUNG FAMILIES           Budget
## 7291     KETTLE  OLDER SINGLES/COUPLES           Budget
## 7292     INFZNS  OLDER SINGLES/COUPLES           Budget
## 7293  INFUZIONS  YOUNG SINGLES/COUPLES          Premium
## 7294      THINS  YOUNG SINGLES/COUPLES          Premium
## 7295   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 7296    DORITOS  OLDER SINGLES/COUPLES           Budget
## 7297     KETTLE  OLDER SINGLES/COUPLES           Budget
## 7298   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 7299   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7300   PRINGLES         OLDER FAMILIES       Mainstream
## 7301   TWISTIES  YOUNG SINGLES/COUPLES           Budget
## 7302   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 7303   PRINGLES MIDAGE SINGLES/COUPLES           Budget
## 7304    DORITOS               RETIREES           Budget
## 7305       COBS               RETIREES           Budget
## 7306   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 7307   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 7308      THINS  OLDER SINGLES/COUPLES          Premium
## 7309    DORITOS  OLDER SINGLES/COUPLES          Premium
## 7310      THINS MIDAGE SINGLES/COUPLES          Premium
## 7311     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 7312     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7313   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7314     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 7315  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 7316   PRINGLES               RETIREES       Mainstream
## 7317   CHEEZELS               RETIREES       Mainstream
## 7318     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7319     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7320       COBS MIDAGE SINGLES/COUPLES          Premium
## 7321   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 7322     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 7323     KETTLE         YOUNG FAMILIES          Premium
## 7324   PRINGLES               RETIREES       Mainstream
## 7325  INFUZIONS               RETIREES       Mainstream
## 7326      THINS  OLDER SINGLES/COUPLES          Premium
## 7327     KETTLE               RETIREES       Mainstream
## 7328   PRINGLES               RETIREES          Premium
## 7329     KETTLE               RETIREES          Premium
## 7330   TWISTIES               RETIREES          Premium
## 7331      THINS  OLDER SINGLES/COUPLES          Premium
## 7332   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 7333   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 7334   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7335      GRAIN  OLDER SINGLES/COUPLES          Premium
## 7336     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7337       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 7338    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7339     SMITHS               RETIREES           Budget
## 7340   PRINGLES         YOUNG FAMILIES           Budget
## 7341   PRINGLES         YOUNG FAMILIES           Budget
## 7342   TOSTITOS         YOUNG FAMILIES          Premium
## 7343   PRINGLES         YOUNG FAMILIES          Premium
## 7344      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 7345     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7346      THINS         OLDER FAMILIES           Budget
## 7347    DORITOS         OLDER FAMILIES           Budget
## 7348  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 7349     DORITO               RETIREES           Budget
## 7350       COBS               RETIREES           Budget
## 7351      THINS  OLDER SINGLES/COUPLES       Mainstream
## 7352   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 7353     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 7354     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 7355   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 7356   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7357     KETTLE               RETIREES       Mainstream
## 7358     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7359    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7360     SMITHS               RETIREES           Budget
## 7361      GRAIN               RETIREES           Budget
## 7362   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 7363  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 7364   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 7365     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 7366  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 7367     KETTLE         YOUNG FAMILIES           Budget
## 7368  INFUZIONS         OLDER FAMILIES           Budget
## 7369   TOSTITOS               RETIREES       Mainstream
## 7370     KETTLE               RETIREES       Mainstream
## 7371   PRINGLES               RETIREES       Mainstream
## 7372     KETTLE               RETIREES          Premium
## 7373    DORITOS         OLDER FAMILIES           Budget
## 7374  INFUZIONS         OLDER FAMILIES           Budget
## 7375     KETTLE         OLDER FAMILIES           Budget
## 7376     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7377     KETTLE               RETIREES           Budget
## 7378     KETTLE               RETIREES           Budget
## 7379    DORITOS               RETIREES           Budget
## 7380   PRINGLES               RETIREES           Budget
## 7381      GRAIN               RETIREES           Budget
## 7382     SMITHS  YOUNG SINGLES/COUPLES          Premium
## 7383     INFZNS               RETIREES          Premium
## 7384     KETTLE           NEW FAMILIES           Budget
## 7385    DORITOS           NEW FAMILIES           Budget
## 7386   TOSTITOS               RETIREES           Budget
## 7387     KETTLE               RETIREES           Budget
## 7388   TOSTITOS               RETIREES           Budget
## 7389     KETTLE               RETIREES           Budget
## 7390      THINS         OLDER FAMILIES       Mainstream
## 7391   PRINGLES               RETIREES       Mainstream
## 7392     KETTLE               RETIREES       Mainstream
## 7393   PRINGLES               RETIREES           Budget
## 7394   PRINGLES         YOUNG FAMILIES           Budget
## 7395   PRINGLES         YOUNG FAMILIES           Budget
## 7396   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 7397      GRAIN  OLDER SINGLES/COUPLES           Budget
## 7398   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 7399     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 7400     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7401      THINS  OLDER SINGLES/COUPLES          Premium
## 7402   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 7403       COBS               RETIREES       Mainstream
## 7404     SMITHS               RETIREES       Mainstream
## 7405   TOSTITOS         OLDER FAMILIES           Budget
## 7406       COBS         OLDER FAMILIES          Premium
## 7407     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 7408  INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 7409   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 7410     DORITO  YOUNG SINGLES/COUPLES          Premium
## 7411   TWISTIES  YOUNG SINGLES/COUPLES          Premium
## 7412     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 7413     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 7414     KETTLE               RETIREES       Mainstream
## 7415   TOSTITOS               RETIREES       Mainstream
## 7416   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 7417    DORITOS  YOUNG SINGLES/COUPLES          Premium
## 7418  INFUZIONS         OLDER FAMILIES       Mainstream
## 7419     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7420   PRINGLES         OLDER FAMILIES           Budget
## 7421  INFUZIONS               RETIREES       Mainstream
## 7422     INFZNS  YOUNG SINGLES/COUPLES       Mainstream
## 7423    DORITOS  OLDER SINGLES/COUPLES          Premium
## 7424   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 7425   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 7426    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 7427      GRAIN  YOUNG SINGLES/COUPLES           Budget
## 7428     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 7429      THINS  YOUNG SINGLES/COUPLES          Premium
## 7430   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 7431     SMITHS               RETIREES       Mainstream
## 7432     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7433     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 7434     KETTLE         YOUNG FAMILIES          Premium
## 7435   PRINGLES         YOUNG FAMILIES          Premium
## 7436     DORITO               RETIREES          Premium
## 7437       COBS               RETIREES          Premium
## 7438   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 7439   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 7440   PRINGLES         YOUNG FAMILIES          Premium
## 7441   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7442   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 7443   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7444   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 7445   PRINGLES               RETIREES       Mainstream
## 7446   TWISTIES               RETIREES       Mainstream
## 7447    DORITOS               RETIREES       Mainstream
## 7448     SMITHS               RETIREES       Mainstream
## 7449   PRINGLES               RETIREES          Premium
## 7450     KETTLE         OLDER FAMILIES       Mainstream
## 7451     KETTLE  OLDER SINGLES/COUPLES           Budget
## 7452     KETTLE  OLDER SINGLES/COUPLES           Budget
## 7453     KETTLE  OLDER SINGLES/COUPLES           Budget
## 7454   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 7455  INFUZIONS           NEW FAMILIES          Premium
## 7456    DORITOS           NEW FAMILIES          Premium
## 7457  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 7458   TYRRELLS MIDAGE SINGLES/COUPLES          Premium
## 7459   PRINGLES         YOUNG FAMILIES          Premium
## 7460     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 7461     KETTLE               RETIREES           Budget
## 7462    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7463       COBS  YOUNG SINGLES/COUPLES           Budget
## 7464     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7465       COBS MIDAGE SINGLES/COUPLES       Mainstream
## 7466    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 7467   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 7468     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 7469    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 7470     INFZNS MIDAGE SINGLES/COUPLES       Mainstream
## 7471   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 7472     DORITO  OLDER SINGLES/COUPLES          Premium
## 7473      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 7474      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 7475     KETTLE         OLDER FAMILIES           Budget
## 7476     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7477   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7478   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 7479     KETTLE  OLDER SINGLES/COUPLES           Budget
## 7480     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7481     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7482   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 7483     KETTLE  OLDER SINGLES/COUPLES           Budget
## 7484   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 7485   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7486   PRINGLES         OLDER FAMILIES           Budget
## 7487     KETTLE         OLDER FAMILIES           Budget
## 7488    DORITOS         YOUNG FAMILIES       Mainstream
## 7489      GRAIN         YOUNG FAMILIES       Mainstream
## 7490  INFUZIONS               RETIREES       Mainstream
## 7491   TYRRELLS               RETIREES           Budget
## 7492     KETTLE               RETIREES           Budget
## 7493      THINS               RETIREES           Budget
## 7494     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7495     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7496     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7497    DORITOS               RETIREES          Premium
## 7498   PRINGLES               RETIREES          Premium
## 7499     KETTLE               RETIREES          Premium
## 7500       COBS               RETIREES          Premium
## 7501      GRAIN               RETIREES          Premium
## 7502     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7503     KETTLE           NEW FAMILIES           Budget
## 7504     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7505  INFUZIONS         YOUNG FAMILIES       Mainstream
## 7506      GRAIN  YOUNG SINGLES/COUPLES           Budget
## 7507      THINS  OLDER SINGLES/COUPLES          Premium
## 7508   CHEEZELS  OLDER SINGLES/COUPLES          Premium
## 7509       COBS  OLDER SINGLES/COUPLES       Mainstream
## 7510    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 7511   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 7512       COBS  OLDER SINGLES/COUPLES       Mainstream
## 7513   PRINGLES               RETIREES           Budget
## 7514   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 7515     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7516   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 7517       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 7518   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7519     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 7520   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 7521       COBS  OLDER SINGLES/COUPLES       Mainstream
## 7522      GRAIN  OLDER SINGLES/COUPLES       Mainstream
## 7523   TWISTIES  OLDER SINGLES/COUPLES       Mainstream
## 7524     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 7525  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 7526   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7527   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 7528     KETTLE               RETIREES           Budget
## 7529     KETTLE               RETIREES           Budget
## 7530     KETTLE               RETIREES           Budget
## 7531   TWISTIES               RETIREES           Budget
## 7532   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 7533   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 7534     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7535    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 7536      GRAIN           NEW FAMILIES       Mainstream
## 7537     KETTLE           NEW FAMILIES       Mainstream
## 7538   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 7539  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 7540     SMITHS  OLDER SINGLES/COUPLES          Premium
## 7541     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7542       COBS         YOUNG FAMILIES          Premium
## 7543     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7544   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 7545      THINS  YOUNG SINGLES/COUPLES          Premium
## 7546     KETTLE  OLDER SINGLES/COUPLES           Budget
## 7547   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 7548      GRAIN  OLDER SINGLES/COUPLES           Budget
## 7549     KETTLE  OLDER SINGLES/COUPLES           Budget
## 7550     KETTLE         OLDER FAMILIES          Premium
## 7551   TOSTITOS               RETIREES           Budget
## 7552   PRINGLES               RETIREES           Budget
## 7553     KETTLE               RETIREES           Budget
## 7554     KETTLE               RETIREES          Premium
## 7555    DORITOS               RETIREES          Premium
## 7556   TYRRELLS MIDAGE SINGLES/COUPLES           Budget
## 7557   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 7558     KETTLE MIDAGE SINGLES/COUPLES           Budget
## 7559       COBS MIDAGE SINGLES/COUPLES           Budget
## 7560      THINS MIDAGE SINGLES/COUPLES           Budget
## 7561     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 7562    DORITOS  OLDER SINGLES/COUPLES           Budget
## 7563      THINS         YOUNG FAMILIES       Mainstream
## 7564     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 7565     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 7566   CHEEZELS  OLDER SINGLES/COUPLES       Mainstream
## 7567   TYRRELLS  OLDER SINGLES/COUPLES       Mainstream
## 7568     KETTLE         YOUNG FAMILIES       Mainstream
## 7569  INFUZIONS         YOUNG FAMILIES       Mainstream
## 7570    DORITOS         YOUNG FAMILIES       Mainstream
## 7571     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7572   TOSTITOS  OLDER SINGLES/COUPLES          Premium
## 7573   PRINGLES           NEW FAMILIES          Premium
## 7574     KETTLE           NEW FAMILIES          Premium
## 7575  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 7576    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7577   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 7578   TWISTIES  YOUNG SINGLES/COUPLES           Budget
## 7579     KETTLE               RETIREES          Premium
## 7580     KETTLE               RETIREES          Premium
## 7581   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 7582   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7583       COBS               RETIREES           Budget
## 7584     DORITO               RETIREES       Mainstream
## 7585    DORITOS               RETIREES       Mainstream
## 7586      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 7587     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7588   TOSTITOS         OLDER FAMILIES           Budget
## 7589       COBS         OLDER FAMILIES           Budget
## 7590  INFUZIONS         OLDER FAMILIES           Budget
## 7591   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7592   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 7593      THINS  OLDER SINGLES/COUPLES       Mainstream
## 7594     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 7595   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 7596   PRINGLES               RETIREES          Premium
## 7597    DORITOS               RETIREES          Premium
## 7598   PRINGLES               RETIREES       Mainstream
## 7599     SMITHS         OLDER FAMILIES       Mainstream
## 7600    DORITOS         OLDER FAMILIES       Mainstream
## 7601  INFUZIONS         OLDER FAMILIES       Mainstream
## 7602     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 7603  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 7604   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 7605   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 7606     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 7607     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 7608       COBS  OLDER SINGLES/COUPLES           Budget
## 7609   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7610    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7611  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 7612     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7613     SMITHS         YOUNG FAMILIES           Budget
## 7614     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 7615    DORITOS MIDAGE SINGLES/COUPLES           Budget
## 7616   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7617     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7618    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 7619   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 7620     SMITHS               RETIREES          Premium
## 7621    DORITOS               RETIREES          Premium
## 7622     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 7623   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 7624     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 7625     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7626    DORITOS         YOUNG FAMILIES       Mainstream
## 7627     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7628    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7629  INFUZIONS  YOUNG SINGLES/COUPLES       Mainstream
## 7630     SMITHS               RETIREES       Mainstream
## 7631    DORITOS               RETIREES       Mainstream
## 7632     INFZNS  YOUNG SINGLES/COUPLES       Mainstream
## 7633   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7634     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 7635     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7636   PRINGLES               RETIREES       Mainstream
## 7637    DORITOS               RETIREES       Mainstream
## 7638    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 7639     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 7640      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 7641    DORITOS               RETIREES           Budget
## 7642   TOSTITOS               RETIREES           Budget
## 7643     KETTLE               RETIREES           Budget
## 7644     KETTLE               RETIREES          Premium
## 7645   PRINGLES               RETIREES          Premium
## 7646      GRAIN               RETIREES          Premium
## 7647     KETTLE               RETIREES          Premium
## 7648     SMITHS         YOUNG FAMILIES       Mainstream
## 7649   PRINGLES         YOUNG FAMILIES       Mainstream
## 7650   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 7651     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 7652     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 7653   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 7654     DORITO         OLDER FAMILIES       Mainstream
## 7655     KETTLE         OLDER FAMILIES       Mainstream
## 7656       COBS  YOUNG SINGLES/COUPLES           Budget
## 7657     INFZNS  YOUNG SINGLES/COUPLES           Budget
## 7658      THINS           NEW FAMILIES           Budget
## 7659   TOSTITOS           NEW FAMILIES           Budget
## 7660     KETTLE           NEW FAMILIES           Budget
## 7661  INFUZIONS               RETIREES       Mainstream
## 7662    DORITOS               RETIREES       Mainstream
## 7663  INFUZIONS               RETIREES       Mainstream
## 7664     KETTLE               RETIREES       Mainstream
## 7665     KETTLE               RETIREES       Mainstream
## 7666       COBS MIDAGE SINGLES/COUPLES          Premium
## 7667   CHEEZELS MIDAGE SINGLES/COUPLES          Premium
## 7668      THINS  YOUNG SINGLES/COUPLES           Budget
## 7669     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 7670   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7671      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 7672     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7673     KETTLE         OLDER FAMILIES       Mainstream
## 7674     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 7675     KETTLE               RETIREES       Mainstream
## 7676    DORITOS  OLDER SINGLES/COUPLES           Budget
## 7677   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 7678      SMITH  OLDER SINGLES/COUPLES           Budget
## 7679     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 7680      GRAIN  YOUNG SINGLES/COUPLES       Mainstream
## 7681    NATURAL         YOUNG FAMILIES          Premium
## 7682      SMITH           NEW FAMILIES          Premium
## 7683        RRD           NEW FAMILIES          Premium
## 7684         WW  YOUNG SINGLES/COUPLES           Budget
## 7685        RED  YOUNG SINGLES/COUPLES           Budget
## 7686     SMITHS  OLDER SINGLES/COUPLES          Premium
## 7687   CHEEZELS  OLDER SINGLES/COUPLES          Premium
## 7688     SMITHS               RETIREES       Mainstream
## 7689  INFUZIONS               RETIREES       Mainstream
## 7690      THINS               RETIREES       Mainstream
## 7691   PRINGLES               RETIREES       Mainstream
## 7692     KETTLE               RETIREES       Mainstream
## 7693     KETTLE               RETIREES       Mainstream
## 7694 WOOLWORTHS  OLDER SINGLES/COUPLES          Premium
## 7695     KETTLE  OLDER SINGLES/COUPLES          Premium
## 7696        RRD  OLDER SINGLES/COUPLES       Mainstream
## 7697        RRD  OLDER SINGLES/COUPLES       Mainstream
## 7698     SMITHS  OLDER SINGLES/COUPLES          Premium
## 7699        CCS  OLDER SINGLES/COUPLES          Premium
## 7700        RRD  OLDER SINGLES/COUPLES          Premium
## 7701   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 7702         WW  OLDER SINGLES/COUPLES          Premium
## 7703     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 7704     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 7705        RRD MIDAGE SINGLES/COUPLES          Premium
## 7706     SMITHS         YOUNG FAMILIES       Mainstream
## 7707   TWISTIES               RETIREES       Mainstream
## 7708   TWISTIES               RETIREES       Mainstream
## 7709   CHEEZELS               RETIREES       Mainstream
## 7710     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 7711   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7712     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 7713     KETTLE           NEW FAMILIES           Budget
## 7714         WW           NEW FAMILIES           Budget
## 7715   PRINGLES           NEW FAMILIES           Budget
## 7716     SMITHS           NEW FAMILIES           Budget
## 7717     KETTLE         OLDER FAMILIES       Mainstream
## 7718     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 7719     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 7720  INFUZIONS  YOUNG SINGLES/COUPLES          Premium
## 7721   PRINGLES               RETIREES       Mainstream
## 7722     SMITHS               RETIREES       Mainstream
## 7723     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7724         WW  YOUNG SINGLES/COUPLES           Budget
## 7725        RRD         OLDER FAMILIES       Mainstream
## 7726   PRINGLES               RETIREES           Budget
## 7727     KETTLE         OLDER FAMILIES           Budget
## 7728        CCS         OLDER FAMILIES          Premium
## 7729     KETTLE         OLDER FAMILIES          Premium
## 7730   PRINGLES         OLDER FAMILIES          Premium
## 7731     KETTLE         OLDER FAMILIES          Premium
## 7732     SMITHS         OLDER FAMILIES          Premium
## 7733     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 7734  INFUZIONS               RETIREES           Budget
## 7735     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7736    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7737        CCS         YOUNG FAMILIES       Mainstream
## 7738    CHEETOS         YOUNG FAMILIES       Mainstream
## 7739        RRD         YOUNG FAMILIES       Mainstream
## 7740   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 7741    DORITOS         OLDER FAMILIES           Budget
## 7742   CHEEZELS         OLDER FAMILIES           Budget
## 7743   TWISTIES         OLDER FAMILIES           Budget
## 7744        CCS         OLDER FAMILIES           Budget
## 7745     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 7746      SNBTS  YOUNG SINGLES/COUPLES           Budget
## 7747    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 7748        RRD  YOUNG SINGLES/COUPLES           Budget
## 7749         WW  OLDER SINGLES/COUPLES       Mainstream
## 7750     SMITHS  YOUNG SINGLES/COUPLES          Premium
## 7751    GRNWVES  YOUNG SINGLES/COUPLES          Premium
## 7752         WW  YOUNG SINGLES/COUPLES          Premium
## 7753   TOSTITOS         OLDER FAMILIES          Premium
## 7754   TOSTITOS         OLDER FAMILIES          Premium
## 7755   SUNBITES  YOUNG SINGLES/COUPLES          Premium
## 7756      SMITH  YOUNG SINGLES/COUPLES          Premium
## 7757      SMITH               RETIREES          Premium
## 7758     KETTLE               RETIREES           Budget
## 7759   PRINGLES               RETIREES          Premium
## 7760    CHEETOS               RETIREES          Premium
## 7761   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 7762   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7763   PRINGLES         YOUNG FAMILIES           Budget
## 7764     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7765    NATURAL  YOUNG SINGLES/COUPLES       Mainstream
## 7766        RRD  YOUNG SINGLES/COUPLES       Mainstream
## 7767      GRAIN  YOUNG SINGLES/COUPLES          Premium
## 7768      GRAIN MIDAGE SINGLES/COUPLES       Mainstream
## 7769      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 7770     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7771        RED  OLDER SINGLES/COUPLES       Mainstream
## 7772        RRD               RETIREES       Mainstream
## 7773   CHEEZELS               RETIREES       Mainstream
## 7774   PRINGLES               RETIREES       Mainstream
## 7775    NATURAL               RETIREES          Premium
## 7776      THINS  OLDER SINGLES/COUPLES           Budget
## 7777        RRD               RETIREES           Budget
## 7778      SNBTS  OLDER SINGLES/COUPLES       Mainstream
## 7779     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 7780         WW  OLDER SINGLES/COUPLES       Mainstream
## 7781      THINS  OLDER SINGLES/COUPLES       Mainstream
## 7782     KETTLE               RETIREES       Mainstream
## 7783      SMITH           NEW FAMILIES       Mainstream
## 7784        RRD  OLDER SINGLES/COUPLES           Budget
## 7785    DORITOS  OLDER SINGLES/COUPLES           Budget
## 7786    NATURAL         YOUNG FAMILIES           Budget
## 7787        CCS         YOUNG FAMILIES           Budget
## 7788      SMITH  YOUNG SINGLES/COUPLES           Budget
## 7789     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 7790     SMITHS               RETIREES       Mainstream
## 7791     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 7792     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 7793       COBS               RETIREES       Mainstream
## 7794     SMITHS               RETIREES       Mainstream
## 7795         WW               RETIREES           Budget
## 7796   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 7797         WW  YOUNG SINGLES/COUPLES          Premium
## 7798   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 7799    DORITOS               RETIREES          Premium
## 7800      SMITH               RETIREES          Premium
## 7801         WW               RETIREES       Mainstream
## 7802         WW               RETIREES       Mainstream
## 7803     BURGER  YOUNG SINGLES/COUPLES          Premium
## 7804     SMITHS  OLDER SINGLES/COUPLES          Premium
## 7805        RRD  OLDER SINGLES/COUPLES       Mainstream
## 7806         WW               RETIREES          Premium
## 7807    NATURAL               RETIREES          Premium
## 7808         WW               RETIREES          Premium
## 7809   SUNBITES               RETIREES       Mainstream
## 7810   TOSTITOS               RETIREES       Mainstream
## 7811 WOOLWORTHS  YOUNG SINGLES/COUPLES           Budget
## 7812   TYRRELLS  YOUNG SINGLES/COUPLES           Budget
## 7813    NATURAL  YOUNG SINGLES/COUPLES           Budget
## 7814         WW  YOUNG SINGLES/COUPLES           Budget
## 7815        RRD  YOUNG SINGLES/COUPLES           Budget
## 7816      SMITH  OLDER SINGLES/COUPLES          Premium
## 7817  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 7818        CCS  OLDER SINGLES/COUPLES       Mainstream
## 7819      SMITH  OLDER SINGLES/COUPLES       Mainstream
## 7820      THINS  OLDER SINGLES/COUPLES           Budget
## 7821     SMITHS  OLDER SINGLES/COUPLES           Budget
## 7822   TWISTIES  OLDER SINGLES/COUPLES           Budget
## 7823       COBS         OLDER FAMILIES          Premium
## 7824        CCS  YOUNG SINGLES/COUPLES           Budget
## 7825     SMITHS           NEW FAMILIES           Budget
## 7826      THINS  YOUNG SINGLES/COUPLES           Budget
## 7827     KETTLE         OLDER FAMILIES           Budget
## 7828      THINS         OLDER FAMILIES           Budget
## 7829     DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 7830   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 7831    DORITOS  YOUNG SINGLES/COUPLES          Premium
## 7832      THINS  YOUNG SINGLES/COUPLES          Premium
## 7833     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 7834   TWISTIES MIDAGE SINGLES/COUPLES          Premium
## 7835     KETTLE         YOUNG FAMILIES       Mainstream
## 7836     SMITHS  YOUNG SINGLES/COUPLES          Premium
## 7837      GRAIN  YOUNG SINGLES/COUPLES           Budget
## 7838     SMITHS               RETIREES          Premium
## 7839    DORITOS  OLDER SINGLES/COUPLES           Budget
## 7840     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 7841    GRNWVES MIDAGE SINGLES/COUPLES           Budget
## 7842       COBS         YOUNG FAMILIES           Budget
## 7843        RRD           NEW FAMILIES       Mainstream
## 7844     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 7845        CCS  YOUNG SINGLES/COUPLES           Budget
## 7846    NATURAL  YOUNG SINGLES/COUPLES           Budget
## 7847         WW  OLDER SINGLES/COUPLES          Premium
## 7848         WW  OLDER SINGLES/COUPLES          Premium
## 7849     KETTLE               RETIREES       Mainstream
## 7850    GRNWVES               RETIREES       Mainstream
## 7851    NATURAL MIDAGE SINGLES/COUPLES          Premium
## 7852    NATURAL MIDAGE SINGLES/COUPLES          Premium
## 7853     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 7854     KETTLE         OLDER FAMILIES           Budget
## 7855   TOSTITOS         OLDER FAMILIES           Budget
## 7856     SMITHS         OLDER FAMILIES           Budget
## 7857        RED         OLDER FAMILIES           Budget
## 7858         WW  OLDER SINGLES/COUPLES           Budget
## 7859        RRD  YOUNG SINGLES/COUPLES           Budget
## 7860    DORITOS               RETIREES       Mainstream
## 7861     INFZNS  OLDER SINGLES/COUPLES       Mainstream
## 7862    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 7863      THINS  YOUNG SINGLES/COUPLES           Budget
## 7864      THINS  YOUNG SINGLES/COUPLES           Budget
## 7865      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 7866  INFUZIONS               RETIREES           Budget
## 7867   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7868         WW MIDAGE SINGLES/COUPLES          Premium
## 7869      THINS         OLDER FAMILIES           Budget
## 7870   TYRRELLS               RETIREES           Budget
## 7871   TOSTITOS MIDAGE SINGLES/COUPLES       Mainstream
## 7872   SUNBITES         YOUNG FAMILIES       Mainstream
## 7873   SUNBITES               RETIREES           Budget
## 7874         WW               RETIREES           Budget
## 7875  INFUZIONS               RETIREES          Premium
## 7876     SMITHS               RETIREES          Premium
## 7877   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7878        RRD  YOUNG SINGLES/COUPLES       Mainstream
## 7879        CCS MIDAGE SINGLES/COUPLES       Mainstream
## 7880  INFUZIONS  OLDER SINGLES/COUPLES          Premium
## 7881    NATURAL  OLDER SINGLES/COUPLES          Premium
## 7882    DORITOS  OLDER SINGLES/COUPLES          Premium
## 7883         WW  OLDER SINGLES/COUPLES          Premium
## 7884     SMITHS  OLDER SINGLES/COUPLES           Budget
## 7885     KETTLE  OLDER SINGLES/COUPLES           Budget
## 7886     SMITHS  OLDER SINGLES/COUPLES           Budget
## 7887   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7888         WW           NEW FAMILIES           Budget
## 7889        RRD         OLDER FAMILIES           Budget
## 7890   TWISTIES         OLDER FAMILIES           Budget
## 7891    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 7892   TOSTITOS MIDAGE SINGLES/COUPLES          Premium
## 7893     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 7894        RRD         OLDER FAMILIES           Budget
## 7895    NATURAL         OLDER FAMILIES           Budget
## 7896     FRENCH         OLDER FAMILIES           Budget
## 7897   PRINGLES         OLDER FAMILIES           Budget
## 7898    NATURAL  YOUNG SINGLES/COUPLES          Premium
## 7899     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 7900        RRD  YOUNG SINGLES/COUPLES           Budget
## 7901    DORITOS  YOUNG SINGLES/COUPLES          Premium
## 7902   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7903     FRENCH  YOUNG SINGLES/COUPLES           Budget
## 7904    DORITOS         OLDER FAMILIES           Budget
## 7905        CCS  YOUNG SINGLES/COUPLES          Premium
## 7906         WW  YOUNG SINGLES/COUPLES          Premium
## 7907    DORITOS               RETIREES          Premium
## 7908         WW               RETIREES          Premium
## 7909    DORITOS               RETIREES          Premium
## 7910         WW  YOUNG SINGLES/COUPLES          Premium
## 7911         WW           NEW FAMILIES           Budget
## 7912     SMITHS           NEW FAMILIES           Budget
## 7913    NATURAL           NEW FAMILIES           Budget
## 7914        NCC           NEW FAMILIES           Budget
## 7915        RRD  YOUNG SINGLES/COUPLES       Mainstream
## 7916     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 7917   SUNBITES  YOUNG SINGLES/COUPLES       Mainstream
## 7918         WW  YOUNG SINGLES/COUPLES       Mainstream
## 7919        RRD  YOUNG SINGLES/COUPLES       Mainstream
## 7920   TOSTITOS         YOUNG FAMILIES           Budget
## 7921         WW         YOUNG FAMILIES           Budget
## 7922     KETTLE         YOUNG FAMILIES           Budget
## 7923    NATURAL  YOUNG SINGLES/COUPLES           Budget
## 7924   TOSTITOS MIDAGE SINGLES/COUPLES           Budget
## 7925      THINS  OLDER SINGLES/COUPLES       Mainstream
## 7926  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 7927   TWISTIES MIDAGE SINGLES/COUPLES           Budget
## 7928      GRAIN MIDAGE SINGLES/COUPLES           Budget
## 7929     SMITHS           NEW FAMILIES           Budget
## 7930 WOOLWORTHS MIDAGE SINGLES/COUPLES           Budget
## 7931  INFUZIONS         OLDER FAMILIES          Premium
## 7932    GRNWVES  YOUNG SINGLES/COUPLES       Mainstream
## 7933    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 7934  INFUZIONS           NEW FAMILIES           Budget
## 7935   TWISTIES         OLDER FAMILIES           Budget
## 7936  INFUZIONS         OLDER FAMILIES           Budget
## 7937         WW  YOUNG SINGLES/COUPLES       Mainstream
## 7938    CHEETOS  YOUNG SINGLES/COUPLES       Mainstream
## 7939      SMITH  OLDER SINGLES/COUPLES           Budget
## 7940    NATURAL  OLDER SINGLES/COUPLES           Budget
## 7941    CHEETOS         YOUNG FAMILIES       Mainstream
## 7942   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 7943        RRD MIDAGE SINGLES/COUPLES          Premium
## 7944        RED MIDAGE SINGLES/COUPLES          Premium
## 7945     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 7946     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 7947        RED  OLDER SINGLES/COUPLES           Budget
## 7948     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 7949      THINS  OLDER SINGLES/COUPLES          Premium
## 7950    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 7951    DORITOS MIDAGE SINGLES/COUPLES          Premium
## 7952     SMITHS               RETIREES          Premium
## 7953     KETTLE               RETIREES          Premium
## 7954        RRD           NEW FAMILIES       Mainstream
## 7955     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 7956      GRAIN MIDAGE SINGLES/COUPLES       Mainstream
## 7957     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 7958     SMITHS  YOUNG SINGLES/COUPLES          Premium
## 7959     INFZNS MIDAGE SINGLES/COUPLES       Mainstream
## 7960        NCC MIDAGE SINGLES/COUPLES       Mainstream
## 7961     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 7962 WOOLWORTHS               RETIREES           Budget
## 7963         WW               RETIREES           Budget
## 7964   PRINGLES  OLDER SINGLES/COUPLES          Premium
## 7965     SMITHS  YOUNG SINGLES/COUPLES          Premium
## 7966   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 7967   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 7968   TOSTITOS  YOUNG SINGLES/COUPLES          Premium
## 7969     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 7970  INFUZIONS         YOUNG FAMILIES           Budget
## 7971     SMITHS         YOUNG FAMILIES           Budget
## 7972     KETTLE  OLDER SINGLES/COUPLES           Budget
## 7973    DORITOS  OLDER SINGLES/COUPLES           Budget
## 7974  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 7975     KETTLE  OLDER SINGLES/COUPLES           Budget
## 7976        RED  OLDER SINGLES/COUPLES           Budget
## 7977    NATURAL  OLDER SINGLES/COUPLES           Budget
## 7978     SMITHS         OLDER FAMILIES           Budget
## 7979   PRINGLES               RETIREES           Budget
## 7980   CHEEZELS               RETIREES           Budget
## 7981     KETTLE         YOUNG FAMILIES          Premium
## 7982   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 7983       COBS  OLDER SINGLES/COUPLES       Mainstream
## 7984    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 7985     KETTLE               RETIREES          Premium
## 7986     KETTLE               RETIREES          Premium
## 7987        RRD               RETIREES          Premium
## 7988        RRD         OLDER FAMILIES           Budget
## 7989      SMITH  OLDER SINGLES/COUPLES          Premium
## 7990   TWISTIES  OLDER SINGLES/COUPLES          Premium
## 7991         WW         YOUNG FAMILIES           Budget
## 7992        RRD MIDAGE SINGLES/COUPLES           Budget
## 7993  INFUZIONS MIDAGE SINGLES/COUPLES           Budget
## 7994     KETTLE         YOUNG FAMILIES       Mainstream
## 7995    DORITOS         YOUNG FAMILIES       Mainstream
## 7996   PRINGLES         YOUNG FAMILIES       Mainstream
## 7997        CCS MIDAGE SINGLES/COUPLES          Premium
## 7998     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 7999   CHEEZELS           NEW FAMILIES           Budget
## 8000       COBS MIDAGE SINGLES/COUPLES           Budget
## 8001    DORITOS MIDAGE SINGLES/COUPLES           Budget
## 8002    NATURAL  YOUNG SINGLES/COUPLES           Budget
## 8003     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 8004   CHEEZELS           NEW FAMILIES           Budget
## 8005     SMITHS           NEW FAMILIES           Budget
## 8006     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 8007   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 8008    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 8009      GRAIN  YOUNG SINGLES/COUPLES           Budget
## 8010  INFUZIONS  YOUNG SINGLES/COUPLES           Budget
## 8011     KETTLE         OLDER FAMILIES           Budget
## 8012    DORITOS               RETIREES       Mainstream
## 8013     BURGER               RETIREES       Mainstream
## 8014    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 8015     SMITHS  YOUNG SINGLES/COUPLES          Premium
## 8016        RRD  YOUNG SINGLES/COUPLES          Premium
## 8017        RRD         OLDER FAMILIES           Budget
## 8018     KETTLE         OLDER FAMILIES           Budget
## 8019      SNBTS         OLDER FAMILIES           Budget
## 8020         WW         OLDER FAMILIES           Budget
## 8021        RED               RETIREES       Mainstream
## 8022         WW               RETIREES       Mainstream
## 8023        NCC               RETIREES       Mainstream
## 8024      THINS  YOUNG SINGLES/COUPLES          Premium
## 8025        RED  YOUNG SINGLES/COUPLES          Premium
## 8026        RRD               RETIREES       Mainstream
## 8027         WW               RETIREES       Mainstream
## 8028         WW  YOUNG SINGLES/COUPLES          Premium
## 8029     KETTLE  OLDER SINGLES/COUPLES          Premium
## 8030    CHEETOS  OLDER SINGLES/COUPLES          Premium
## 8031   CHEEZELS  OLDER SINGLES/COUPLES          Premium
## 8032     KETTLE  OLDER SINGLES/COUPLES       Mainstream
## 8033        CCS  OLDER SINGLES/COUPLES       Mainstream
## 8034         WW  OLDER SINGLES/COUPLES       Mainstream
## 8035     SMITHS               RETIREES          Premium
## 8036    DORITOS               RETIREES          Premium
## 8037        RED  YOUNG SINGLES/COUPLES          Premium
## 8038     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 8039    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 8040  INFUZIONS  OLDER SINGLES/COUPLES       Mainstream
## 8041     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 8042      SNBTS  YOUNG SINGLES/COUPLES       Mainstream
## 8043   TYRRELLS         YOUNG FAMILIES           Budget
## 8044   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 8045   CHEEZELS MIDAGE SINGLES/COUPLES       Mainstream
## 8046   TWISTIES MIDAGE SINGLES/COUPLES       Mainstream
## 8047         WW               RETIREES           Budget
## 8048      SNBTS               RETIREES           Budget
## 8049        RED               RETIREES           Budget
## 8050    CHEETOS               RETIREES           Budget
## 8051     KETTLE         YOUNG FAMILIES           Budget
## 8052    DORITOS         YOUNG FAMILIES           Budget
## 8053         WW  YOUNG SINGLES/COUPLES           Budget
## 8054   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 8055        RED  YOUNG SINGLES/COUPLES          Premium
## 8056        RRD  YOUNG SINGLES/COUPLES       Mainstream
## 8057        RED  YOUNG SINGLES/COUPLES       Mainstream
## 8058     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 8059   TYRRELLS         OLDER FAMILIES           Budget
## 8060     FRENCH         OLDER FAMILIES       Mainstream
## 8061     SMITHS         OLDER FAMILIES       Mainstream
## 8062        RRD  YOUNG SINGLES/COUPLES           Budget
## 8063    GRNWVES  YOUNG SINGLES/COUPLES           Budget
## 8064     SMITHS         YOUNG FAMILIES       Mainstream
## 8065     KETTLE         YOUNG FAMILIES       Mainstream
## 8066    DORITOS         YOUNG FAMILIES       Mainstream
## 8067        NCC  YOUNG SINGLES/COUPLES       Mainstream
## 8068     BURGER         OLDER FAMILIES           Budget
## 8069    DORITOS         OLDER FAMILIES           Budget
## 8070      THINS         OLDER FAMILIES           Budget
## 8071      THINS         OLDER FAMILIES           Budget
## 8072     SMITHS  OLDER SINGLES/COUPLES          Premium
## 8073     SMITHS  OLDER SINGLES/COUPLES          Premium
## 8074        RRD  OLDER SINGLES/COUPLES          Premium
## 8075     KETTLE  OLDER SINGLES/COUPLES          Premium
## 8076     FRENCH  YOUNG SINGLES/COUPLES           Budget
## 8077     KETTLE         YOUNG FAMILIES       Mainstream
## 8078        CCS         YOUNG FAMILIES       Mainstream
## 8079     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 8080        RED  OLDER SINGLES/COUPLES       Mainstream
## 8081     SMITHS               RETIREES           Budget
## 8082   TWISTIES               RETIREES           Budget
## 8083     KETTLE               RETIREES           Budget
## 8084     SMITHS  OLDER SINGLES/COUPLES           Budget
## 8085     KETTLE  OLDER SINGLES/COUPLES           Budget
## 8086     SMITHS  OLDER SINGLES/COUPLES           Budget
## 8087     KETTLE  OLDER SINGLES/COUPLES           Budget
## 8088    DORITOS               RETIREES       Mainstream
## 8089     BURGER               RETIREES       Mainstream
## 8090        RRD               RETIREES       Mainstream
## 8091   PRINGLES               RETIREES       Mainstream
## 8092     SMITHS         OLDER FAMILIES           Budget
## 8093    NATURAL           NEW FAMILIES           Budget
## 8094   PRINGLES           NEW FAMILIES           Budget
## 8095  INFUZIONS         OLDER FAMILIES          Premium
## 8096   TWISTIES         OLDER FAMILIES          Premium
## 8097     KETTLE               RETIREES          Premium
## 8098     SMITHS               RETIREES       Mainstream
## 8099     KETTLE               RETIREES       Mainstream
## 8100      THINS               RETIREES       Mainstream
## 8101    DORITOS               RETIREES       Mainstream
## 8102        RRD               RETIREES       Mainstream
## 8103      GRAIN               RETIREES       Mainstream
## 8104    CHEETOS MIDAGE SINGLES/COUPLES          Premium
## 8105         WW MIDAGE SINGLES/COUPLES          Premium
## 8106       COBS               RETIREES           Budget
## 8107     SMITHS               RETIREES           Budget
## 8108   PRINGLES MIDAGE SINGLES/COUPLES          Premium
## 8109     KETTLE MIDAGE SINGLES/COUPLES          Premium
## 8110    DORITOS               RETIREES          Premium
## 8111     KETTLE               RETIREES          Premium
## 8112    GRNWVES               RETIREES          Premium
## 8113        RRD               RETIREES          Premium
## 8114     SMITHS               RETIREES          Premium
## 8115     KETTLE           NEW FAMILIES       Mainstream
## 8116    CHEETOS           NEW FAMILIES       Mainstream
## 8117         WW  OLDER SINGLES/COUPLES       Mainstream
## 8118     SMITHS  YOUNG SINGLES/COUPLES           Budget
## 8119     SMITHS         OLDER FAMILIES       Mainstream
## 8120     SMITHS           NEW FAMILIES       Mainstream
## 8121      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 8122      THINS               RETIREES          Premium
## 8123   PRINGLES               RETIREES          Premium
## 8124   TOSTITOS               RETIREES          Premium
## 8125         WW               RETIREES          Premium
## 8126     KETTLE               RETIREES          Premium
## 8127    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 8128        RRD  YOUNG SINGLES/COUPLES           Budget
## 8129       COBS  YOUNG SINGLES/COUPLES           Budget
## 8130      THINS         OLDER FAMILIES       Mainstream
## 8131     KETTLE         OLDER FAMILIES       Mainstream
## 8132     SMITHS         YOUNG FAMILIES          Premium
## 8133     BURGER         YOUNG FAMILIES          Premium
## 8134        RRD  OLDER SINGLES/COUPLES           Budget
## 8135    CHEETOS         OLDER FAMILIES           Budget
## 8136     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 8137     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 8138 WOOLWORTHS  YOUNG SINGLES/COUPLES           Budget
## 8139    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 8140    CHEETOS  OLDER SINGLES/COUPLES       Mainstream
## 8141   PRINGLES               RETIREES           Budget
## 8142   TOSTITOS  YOUNG SINGLES/COUPLES       Mainstream
## 8143     KETTLE  OLDER SINGLES/COUPLES           Budget
## 8144        RED         OLDER FAMILIES           Budget
## 8145    NATURAL         OLDER FAMILIES           Budget
## 8146     SMITHS               RETIREES           Budget
## 8147      THINS  YOUNG SINGLES/COUPLES       Mainstream
## 8148   TYRRELLS  YOUNG SINGLES/COUPLES       Mainstream
## 8149     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 8150        RRD         OLDER FAMILIES       Mainstream
## 8151     SMITHS         OLDER FAMILIES       Mainstream
## 8152     BURGER  YOUNG SINGLES/COUPLES           Budget
## 8153    NATURAL  YOUNG SINGLES/COUPLES          Premium
## 8154    DORITOS  YOUNG SINGLES/COUPLES          Premium
## 8155   TWISTIES               RETIREES       Mainstream
## 8156     KETTLE               RETIREES       Mainstream
## 8157   PRINGLES  YOUNG SINGLES/COUPLES           Budget
## 8158      SMITH  YOUNG SINGLES/COUPLES           Budget
## 8159     FRENCH  YOUNG SINGLES/COUPLES           Budget
## 8160     KETTLE         OLDER FAMILIES           Budget
## 8161        RRD         OLDER FAMILIES           Budget
## 8162   PRINGLES         YOUNG FAMILIES           Budget
## 8163   PRINGLES         YOUNG FAMILIES           Budget
## 8164    GRNWVES         YOUNG FAMILIES           Budget
## 8165   TWISTIES         YOUNG FAMILIES           Budget
## 8166   PRINGLES         YOUNG FAMILIES           Budget
## 8167         WW MIDAGE SINGLES/COUPLES          Premium
## 8168        RED         OLDER FAMILIES       Mainstream
## 8169     KETTLE         OLDER FAMILIES       Mainstream
## 8170   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 8171     SMITHS         YOUNG FAMILIES          Premium
## 8172        RRD         YOUNG FAMILIES          Premium
## 8173    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 8174    NATURAL MIDAGE SINGLES/COUPLES       Mainstream
## 8175   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 8176   PRINGLES MIDAGE SINGLES/COUPLES       Mainstream
## 8177        NCC MIDAGE SINGLES/COUPLES       Mainstream
## 8178   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 8179     SMITHS  OLDER SINGLES/COUPLES       Mainstream
## 8180   PRINGLES  OLDER SINGLES/COUPLES       Mainstream
## 8181        CCS  OLDER SINGLES/COUPLES       Mainstream
## 8182       COBS  YOUNG SINGLES/COUPLES       Mainstream
## 8183        RRD  OLDER SINGLES/COUPLES          Premium
## 8184    DORITOS               RETIREES           Budget
## 8185        RED               RETIREES           Budget
## 8186     KETTLE               RETIREES           Budget
## 8187     SMITHS MIDAGE SINGLES/COUPLES       Mainstream
## 8188      THINS MIDAGE SINGLES/COUPLES       Mainstream
## 8189    NATURAL  OLDER SINGLES/COUPLES           Budget
## 8190    DORITOS  OLDER SINGLES/COUPLES           Budget
## 8191     KETTLE  OLDER SINGLES/COUPLES          Premium
## 8192     SMITHS MIDAGE SINGLES/COUPLES           Budget
## 8193   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 8194         WW  OLDER SINGLES/COUPLES       Mainstream
## 8195   TWISTIES         OLDER FAMILIES       Mainstream
## 8196      GRAIN               RETIREES          Premium
## 8197     KETTLE MIDAGE SINGLES/COUPLES       Mainstream
## 8198     KETTLE  YOUNG SINGLES/COUPLES       Mainstream
## 8199    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 8200     INFZNS  YOUNG SINGLES/COUPLES          Premium
## 8201    NATURAL  OLDER SINGLES/COUPLES           Budget
## 8202     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 8203  INFUZIONS         YOUNG FAMILIES          Premium
## 8204   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 8205      THINS  YOUNG SINGLES/COUPLES          Premium
## 8206   PRINGLES  YOUNG SINGLES/COUPLES          Premium
## 8207    DORITOS  YOUNG SINGLES/COUPLES       Mainstream
## 8208         WW  YOUNG SINGLES/COUPLES       Mainstream
## 8209   TWISTIES  YOUNG SINGLES/COUPLES       Mainstream
## 8210  INFUZIONS               RETIREES           Budget
## 8211  INFUZIONS               RETIREES           Budget
## 8212         WW               RETIREES          Premium
## 8213        NCC               RETIREES          Premium
## 8214        RRD           NEW FAMILIES          Premium
## 8215         WW           NEW FAMILIES          Premium
## 8216    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 8217    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 8218   TOSTITOS         YOUNG FAMILIES           Budget
## 8219   TOSTITOS         YOUNG FAMILIES           Budget
## 8220     KETTLE         YOUNG FAMILIES          Premium
## 8221         WW         YOUNG FAMILIES          Premium
## 8222   TWISTIES         YOUNG FAMILIES          Premium
## 8223        RRD         YOUNG FAMILIES          Premium
## 8224     SMITHS         OLDER FAMILIES          Premium
## 8225    DORITOS         YOUNG FAMILIES       Mainstream
## 8226      THINS  YOUNG SINGLES/COUPLES          Premium
## 8227     KETTLE  YOUNG SINGLES/COUPLES          Premium
## 8228     SMITHS         YOUNG FAMILIES       Mainstream
## 8229    DORITOS MIDAGE SINGLES/COUPLES       Mainstream
## 8230        NCC MIDAGE SINGLES/COUPLES       Mainstream
## 8231         WW         OLDER FAMILIES           Budget
## 8232    NATURAL         YOUNG FAMILIES          Premium
## 8233        RRD         YOUNG FAMILIES           Budget
## 8234        NCC         YOUNG FAMILIES           Budget
## 8235     DORITO  YOUNG SINGLES/COUPLES       Mainstream
## 8236     SMITHS         OLDER FAMILIES       Mainstream
## 8237   CHEEZELS               RETIREES       Mainstream
## 8238    NATURAL           NEW FAMILIES           Budget
## 8239     SMITHS           NEW FAMILIES           Budget
## 8240   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 8241    NATURAL         OLDER FAMILIES       Mainstream
## 8242        RRD  OLDER SINGLES/COUPLES           Budget
## 8243     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 8244    NATURAL  YOUNG SINGLES/COUPLES          Premium
## 8245     SMITHS  YOUNG SINGLES/COUPLES       Mainstream
## 8246    DORITOS  YOUNG SINGLES/COUPLES          Premium
## 8247     SMITHS  YOUNG SINGLES/COUPLES          Premium
## 8248        RRD  YOUNG SINGLES/COUPLES       Mainstream
## 8249   PRINGLES  YOUNG SINGLES/COUPLES       Mainstream
## 8250    NATURAL  OLDER SINGLES/COUPLES       Mainstream
## 8251     KETTLE               RETIREES           Budget
## 8252     KETTLE               RETIREES           Budget
## 8253    GRNWVES         YOUNG FAMILIES       Mainstream
## 8254     SMITHS         YOUNG FAMILIES          Premium
## 8255  INFUZIONS         YOUNG FAMILIES          Premium
## 8256     KETTLE               RETIREES       Mainstream
## 8257         WW               RETIREES       Mainstream
## 8258     INFZNS               RETIREES       Mainstream
## 8259       COBS  OLDER SINGLES/COUPLES           Budget
## 8260    NATURAL         YOUNG FAMILIES           Budget
## 8261  INFUZIONS         YOUNG FAMILIES           Budget
## 8262        RED         YOUNG FAMILIES       Mainstream
## 8263     SMITHS         YOUNG FAMILIES       Mainstream
## 8264     FRENCH         YOUNG FAMILIES           Budget
## 8265      GRAIN  OLDER SINGLES/COUPLES       Mainstream
## 8266        RED  OLDER SINGLES/COUPLES       Mainstream
## 8267     BURGER               RETIREES       Mainstream
## 8268     SMITHS               RETIREES       Mainstream
## 8269    DORITOS               RETIREES       Mainstream
## 8270    NATURAL  YOUNG SINGLES/COUPLES           Budget
## 8271     KETTLE  YOUNG SINGLES/COUPLES           Budget
## 8272   SUNBITES  YOUNG SINGLES/COUPLES           Budget
## 8273         WW         YOUNG FAMILIES           Budget
## 8274    NATURAL         YOUNG FAMILIES           Budget
## 8275    DORITOS         YOUNG FAMILIES           Budget
## 8276        RED         YOUNG FAMILIES           Budget
## 8277         WW         YOUNG FAMILIES           Budget
## 8278  INFUZIONS         YOUNG FAMILIES           Budget
## 8279    DORITOS         YOUNG FAMILIES           Budget
## 8280    NATURAL         YOUNG FAMILIES           Budget
## 8281    DORITOS         YOUNG FAMILIES           Budget
## 8282    CHEETOS  OLDER SINGLES/COUPLES           Budget
## 8283  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 8284  INFUZIONS  OLDER SINGLES/COUPLES           Budget
## 8285   PRINGLES  OLDER SINGLES/COUPLES           Budget
## 8286        RED  OLDER SINGLES/COUPLES           Budget
## 8287     SMITHS  OLDER SINGLES/COUPLES           Budget
## 8288     SMITHS  OLDER SINGLES/COUPLES           Budget
## 8289   TOSTITOS  OLDER SINGLES/COUPLES           Budget
## 8290        RRD MIDAGE SINGLES/COUPLES          Premium
## 8291     FRENCH MIDAGE SINGLES/COUPLES          Premium
## 8292   TOSTITOS MIDAGE SINGLES/COUPLES          Premium
## 8293     SMITHS MIDAGE SINGLES/COUPLES          Premium
## 8294      THINS MIDAGE SINGLES/COUPLES          Premium
## 8295        RED MIDAGE SINGLES/COUPLES          Premium
## 8296    DORITOS  YOUNG SINGLES/COUPLES           Budget
## 8297        RRD  YOUNG SINGLES/COUPLES           Budget
## 8298       COBS  YOUNG SINGLES/COUPLES           Budget
## 8299   TYRRELLS  YOUNG SINGLES/COUPLES           Budget
## 8300    NATURAL  YOUNG SINGLES/COUPLES           Budget
## 8301         WW  YOUNG SINGLES/COUPLES           Budget
## 8302        RED         YOUNG FAMILIES           Budget
## 8303   PRINGLES         YOUNG FAMILIES           Budget
## 8304      SMITH         YOUNG FAMILIES           Budget
## 8305   PRINGLES         YOUNG FAMILIES           Budget
## 8306        RRD         YOUNG FAMILIES           Budget
## 8307         WW         YOUNG FAMILIES           Budget
## 8308        RRD         YOUNG FAMILIES           Budget
## 8309     SMITHS         YOUNG FAMILIES           Budget
## 8310        RRD  OLDER SINGLES/COUPLES           Budget
## 8311    NATURAL  OLDER SINGLES/COUPLES           Budget
## 8312     KETTLE  OLDER SINGLES/COUPLES           Budget
## 8313    DORITOS  OLDER SINGLES/COUPLES           Budget
## 8314     DORITO  OLDER SINGLES/COUPLES           Budget
## 8315     SMITHS  OLDER SINGLES/COUPLES           Budget
## 8316    NATURAL               RETIREES           Budget
## 8317    DORITOS               RETIREES           Budget
## 8318   CHEEZELS               RETIREES           Budget
## 8319        RRD               RETIREES           Budget
## 8320      GRAIN               RETIREES           Budget
## 8321     SMITHS               RETIREES           Budget
## 8322     KETTLE               RETIREES       Mainstream
## 8323         WW               RETIREES       Mainstream
## 8324        RRD               RETIREES       Mainstream
## 8325     INFZNS               RETIREES       Mainstream
## 8326     KETTLE               RETIREES       Mainstream
## 8327        CCS               RETIREES       Mainstream
## 8328     KETTLE               RETIREES       Mainstream
## 8329    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 8330      THINS  OLDER SINGLES/COUPLES       Mainstream
## 8331   TOSTITOS  OLDER SINGLES/COUPLES       Mainstream
## 8332    DORITOS  OLDER SINGLES/COUPLES       Mainstream
## 8333      GRAIN  OLDER SINGLES/COUPLES       Mainstream
##  [ reached 'max' / getOption("max.print") -- omitted 238409 rows ]
#### Deep dive into Mainstream, young singles/couples
segment1 <- data[data$LIFESTAGE=='YOUNG SINGLES/COUPLES'& data$PREMIUM_CUSTOMER=='Mainstream',]

other <- data[data$LIFESTAGE!= "YOUNG SINGLES/COUPLES" & data$PREMIUM_CUSTOMER!= "Mainstream",]

#. Mainstream young singles/couples are 23% more likely to purchase Tyrrells chips compared to the rest of the population.

#. Mainstream young singles/couples are 56% less likely to purchase Burger Rings compared to the rest of the population